diff --git a/.github/workflows/R-CMD-check.yaml b/.github/workflows/R-CMD-check.yaml
index fb05c474..3cf51dbf 100644
--- a/.github/workflows/R-CMD-check.yaml
+++ b/.github/workflows/R-CMD-check.yaml
@@ -4,7 +4,7 @@ name: R CI/CD test #R-CMD-check
on:
push:
- branches: [main, master]
+ branches: [main, master, develop]
paths-ignore:
- '**.md' # prevent md files (e.g., README.md) in any repo dir from trigering workflow
- '**.bib'
@@ -15,7 +15,7 @@ on:
- '.gitignore'
- '.gitattributes'
pull_request:
- branches: [master] # develop
+ branches: [master, develop]
paths-ignore:
- '**.md'
- '**.bib'
diff --git a/DESCRIPTION b/DESCRIPTION
index 50bc94c6..8e1932ed 100644
--- a/DESCRIPTION
+++ b/DESCRIPTION
@@ -1,8 +1,8 @@
Package: useeior
Type: Package
Title: USEEIO R modeling software
-Version: 1.2.2
-Date: 2023-7-14
+Version: 1.3.0
+Date: 2023-7-21
Authors@R: c(
person("Mo","Li", email="mo.li@gdit.com", role="aut"),
person("Wesley","Ingwersen", email="ingwersen.wesley@epa.gov", role= c("aut", "cre")),
diff --git a/R/AdjustPrice.R b/R/AdjustPrice.R
index aa007e3b..ce63830d 100644
--- a/R/AdjustPrice.R
+++ b/R/AdjustPrice.R
@@ -53,8 +53,6 @@ calculateProducerbyPurchaserPriceRatio <- function(model) {
TWR_CPI <- useeior::Sector_CPI_IO[c("48TW", "42", "44RT"), ]
TWR_CPI_ratio <- TWR_CPI[, year]/TWR_CPI[, as.character(model$specs$IOYear)]
TWRValue <- sweep(Margins[, c("Transportation", "Wholesale", "Retail")], 2, TWR_CPI_ratio, "*")
- # Calculate PurchasersValue
- PurchasersValue <- rowSums(Margins[, c("ProducersValue", "Transportation", "Wholesale", "Retail")])
# Generate PRObyPURRatios, or phi vector
PHI[, year] <- ProducersValue/(ProducersValue + rowSums(TWRValue))
}
@@ -86,3 +84,22 @@ adjustMultiplierPriceType <- function(matrix, currency_year, model) {
return(matrix_new)
}
+#' Calculate basic to producer price ratio.
+#' @param model A complete EEIO model: a list with USEEIO model components and attributes.
+#' @return A dataframe of basic to producer price ratio.
+calculateBasicbyProducerPriceRatio <- function(model) {
+ # Get TaxLessSubsidies table
+ TaxLessSubsidies <- merge(model$TaxLessSubsidies, model$Rho,
+ by.x = "Code_Loc", by.y = 0, all.y = TRUE)
+ TaxLessSubsidies <- TaxLessSubsidies[match(rownames(model$Rho),
+ TaxLessSubsidies$Code_Loc), ]
+ # Prepare ratio table Tau using the structure of Rho
+ Tau <- model$Rho
+ for (year in colnames(model$Rho)) {
+ # Adjust BasicValue from model$specs$IOyear to currency year using model$Rho
+ BasicValue <- TaxLessSubsidies$BasicValue * (TaxLessSubsidies[, year]/TaxLessSubsidies[, as.character(model$specs$IOYear)])
+ Tau[, year] <- BasicValue/TaxLessSubsidies$ProducerValue
+ }
+ Tau[is.na(Tau)] <- 1
+ return(Tau)
+}
diff --git a/R/BuildModel.R b/R/BuildModel.R
index 69fbbb35..bfb7a0a0 100644
--- a/R/BuildModel.R
+++ b/R/BuildModel.R
@@ -117,6 +117,10 @@ constructEEIOMatrices <- function(model) {
logging::loginfo("Calculating Phi matrix (producer over purchaser price ratio)...")
model$Phi <- calculateProducerbyPurchaserPriceRatio(model)
+ # Calculate basic over producer price ratio.
+ logging::loginfo("Calculating Tau matrix (basic over producer price ratio)...")
+ model$Tau <- calculateBasicbyProducerPriceRatio(model)
+
#Clean up model elements not written out or used in further functions to reduce clutter
mat_to_remove <- c("MakeTransactions", "UseTransactions", "DomesticUseTransactions",
"UseValueAdded", "FinalDemand", "DomesticFinalDemand",
@@ -223,3 +227,77 @@ createCfromFactorsandBflows <- function(factors,B_flows) {
return(C)
}
+#' Build an EIO model with economic components only.
+#' @param modelname Name of the model from a config file.
+#' @param configpaths str vector, paths (including file name) of model configuration file
+#' and optional agg/disagg configuration file(s). If NULL, built-in config files are used.
+#' @return A list of EIO model with only economic components
+buildEIOModel <- function(modelname, configpaths = NULL) {
+ model <- initializeModel(modelname, configpaths)
+ model <- loadIOData(model, configpaths)
+ model <- loadDemandVectors(model)
+
+ model$V <- as.matrix(model$MakeTransactions) # Make
+ model$C_m <- generateCommodityMixMatrix(model) # normalized t(Make)
+ model$V_n <- generateMarketSharesfromMake(model) # normalized Make
+ if (model$specs$CommodityorIndustryType=="Industry") {
+ FinalDemand_df <- model$FinalDemandbyCommodity
+ DomesticFinalDemand_df <- model$DomesticFinalDemandbyCommodity
+ } else {
+ FinalDemand_df <- model$FinalDemand
+ DomesticFinalDemand_df <- model$DomesticFinalDemand
+ }
+ model$U <- as.matrix(dplyr::bind_rows(cbind(model$UseTransactions,
+ FinalDemand_df),
+ model$UseValueAdded)) # Use
+ model$U_d <- as.matrix(dplyr::bind_rows(cbind(model$DomesticUseTransactions,
+ DomesticFinalDemand_df),
+ model$UseValueAdded)) # DomesticUse
+ colnames(model$U_d) <- colnames(model$U)
+ model[c("U", "U_d")] <- lapply(model[c("U", "U_d")],
+ function(x) ifelse(is.na(x), 0, x))
+ model$U_n <- generateDirectRequirementsfromUse(model, domestic = FALSE) #normalized Use
+ model$U_d_n <- generateDirectRequirementsfromUse(model, domestic = TRUE) #normalized DomesticUse
+ model$q <- model$CommodityOutput
+ model$x <- model$IndustryOutput
+ model$mu <- model$InternationalTradeAdjustment
+ if(model$specs$CommodityorIndustryType == "Commodity") {
+ logging::loginfo("Building commodity-by-commodity A matrix (direct requirements)...")
+ model$A <- model$U_n %*% model$V_n
+ logging::loginfo("Building commodity-by-commodity A_d matrix (domestic direct requirements)...")
+ model$A_d <- model$U_d_n %*% model$V_n
+ } else if(model$specs$CommodityorIndustryType == "Industry") {
+ logging::loginfo("Building industry-by-industry A matrix (direct requirements)...")
+ model$A <- model$V_n %*% model$U_n
+ logging::loginfo("Building industry-by-industry A_d matrix (domestic direct requirements)...")
+ model$A_d <- model$V_n %*% model$U_d_n
+ }
+
+ if(model$specs$ModelType == "EEIO-IH"){
+ model$A <- hybridizeAMatrix(model)
+ model$A_d <- hybridizeAMatrix(model, domestic=TRUE)
+ }
+
+ # Calculate total requirements matrix as Leontief inverse (L) of A
+ logging::loginfo("Calculating L matrix (total requirements)...")
+ I <- diag(nrow(model$A))
+ I_d <- diag(nrow(model$A_d))
+ model$L <- solve(I - model$A)
+ logging::loginfo("Calculating L_d matrix (domestic total requirements)...")
+ model$L_d <- solve(I_d - model$A_d)
+
+ # Calculate year over model IO year price ratio
+ logging::loginfo("Calculating Rho matrix (price year ratio)...")
+ model$Rho <- calculateModelIOYearbyYearPriceRatio(model)
+
+ # Calculate producer over purchaser price ratio.
+ logging::loginfo("Calculating Phi matrix (producer over purchaser price ratio)...")
+ model$Phi <- calculateProducerbyPurchaserPriceRatio(model)
+
+ # Calculate basic over producer price ratio.
+ logging::loginfo("Calculating Tau matrix (basic over producer price ratio)...")
+ model$Tau <- calculateBasicbyProducerPriceRatio(model)
+
+ logging::loginfo("EIO model build complete.")
+ return(model)
+}
diff --git a/R/DataDocumentation.R b/R/DataDocumentation.R
index c8e1d4b1..9bb71b1a 100644
--- a/R/DataDocumentation.R
+++ b/R/DataDocumentation.R
@@ -740,3 +740,233 @@
#' \item{NAICS_2007_Code}{text code}
#' }
"MasterCrosswalk2007"
+
+#' Detail 2012 Supply (2012 schema)
+#' @format A dataframe with 406 obs. and 417 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Detail_Supply_2012"
+
+#' Detail 2012 Use (under the Supply-Use framework, 2012 schema)
+#' @format A dataframe with 414 obs. and 426 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Detail_Use_SUT_2012"
+
+#' Summary 2010 Supply (2012 schema)
+#' @format A dataframe with 74 obs. and 83 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Summary_Supply_2010"
+
+#' Summary 2011 Supply (2012 schema)
+#' @format A dataframe with 74 obs. and 83 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Summary_Supply_2011"
+
+#' Summary 2012 Supply (2012 schema)
+#' @format A dataframe with 74 obs. and 83 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Summary_Supply_2012"
+
+#' Summary 2013 Supply (2012 schema)
+#' @format A dataframe with 74 obs. and 83 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Summary_Supply_2013"
+
+#' Summary 2014 Supply (2012 schema)
+#' @format A dataframe with 74 obs. and 83 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Summary_Supply_2014"
+
+#' Summary 2015 Supply (2012 schema)
+#' @format A dataframe with 74 obs. and 83 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Summary_Supply_2015"
+
+#' Summary 2016 Supply (2012 schema)
+#' @format A dataframe with 74 obs. and 83 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Summary_Supply_2016"
+
+#' Summary 2017 Supply (2012 schema)
+#' @format A dataframe with 74 obs. and 83 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Summary_Supply_2017"
+
+#' Summary 2018 Supply (2012 schema)
+#' @format A dataframe with 74 obs. and 83 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Summary_Supply_2018"
+
+#' Summary 2019 Supply (2012 schema)
+#' @format A dataframe with 74 obs. and 83 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Summary_Supply_2019"
+
+#' Summary 2020 Supply (2012 schema)
+#' @format A dataframe with 74 obs. and 83 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Summary_Supply_2020"
+
+#' Summary 2010 Use (2012 schema)
+#' @format A dataframe with 82 obs. and 92 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Summary_Use_SUT_2010"
+
+#' Summary 2011 Use (2012 schema)
+#' @format A dataframe with 82 obs. and 92 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Summary_Use_SUT_2011"
+
+#' Summary 2012 Use (2012 schema)
+#' @format A dataframe with 82 obs. and 92 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Summary_Use_SUT_2012"
+
+#' Summary 2013 Use (2012 schema)
+#' @format A dataframe with 82 obs. and 92 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Summary_Use_SUT_2013"
+
+#' Summary 2014 Use (2012 schema)
+#' @format A dataframe with 82 obs. and 92 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Summary_Use_SUT_2014"
+
+#' Summary 2015 Use (2012 schema)
+#' @format A dataframe with 82 obs. and 92 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Summary_Use_SUT_2015"
+
+#' Summary 2016 Use (2012 schema)
+#' @format A dataframe with 82 obs. and 92 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Summary_Use_SUT_2016"
+
+#' Summary 2017 Use (2012 schema)
+#' @format A dataframe with 82 obs. and 92 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Summary_Use_SUT_2017"
+
+#' Summary 2018 Use (2012 schema)
+#' @format A dataframe with 82 obs. and 92 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Summary_Use_SUT_2018"
+
+#' Summary 2019 Use (2012 schema)
+#' @format A dataframe with 82 obs. and 92 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Summary_Use_SUT_2019"
+
+#' Summary 2020 Use (2012 schema)
+#' @format A dataframe with 82 obs. and 92 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Summary_Use_SUT_2020"
+
+#' Sector 2010 Supply (2012 schema)
+#' @format A dataframe with 18 obs. and 27 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Sector_Supply_2010"
+
+#' Sector 2011 Supply (2012 schema)
+#' @format A dataframe with 18 obs. and 27 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Sector_Supply_2011"
+
+#' Sector 2012 Supply (2012 schema)
+#' @format A dataframe with 18 obs. and 27 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Sector_Supply_2012"
+
+#' Sector 2013 Supply (2012 schema)
+#' @format A dataframe with 18 obs. and 27 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Sector_Supply_2013"
+
+#' Sector 2014 Supply (2012 schema)
+#' @format A dataframe with 18 obs. and 27 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Sector_Supply_2014"
+
+#' Sector 2015 Supply (2012 schema)
+#' @format A dataframe with 18 obs. and 27 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Sector_Supply_2015"
+
+#' Sector 2016 Supply (2012 schema)
+#' @format A dataframe with 18 obs. and 27 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Sector_Supply_2016"
+
+#' Sector 2017 Supply (2012 schema)
+#' @format A dataframe with 18 obs. and 27 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Sector_Supply_2017"
+
+#' Sector 2018 Supply (2012 schema)
+#' @format A dataframe with 18 obs. and 27 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Sector_Supply_2018"
+
+#' Sector 2019 Supply (2012 schema)
+#' @format A dataframe with 18 obs. and 27 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Sector_Supply_2019"
+
+#' Sector 2020 Supply (2012 schema)
+#' @format A dataframe with 18 obs. and 27 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Sector_Supply_2020"
+
+#' Sector 2010 Use (2012 schema)
+#' @format A dataframe with 26 obs. and 22 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Sector_Use_SUT_2010"
+
+#' Sector 2011 Use (2012 schema)
+#' @format A dataframe with 26 obs. and 22 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Sector_Use_SUT_2011"
+
+#' Sector 2012 Use (2012 schema)
+#' @format A dataframe with 26 obs. and 22 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Sector_Use_SUT_2012"
+
+#' Sector 2013 Use (2012 schema)
+#' @format A dataframe with 26 obs. and 22 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Sector_Use_SUT_2013"
+
+#' Sector 2014 Use (2012 schema)
+#' @format A dataframe with 26 obs. and 22 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Sector_Use_SUT_2014"
+
+#' Sector 2015 Use (2012 schema)
+#' @format A dataframe with 26 obs. and 22 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Sector_Use_SUT_2015"
+
+#' Sector 2016 Use (2012 schema)
+#' @format A dataframe with 26 obs. and 22 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Sector_Use_SUT_2016"
+
+#' Sector 2017 Use (2012 schema)
+#' @format A dataframe with 26 obs. and 22 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Sector_Use_SUT_2017"
+
+#' Sector 2018 Use (2012 schema)
+#' @format A dataframe with 26 obs. and 22 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Sector_Use_SUT_2018"
+
+#' Sector 2019 Use (2012 schema)
+#' @format A dataframe with 26 obs. and 22 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Sector_Use_SUT_2019"
+
+#' Sector 2020 Use (2012 schema)
+#' @format A dataframe with 26 obs. and 22 variables
+#' @source \url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+"Sector_Use_SUT_2020"
diff --git a/R/DisaggregateFunctions.R b/R/DisaggregateFunctions.R
index eb26bd8a..e097a18f 100644
--- a/R/DisaggregateFunctions.R
+++ b/R/DisaggregateFunctions.R
@@ -56,6 +56,7 @@ disaggregateModel <- function (model){
#Disaggregate Margins
model$Margins <- disaggregateMargins(model, disagg)
model$InternationalTradeAdjustment <- disaggregateInternationalTradeAdjustment(model, disagg)
+ model$TaxLessSubsidies <- disaggregateTaxLessSubsidies(model, disagg)
# Transform model FinalDemand, DomesticFinalDemand, and InternationalTradeAdjustment to by-industry form
if (model$specs$CommodityorIndustryType=="Industry") {
@@ -269,8 +270,6 @@ disaggregateInternationalTradeAdjustment <- function(model, disagg, ratios = NUL
originalInternationalTradeAdjustment <- model$InternationalTradeAdjustmentbyCommodity
}
originalNameList <- names(originalInternationalTradeAdjustment) # Get names from named vector
-# codeLength <- nchar(gsub("/.*", "", disagg$OriginalSectorCode)) # Calculate code length (needed for summary vs. detail level code lengths)
-# originalIndex <- which(originalNameList == substr(disagg$OriginalSectorCode, 1, codeLength)) # Get row index of the original aggregate sector in the object
originalIndex <- which(originalNameList == disagg$OriginalSectorCode) # Get row index of the original aggregate sector in the object
originalRow <- originalInternationalTradeAdjustment[originalIndex] # Copy row containing the Margins information for the original aggregate sector
@@ -339,6 +338,37 @@ disaggregateMargins <- function(model, disagg) {
return(newMargins)
}
+
+#' Disaggregate TaxLessSubsidies dataframe in the main model object
+#' @param model A complete EEIO model: a list with USEEIO model components and attributes.
+#' @param disagg Specifications for disaggregating the current Table
+#' @return newTLS A dataframe which contain the TaxLessSubsidies including the disaggregated sectors
+disaggregateTaxLessSubsidies <- function(model, disagg) {
+ original <- model$TaxLessSubsidies
+ originalIndex <- grep(disagg$OriginalSectorCode, model$TaxLessSubsidies$Code_Loc)
+ originalRow <- model$TaxLessSubsidies[originalIndex,]
+ disaggTLS <-originalRow[rep(seq_len(nrow(originalRow)), length(disagg$DisaggregatedSectorCodes)),,drop=FALSE]
+ disaggRatios <- unname(disaggregatedRatios(model, disagg, model$specs$CommodityorIndustryType))
+
+ codeLength <- nchar(gsub("/.*", "", disagg$DisaggregatedSectorCodes[1]))
+ disaggTLS$Code_Loc <- unlist(disagg$DisaggregatedSectorCodes)
+ disaggTLS$Name <- unlist(disagg$DisaggregatedSectorNames)
+
+ #code below multiplies the values in the relevant columns of the TLS dataframe by the disaggRatios
+ disaggTLS$BasicValue <- disaggTLS$BasicValue * disaggRatios
+ disaggTLS$MDTY <- disaggTLS$MDTY * disaggRatios
+ disaggTLS$TOP <- disaggTLS$TOP * disaggRatios
+ disaggTLS$SUB <- disaggTLS$SUB * disaggRatios
+ disaggTLS$ProducerValue <- disaggTLS$ProducerValue * disaggRatios
+
+ #bind the new values to the original table
+ newTLS <- rbind(original[1:originalIndex-1,], disaggTLS, original[-(1:originalIndex),])
+
+ rownames(newTLS) <- NULL
+
+ return(newTLS)
+}
+
#' Calculate ratios of throughputs from the disaggregated sectors
#' @param model A complete EEIO model: a list with USEEIO model components and attributes.
#' @param disagg Specifications for disaggregating the current Table
diff --git a/R/IOFunctions.R b/R/IOFunctions.R
index 07bdc011..bc8bf308 100644
--- a/R/IOFunctions.R
+++ b/R/IOFunctions.R
@@ -31,6 +31,10 @@ adjustOutputbyCPI <- function (outputyear, referenceyear, location_acronym, IsRo
#' @param IO_output_df Output of the model in dataframe format.
#' @return A matrix.
normalizeIOTransactions <- function (IO_transactions_df, IO_output_df) {
+ # Replace 0 in IO_transactions_df and IO_output_df with 1E-3 to avoid errors in solve(x_hat)
+ IO_transactions_df[names(IO_output_df[IO_output_df == 0]),
+ names(IO_output_df[IO_output_df == 0])] <- 1E-3
+ IO_output_df[IO_output_df == 0] <- 1E-3
Z <- as.matrix(IO_transactions_df)
x <- unname(unlist(IO_output_df))
x_hat <- diag(x, length(x), length(x))
@@ -170,7 +174,7 @@ calculateLeontiefInverse <- function(A) {
#' @return A Domestic Use table with rows as commodity codes and columns as industry and final demand codes
generateDomesticUse <- function(Use, model) {
# Load Import matrix
- if (model$specs$BaseIOLevel!="Sector") {
+ if (model$specs$BaseIOLevel != "Sector") {
Import <- get(paste(model$specs$BaseIOLevel, "Import",
model$specs$IOYear, "BeforeRedef", sep = "_"))*1E6
} else {
@@ -179,8 +183,38 @@ generateDomesticUse <- function(Use, model) {
# Aggregate Import from Summary to Sector
Import <- as.data.frame(aggregateMatrix(as.matrix(Import), "Summary", "Sector", model))
}
+ Import <- Import[rownames(Use), colnames(Use)]
+ # Adjust Import matrix to BAS price if model is in BAS price
+ # Note: according to the documentation in BEA Import matrix, import values in
+ # the Import matrix are in producer (PRO) values. For PRO models, imports in the
+ # Import matrix are valued at their domestic port value, while imports in Use
+ # (Make-Use framework) are valued at their foreign port value, meaning
+ # domestic port value = foreign port value +
+ # the value of all transportation and insurance services to import +
+ # customs duties.
+ # To get an Import matrix in BAS price, customs duties (i.e. import duties or tax on imports)
+ # needs to be subtracted from the original Import matrix
+ if (model$specs$BasePriceType == "BAS") {
+ # Find "MDTY - import duties" in Supply table
+ Supply <- get(paste(model$specs$BaseIOLevel, "Supply", model$specs$IOYear,
+ sep = "_")) * 1E6
+ ImportDuty <- Supply[rownames(Import), "MDTY"]
+ # Subtract import duties from Import matrix
+ # Expanding it to a matrix based on the Import matrix, except for the import column
+ # Then subtract the matrix from the Import matrix to convert it from PRO to BAS
+ import_col <- model$FinalDemandMeta[model$FinalDemandMeta$Group == "Import",
+ "Code"]
+ non_import_cols <- setdiff(colnames(Import), import_col)
+ ratio_m <- Import/rowSums(Import[, non_import_cols])
+ ratio_m[is.na(ratio_m)] <- 1/(ncol(Import) - 1)
+ Import_BAS <- Import[, non_import_cols] - diag(ImportDuty) %*% as.matrix(ratio_m)
+ # Recalculate import column in the Import matrix by adding import duties
+ Import_BAS[, import_col] <- Import[, import_col] + ImportDuty
+ # Assign Import_BAS to Import
+ Import <- Import_BAS
+ }
# Subtract Import from Use
- DomesticUse <- Use - Import[rownames(Use), colnames(Use)]
+ DomesticUse <- Use - Import
# Adjust Import column in DomesticUse to 0.
# Note: the original values in Import column are essentially the International Trade Adjustment
# that are reserved and added as an additional column (F050/F05000) in DomesticUse.
@@ -204,6 +238,7 @@ generateInternationalTradeAdjustmentVector <- function(Use, model) {
}
# Define Import code
ImportCode <- getVectorOfCodes(model$specs$BaseIOSchema, model$specs$BaseIOLevel, "Import")
+ ImportCode <- ImportCode[startsWith(ImportCode, "F")]
# Calculate InternationalTradeAdjustment
# In the Import matrix, the imports column is in domestic (US) port value.
# But in the Use table, it is in foreign port value.
@@ -215,3 +250,85 @@ generateInternationalTradeAdjustmentVector <- function(Use, model) {
names(InternationalTradeAdjustment) <- rownames(Use)
return(InternationalTradeAdjustment)
}
+
+#' Convert Use table in the Supply-Use framework from purchasers' price (PUR)
+#' to basic price (BAS)
+#' @param UseSUT_PUR, a Use table (from the Supply-Use framework) in purchasers' price (PUR)
+#' @param specs, model specifications.
+#' @param io_codes, a list of BEA IO codes.
+#' @return A Use table in basic price (BAS)
+convertUsefromPURtoBAS <- function(UseSUT_PUR, specs, io_codes) {
+ # Load UsePRO and UsePUR under Make-Use framework
+ Redef <- ifelse(specs$BasewithRedefinitions, "AfterRedef", "BeforeRedef")
+ UsePUR <- get(paste(specs$BaseIOLevel, "Use", specs$IOYear, "PUR", Redef, sep = "_"))
+ UsePRO <- get(paste(specs$BaseIOLevel, "Use", specs$IOYear, "PRO", Redef, sep = "_"))
+ # Load Supply table
+ Supply <- get(paste(specs$BaseIOLevel, "Supply", specs$IOYear, sep = "_"))
+
+ # Convert from PUR to PRO by removing margins obtained from Supply table
+ rows <- io_codes$Commodities
+ cols <- c(io_codes$Industries,
+ intersect(colnames(UseSUT_PUR), io_codes$FinalDemandCodes))
+ # Calculate margins in matrix form using Use tables under the Make-Use framework
+ # Note: there are no retail (comm) sectors in UsePUR, so these sectors in the
+ # margins matrix are filled with NA.
+ margins <- UsePUR[rows, cols] - UsePRO[rows, cols]
+ # Update rownames of the matrix
+ rownames(margins) <- rows
+ # Replace NA with 0 because retail sectors should not have additional margins
+ margins[is.na(margins)] <- 0
+ # Extract margins from Supply
+ margins_Supply <- rowSums(Supply[rows, c("TRADE", "TRANS")])
+ # Allocate margins_Supply throughout Use based on margins matrix
+ margins_ratio_m <- margins/rowSums(margins)
+ margins_ratio_m[is.na(margins_ratio_m)] <- 1/ncol(margins_ratio_m)
+ UseSUT_PRO <- UseSUT_PUR[rows, cols] - diag(margins_Supply) %*% as.matrix(margins_ratio_m)
+
+ # Convert from PRO to BAS by removing tax less subsidies from the Supply table
+ # Note: import duties (MDTY) is considered tax on imported goods, see page 3 of
+ # https://apps.bea.gov/scb/pdf/2015/09%20September/0915_supply_use_tables_for_the_united_states.pdf
+ tax_less_subsidies <- rowSums(Supply[rows, io_codes$TaxLessSubsidiesCodes])
+ # Allocate tax_less_subsidies throughout Use based on consumption of commodities
+ ratio_m <- UseSUT_PRO/rowSums(UseSUT_PRO)
+ ratio_m[is.na(ratio_m)] <- 1/ncol(ratio_m)
+ UseSUT_BAS <- UseSUT_PRO - diag(tax_less_subsidies) %*% as.matrix(ratio_m)
+ # Append right columns, including T001 and T109, and bottom rows, including
+ # Value Added and totals, back to Use table
+ UseSUT_BAS <- rbind(cbind(UseSUT_BAS,
+ UseSUT_PUR[rows, setdiff(colnames(UseSUT_PUR),
+ colnames(UseSUT_BAS))]),
+ UseSUT_PUR[setdiff(rownames(UseSUT_PUR),
+ rownames(UseSUT_BAS)), ])
+ return(UseSUT_BAS)
+}
+
+#' Generate tax less subsidies table using BEA Supply table which include
+#' total product supply in basic price and tax less subsidies for all commodities
+#' @param model An EEIO model object with model specs and IO tables loaded
+#' @return A data.frame containing CommodityCode, basic price, tax less subsidies,
+#' and producer price of total product supply
+generateTaxLessSubsidiesTable <- function(model) {
+ # Load Supply table
+ Supply <- get(paste(model$specs$BaseIOLevel, "Supply", model$specs$IOYear,
+ sep = "_"))
+ # Get basic price and tax less subsidies vectors from Supply
+ import_cols <- getVectorOfCodes(model$specs$BaseIOSchema,
+ model$specs$BaseIOLevel,
+ "Import")
+ import_cols <- import_cols[!startsWith(import_cols, "F")]
+ taxlesssubsidies_col <- getVectorOfCodes(model$specs$BaseIOSchema,
+ model$specs$BaseIOLevel,
+ "TaxLessSubsidies")
+ TaxLessSubsidies <- cbind(rowSums(Supply[model$Commodities$Code,
+ c(model$Industries$Code, import_cols)]),
+ Supply[model$Commodities$Code, taxlesssubsidies_col])
+ colnames(TaxLessSubsidies)[1] <- "BasicValue"
+ # Calculate Producer price
+ TaxLessSubsidies$ProducerValue <- rowSums(TaxLessSubsidies)
+ # Assign Code_Loc to TaxLessSubsidies
+ TaxLessSubsidies <- merge(TaxLessSubsidies,
+ model$Commodities[,c("Code","Name", "Code_Loc")],
+ by.x = 0, by.y = "Code", all.y = TRUE)
+ return(TaxLessSubsidies)
+}
+
diff --git a/R/LoadIOTables.R b/R/LoadIOTables.R
index f7c3c8ff..b7a13703 100644
--- a/R/LoadIOTables.R
+++ b/R/LoadIOTables.R
@@ -40,6 +40,9 @@ loadIOData <- function(model, configpaths = NULL) {
# Add Margins table
model$Margins <- getMarginsTable(model)
+ # Add TaxLessSubsidies table
+ model$TaxLessSubsidies <- generateTaxLessSubsidiesTable(model)
+
# Add Chain Price Index (CPI) to model
model$MultiYearIndustryCPI <- loadChainPriceIndexTable(model$specs)[model$Industries$Code, ]
rownames(model$MultiYearIndustryCPI) <- model$Industries$Code_Loc
@@ -139,7 +142,11 @@ loadIOcodes <- function(specs) {
iolevel = specs$BaseIOLevel)
codes <- c("ValueAdded", "HouseholdDemand", "InvestmentDemand",
"ChangeInventories", "Export", "Import", "GovernmentDemand",
- "Scrap", "Transportation", "Wholesale", "Retail")
+ "Scrap", "Transportation", "Wholesale", "Retail",
+ "InternationalTradeAdjustment")
+ if (specs$BasePriceType == "BAS") {
+ codes <- c(codes, "TaxLessSubsidies")
+ }
io_codes[paste0(codes, "Codes")] <- lapply(codes, FUN = getVectorOfCodes,
ioschema = specs$BaseIOSchema,
iolevel = specs$BaseIOLevel)
@@ -150,7 +157,6 @@ loadIOcodes <- function(specs) {
"GovernmentDemand"),
"Codes")],
use.names = FALSE)
- io_codes$InternationalTradeAdjustmentCodes <- gsub("F050", "F051", io_codes$ImportCodes)
return(io_codes)
}
@@ -161,6 +167,13 @@ loadIOcodes <- function(specs) {
loadNationalIOData <- function(model, io_codes) {
# Load BEA IO and gross output tables
BEA <- loadBEAtables(model$specs, io_codes)
+
+ # Update io_codes - make them consistent with table row and column names
+ io_codes$ValueAddedCodes <- rownames(BEA$UseValueAdded)
+ io_codes$ImportCodes <- io_codes$ImportCodes[startsWith(io_codes$ImportCodes,
+ "F")]
+ io_codes$FinalDemandCodes <- colnames(BEA$FinalDemand)
+
# Generate domestic Use transaction and final demand
DomesticUse <- generateDomesticUse(cbind(BEA$UseTransactions, BEA$FinalDemand), model)
BEA$DomesticUseTransactions <- DomesticUse[, io_codes$Industries]
@@ -169,16 +182,22 @@ loadNationalIOData <- function(model, io_codes) {
BEA$InternationalTradeAdjustment <- generateInternationalTradeAdjustmentVector(cbind(BEA$UseTransactions, BEA$FinalDemand), model)
# Modify row and column names to Code_Loc format in all IO tables
# Use model$Industries
- rownames(BEA$MakeTransactions) <- colnames(BEA$UseTransactions) <-
- colnames(BEA$DomesticUseTransactions) <- colnames(BEA$UseValueAdded) <-
+ rownames(BEA$MakeTransactions) <-
+ colnames(BEA$UseTransactions) <-
+ colnames(BEA$DomesticUseTransactions) <-
+ colnames(BEA$UseValueAdded) <-
model$Industries$Code_Loc
# Use model$Commodities
- colnames(BEA$MakeTransactions) <- rownames(BEA$UseTransactions) <-
- rownames(BEA$DomesticUseTransactions) <- rownames(BEA$FinalDemand) <-
- rownames(BEA$DomesticFinalDemand) <- names(BEA$InternationalTradeAdjustment) <-
+ colnames(BEA$MakeTransactions) <-
+ rownames(BEA$UseTransactions) <-
+ rownames(BEA$DomesticUseTransactions) <-
+ rownames(BEA$FinalDemand) <-
+ rownames(BEA$DomesticFinalDemand) <-
+ names(BEA$InternationalTradeAdjustment) <-
model$Commodities$Code_Loc
# Use model$FinalDemandMeta
- colnames(BEA$FinalDemand) <- colnames(BEA$DomesticFinalDemand) <-
+ colnames(BEA$FinalDemand) <-
+ colnames(BEA$DomesticFinalDemand) <-
model$FinalDemandMeta$Code_Loc
# Use model$ValueAddedMeta
rownames(BEA$UseValueAdded) <- model$ValueAddedMeta$Code_Loc
@@ -191,20 +210,61 @@ loadNationalIOData <- function(model, io_codes) {
#' @return A list with BEA IO tables
loadBEAtables <- function(specs, io_codes) {
BEA <- list()
- # Load pre-saved Make and Use tables
- Redef <- ifelse(specs$BasewithRedefinitions, "AfterRedef", "BeforeRedef")
- BEA$Make <- get(paste(specs$BaseIOLevel, "Make", specs$IOYear, Redef, sep = "_"))
- BEA$Use <- get(paste(specs$BaseIOLevel, "Use", specs$IOYear, specs$BasePriceType, Redef, sep = "_"))
-
- # Separate Make and Use tables into specific IO tables (all values in $)
- BEA$MakeTransactions <- BEA$Make[io_codes$Industries, io_codes$Commodities] * 1E6
+ if (specs$BasePriceType != "BAS") {
+ # Load pre-saved Make and Use tables
+ Redef <- ifelse(specs$BasewithRedefinitions, "AfterRedef", "BeforeRedef")
+ BEA$Make <- get(paste(specs$BaseIOLevel, "Make", specs$IOYear, Redef, sep = "_"))
+ BEA$Use <- get(paste(specs$BaseIOLevel, "Use", specs$IOYear, specs$BasePriceType, Redef, sep = "_"))
+ # Separate Make table into specific IO tables (all values in $)
+ BEA$MakeTransactions <- BEA$Make[io_codes$Industries, io_codes$Commodities] * 1E6
+ # Separate Use table into specific IO tables (all values in $)
+ # Final Demand
+ BEA$FinalDemand <- BEA$Use[io_codes$Commodities,
+ intersect(colnames(BEA$Use),
+ io_codes$FinalDemandCodes)] * 1E6
+ # Value Added
+ BEA$UseValueAdded <- BEA$Use[intersect(rownames(BEA$Use), io_codes$ValueAddedCodes),
+ io_codes$Industries] * 1E6
+ } else if (specs$BasePriceType == "BAS") {
+ # Load pre-saved Supply and Use tables
+ BEA$Supply <- get(paste(specs$BaseIOLevel, "Supply", specs$IOYear, sep = "_"))
+ UseSUT_PUR <- get(paste(specs$BaseIOLevel, "Use_SUT", specs$IOYear, sep = "_"))
+ BEA$Use <- convertUsefromPURtoBAS(UseSUT_PUR, specs, io_codes)
+ # Separate Supply table into specific IO tables (all values in $)
+ # Transpose Supply table to conform the structure of Make table
+ BEA$MakeTransactions <- as.data.frame(t(BEA$Supply[io_codes$Commodities,
+ io_codes$Industries])) * 1E6
+ # Separate Use table into specific IO tables (all values in $)
+ # Final Demand
+ # Note: import columns (MCIF and MADJ in BAS from Supply) is summed first,
+ # converted to negative, then appended to Use in BAS
+ SupplyImport_cols <- intersect(colnames(BEA$Supply), io_codes$FinalDemandCodes)
+ UseImport_col <- setdiff(io_codes$ImportCodes, SupplyImport_cols)
+ BEA$FinalDemand <- cbind(BEA$Use[io_codes$Commodities,
+ intersect(colnames(BEA$Use), io_codes$FinalDemandCodes)],
+ rowSums(BEA$Supply[io_codes$Commodities, SupplyImport_cols]) * -1) * 1E6
+ colnames(BEA$FinalDemand)[ncol(BEA$FinalDemand)] <- UseImport_col
+ BEA$FinalDemand <- BEA$FinalDemand[, setdiff(io_codes$FinalDemandCodes,
+ SupplyImport_cols)]
+ # Value Added
+ # Note: VA in BAS == V001(00) + V003(00) + T00OTOP, so T00OTOP is preserved
+ # and renamed to V002(00) in BEA$ValueAdded
+ VA_rows <- io_codes$ValueAddedCodes[startsWith(io_codes$ValueAddedCodes, "V")]
+ UseSUT_VA_rows <- intersect(rownames(BEA$Use), io_codes$ValueAddedCodes)
+ UseBAS_VA2_row <- io_codes$ValueAddedCodes[endsWith(io_codes$ValueAddedCodes, "OTOP")]
+ VA2_row <- setdiff(io_codes$ValueAddedCodes, UseSUT_VA_rows)
+ BEA$UseValueAdded <- BEA$Use[c(intersect(VA_rows, UseSUT_VA_rows),
+ UseBAS_VA2_row),
+ io_codes$Industries] * 1E6
+ rownames(BEA$UseValueAdded)[3] <- VA2_row
+ BEA$UseValueAdded <- BEA$UseValueAdded[order(rownames(BEA$UseValueAdded)), ]
+ }
BEA$MakeIndustryOutput <- as.data.frame(rowSums(BEA$MakeTransactions))
+ # Separate Use table into specific IO tables (all values in $)
BEA$UseTransactions <- BEA$Use[io_codes$Commodities, io_codes$Industries] * 1E6
- BEA$FinalDemand <- BEA$Use[io_codes$Commodities, io_codes$FinalDemandCodes] * 1E6
- BEA$UseValueAdded <- BEA$Use[io_codes$ValueAddedCodes, io_codes$Industries] * 1E6
BEA$UseCommodityOutput <- as.data.frame(rowSums(cbind(BEA$UseTransactions, BEA$FinalDemand)))
# Replace NA with 0 in IO tables
- if(specs$BaseIOSchema==2007) {
+ if (specs$BaseIOSchema == 2007) {
BEA$MakeTransactions[is.na(BEA$MakeTransactions)] <- 0
BEA$UseTransactions[is.na(BEA$UseTransactions)] <- 0
BEA$FinalDemand[is.na(BEA$FinalDemand)] <- 0
@@ -275,5 +335,8 @@ loadCommodityandIndustryOutput <- function(model) {
calculateIndustryCommodityOutput <- function(model) {
model$IndustryOutput <- colSums(model$UseTransactions) + colSums(model$UseValueAdded)
model$CommodityOutput <- rowSums(model$UseTransactions) + rowSums(model$FinalDemand)
+ if (model$specs$BasePriceType == "BAS") {
+ model$IndustryOutput <- rowSums(model$MakeTransactions)
+ }
return(model)
}
diff --git a/R/ValidateModel.R b/R/ValidateModel.R
index badc8a42..15b4fd4f 100644
--- a/R/ValidateModel.R
+++ b/R/ValidateModel.R
@@ -345,3 +345,24 @@ removeHybridProcesses <- function(model, object) {
return(object)
}
+#' Compare commodity or industry output calculated from Make and Use tables.
+#' @param model A model list object with model specs and IO tables listed
+#' @param output_type A string indicating commodity or industry output.
+#' @return A vector of relative difference between commodity or industry output
+#' calculated from Supply and Use tables.
+compareOutputfromMakeandUse <- function(model, output_type = "Commodity") {
+ # Calculate output
+ if (output_type == "Commodity") {
+ # commodity output
+ output_make <- colSums(model$MakeTransactions)
+ output_use <- rowSums(model$UseTransactions) + rowSums(model$FinalDemand)
+ } else {
+ # industry output
+ output_make <- rowSums(model$MakeTransactions)
+ output_use <- colSums(model$UseTransactions) + colSums(model$UseValueAdded)
+ }
+ # Compare output
+ rel_diff <- (output_make - output_use) / output_use
+ rel_diff[is.nan(rel_diff)] <- 0
+ return(rel_diff)
+}
diff --git a/R/WriteModel.R b/R/WriteModel.R
index b78402c2..2c7288ed 100644
--- a/R/WriteModel.R
+++ b/R/WriteModel.R
@@ -2,7 +2,7 @@
#' The vector of matrices to write out
matrices <- c("V", "U", "U_d", "A", "A_d", "B", "C", "D", "L", "L_d",
- "M", "M_d", "N", "N_d", "Rho", "Phi")
+ "M", "M_d", "N", "N_d", "Rho", "Phi", "Tau")
#' Writes all model data and metadata components to the API
#' @param model A complete EEIO model: a list with USEEIO model components and attributes.
diff --git a/data-raw/BEAData.R b/data-raw/BEAData.R
index 1b2cc9b9..d551e1eb 100644
--- a/data-raw/BEAData.R
+++ b/data-raw/BEAData.R
@@ -1,4 +1,4 @@
-# Download all IO tables from BEA iTable
+# Download all IO tables under Make-Use framework from BEA iTable
getBEAIOTables <- function() {
# Create the placeholder file
AllTablesIO <- "inst/extdata/AllTablesIO.zip"
@@ -894,7 +894,7 @@ mapBEAGrossOutputtoIOIndustry2012Schema <- function() {
FileName <- file.path("inst/extdata/UGdpByInd",
files[startsWith(files, "GrossOutput")])
date_last_modified <- as.character(as.Date(file.mtime(FileName)))
-
+
### Detail ###
DetailGrossOutput <- getBEADetailGrossOutput2012Schema()
# Determine year range
@@ -916,7 +916,7 @@ mapBEAGrossOutputtoIOIndustry2012Schema <- function() {
# Assign sector code to row names
rownames(DetailGrossOutputIO) <- DetailGrossOutputIO[, 1]
DetailGrossOutputIO[, 1] <- NULL
-
+
### Summary ###
SummaryGrossOutput <- getBEASummaryGrossOutput2012Schema()
# Map BEA Summary industry code to IO code
@@ -932,7 +932,7 @@ mapBEAGrossOutputtoIOIndustry2012Schema <- function() {
# Assign sector code to row names
rownames(SummaryGrossOutputIO) <- SummaryGrossOutputIO[, 1]
SummaryGrossOutputIO[, 1] <- NULL
-
+
### Sector ###
SectorGrossOutput <- getBEASectorGrossOutput2012Schema()
# Map BEA Sector industry code to IO code
@@ -947,7 +947,7 @@ mapBEAGrossOutputtoIOIndustry2012Schema <- function() {
# Assign sector code to row names
rownames(SectorGrossOutputIO) <- SectorGrossOutputIO[, 1]
SectorGrossOutputIO[, 1] <- NULL
-
+
### Save and Document data
ls <- list("Detail_GrossOutput_IO" = DetailGrossOutputIO,
"Summary_GrossOutput_IO" = SummaryGrossOutputIO,
@@ -1060,7 +1060,7 @@ mapBEACPItoIOIndustry2012Schema <- function() {
FileName <- file.path("inst/extdata/UGdpByInd",
files[startsWith(files, "GrossOutput")])
date_last_modified <- as.character(as.Date(file.mtime(FileName)))
-
+
### Detail ###
DetailCPI <- getBEADetailCPI2012Schema()
DetailCPI$Gross_Output_Detail_Industry <- sub("’", "'",
@@ -1098,7 +1098,7 @@ mapBEACPItoIOIndustry2012Schema <- function() {
# Assign sector code to row names
rownames(DetailCPIIO) <- DetailCPIIO[, 1]
DetailCPIIO[, 1] <- NULL
-
+
### Summary ###
SummaryCPI <- getBEASummaryCPI2012Schema()
# Map BEA Summary industry code to IO code
@@ -1113,7 +1113,7 @@ mapBEACPItoIOIndustry2012Schema <- function() {
# Assign sector code to row names
rownames(SummaryCPIIO) <- SummaryCPIIO[, 1]
SummaryCPIIO[, 1] <- NULL
-
+
### Sector ###
SectorCPI <- getBEASectorCPI2012Schema()
# Map BEA Sector industry code to IO code
@@ -1128,7 +1128,7 @@ mapBEACPItoIOIndustry2012Schema <- function() {
# Assign sector code to row names
rownames(SectorCPIIO) <- SectorCPIIO[, 1]
SectorCPIIO[, 1] <- NULL
-
+
### Save and Document data
ls <- list("Detail_CPI_IO" = DetailCPIIO,
"Summary_CPI_IO" = SummaryCPIIO,
@@ -1213,7 +1213,7 @@ mapBEAValueAddedtoIOIndustry2012Schema <- function() {
FileName <- file.path("inst/extdata/UGdpByInd",
files[startsWith(files, "ValueAdded")])
date_last_modified <- as.character(as.Date(file.mtime(FileName)))
-
+
### Summary ###
SummaryValueAdded <- getBEASummaryValueAdded2012Schema()
# Determine year range
@@ -1230,7 +1230,7 @@ mapBEAValueAddedtoIOIndustry2012Schema <- function() {
# Assign sector code to row names
rownames(SummaryValueAddedIO) <- SummaryValueAddedIO[, 1]
SummaryValueAddedIO[, 1] <- NULL
-
+
### Sector ###
SectorValueAdded <- getBEASectorValueAdded2012Schema()
# Map BEA Sector industry code to IO code
@@ -1245,7 +1245,7 @@ mapBEAValueAddedtoIOIndustry2012Schema <- function() {
# Assign sector code to row names
rownames(SectorValueAddedIO) <- SectorValueAddedIO[, 1]
SectorValueAddedIO[, 1] <- NULL
-
+
### Save and Document data
ls <- list("Summary_ValueAdded_IO" = SummaryValueAddedIO,
"Sector_ValueAdded_IO" = SectorValueAddedIO)
@@ -1325,7 +1325,7 @@ getBEACodeName2012Schema <- function() {
colnames(BEADetailFinalDemandCodeName) <- c("BEA_2012_Detail_FinalDemand_Code",
"BEA_2012_Detail_FinalDemand_Name")
rownames(BEADetailFinalDemandCodeName) <- NULL
-
+
### Summary ###
# Load data
FileName <- file.path("inst/extdata/AllTablesIO",
@@ -1361,7 +1361,7 @@ getBEACodeName2012Schema <- function() {
colnames(BEASummaryFinalDemandCodeName) <- c("BEA_2012_Summary_FinalDemand_Code",
"BEA_2012_Summary_FinalDemand_Name")
rownames(BEASummaryFinalDemandCodeName) <- NULL
-
+
### Sector ###
# Load data
FileName <- file.path("inst/extdata/AllTablesIO",
@@ -1397,7 +1397,7 @@ getBEACodeName2012Schema <- function() {
colnames(BEASectorFinalDemandCodeName) <- c("BEA_2012_Sector_FinalDemand_Code",
"BEA_2012_Sector_FinalDemand_Name")
rownames(BEASectorFinalDemandCodeName) <- NULL
-
+
### Put the data.frames in a list
BEACodeNameList <- list("Detail_IndustryCodeName_2012" = BEADetailIndustryCodeName,
"Detail_CommodityCodeName_2012" = BEADetailCommodityCodeName,
@@ -1462,3 +1462,292 @@ getBEADetailMarginsBeforeRedef2012Schema <- function(year) {
date_last_modified = "2022-03-04", # page last modified
date_accessed = as.character(as.Date(file.mtime(FileName))))
}
+
+
+# Download all Supply and Use tables from BEA iTable
+getBEASupplyUseTables <- function() {
+ # Create the placeholder file
+ AllTablesSUP <- "inst/extdata/AllTablesIOSUP.zip"
+ # Download all BEA IO tables into the placeholder file
+ url <- "https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"
+ if (!file.exists(AllTablesSUP)) {
+ utils::download.file(url, AllTablesSUP, mode = "wb")
+ }
+ # Get the name of all files in the zip archive
+ files <- unzip(AllTablesSUP, list = TRUE)
+ fname <- files[files$Length > 0, ]$Name
+ if (all(fname == basename(fname))) {
+ exdir <- "inst/extdata/AllTablesSUP"
+ } else {
+ exdir <- "inst/extdata/"
+ }
+ # Unzip the file to the designated directory
+ unzip(AllTablesSUP, files = fname, exdir = exdir,
+ overwrite = TRUE, setTimes = TRUE)
+ # Create output
+ ls <- list("url" = url,
+ "date_accessed" = as.character(as.Date(file.mtime(AllTablesSUP))),
+ "files" = basename(fname))
+ return(ls)
+}
+
+# Get BEA Detail Supply (2012 schema) table from static Excel
+getBEADetailSupply2012Schema <- function(year) {
+ # Download data
+ url <- getBEASupplyUseTables()[["url"]]
+ date_accessed <- getBEASupplyUseTables()[["date_accessed"]]
+ files <- getBEASupplyUseTables()[["files"]]
+ # Load data
+ FileName <- file.path("inst/extdata/AllTablesSUP",
+ files[startsWith(files, "Supply") &
+ endsWith(files, "DET.xlsx")])
+ date_last_modified <- as.character(as.Date(file.mtime(FileName)))
+ DetailSupply <- as.data.frame(readxl::read_excel(FileName,
+ sheet = as.character(year)))
+ # Assign row and column names
+ DetailSupply <- DetailSupply[!is.na(DetailSupply[, 2]), ]
+ colnames(DetailSupply) <- DetailSupply[1, ]
+ rownames(DetailSupply) <- DetailSupply$Code
+ # Trim table, convert all values to numeric, assign row names
+ DetailSupply <- as.data.frame(lapply(DetailSupply[-1, -c(1:2)], as.numeric),
+ check.names = FALSE,
+ row.names = DetailSupply[-1, 1])
+ # Replace NA with zero
+ DetailSupply[is.na(DetailSupply)] <- 0
+ # Write data to .rda
+ writeDatatoRDA(data = DetailSupply,
+ data_name = paste0("Detail_Supply_", year))
+ # Write metadata to JSON
+ writeMetadatatoJSON(package = "useeior",
+ name = paste0("Detail_Supply_", year),
+ year = year,
+ source = "US Bureau of Economic Analysis",
+ url = url,
+ date_last_modified = date_last_modified,
+ date_accessed = date_accessed)
+}
+
+
+# Get BEA Detail Use (under the Supply-Use framework, 2012 schema) table from static Excel
+getBEADetailUseSUT2012Schema <- function(year) {
+ # Download data
+ url <- getBEASupplyUseTables()[["url"]]
+ date_accessed <- getBEASupplyUseTables()[["date_accessed"]]
+ files <- getBEASupplyUseTables()[["files"]]
+ # Load data
+ FileName <- file.path("inst/extdata/AllTablesSUP",
+ files[startsWith(files, "Use") &
+ endsWith(files, "DET.xlsx")])
+ date_last_modified <- as.character(as.Date(file.mtime(FileName)))
+ DetailUse <- as.data.frame(readxl::read_excel(FileName,
+ sheet = as.character(year)))
+ # Assign row and column names
+ DetailUse <- DetailUse[!is.na(DetailUse[, 2]), ]
+ colnames(DetailUse) <- DetailUse[1, ]
+ rownames(DetailUse) <- DetailUse$Code
+ # Trim table, convert all values to numeric, assign row names
+ DetailUse <- as.data.frame(lapply(DetailUse[-1, -c(1:2)], as.numeric),
+ check.names = FALSE,
+ row.names = DetailUse[-1, 1])
+ # Replace NA with zero
+ DetailUse[is.na(DetailUse)] <- 0
+ # Write data to .rda
+ writeDatatoRDA(data = DetailUse,
+ data_name = paste0("Detail_Use_SUT_", year))
+ # Write metadata to JSON
+ writeMetadatatoJSON(package = "useeior",
+ name = paste0("Detail_Use_SUT_", year),
+ year = year,
+ source = "US Bureau of Economic Analysis",
+ url = url,
+ date_last_modified = date_last_modified,
+ date_accessed = date_accessed)
+}
+
+
+# Get BEA Summary Supply (2012 schema) table from static Excel
+getBEASummarySupply2012Schema <- function() {
+ # Download data
+ url <- getBEASupplyUseTables()[["url"]]
+ date_accessed <- getBEASupplyUseTables()[["date_accessed"]]
+ files <- getBEASupplyUseTables()[["files"]]
+ # Prepare file name
+ file <- files[startsWith(files, "Supply") & endsWith(files, "SUM.xlsx")]
+ FileName <- file.path("inst/extdata/AllTablesSUP", file)
+ date_last_modified <- as.character(as.Date(file.mtime(FileName)))
+ # Find latest data year
+ file_split <- unlist(stringr::str_split(file, pattern = "_"))
+ year_range <- file_split[length(file_split) - 1]
+ end_year <- sub(".*-", "", year_range)
+ # Load data
+ for (year in 2010:end_year) {
+ SummarySupply <- as.data.frame(readxl::read_excel(FileName,
+ sheet = as.character(year)))
+ # Trim table, assign column names
+ SummarySupply <- SummarySupply[!is.na(SummarySupply[, 2]), ]
+ colnames(SummarySupply) <- SummarySupply[1, ]
+ colname_check <- is.na(colnames(SummarySupply))
+ colnames(SummarySupply)[colname_check] <- SummarySupply[2, colname_check]
+ # Fill NA in code column with corresponding name
+ SummarySupply[is.na(SummarySupply[, 1]), 1] <- SummarySupply[is.na(SummarySupply[, 1]), 2]
+ # Convert all values to numeric, assign row names
+ SummarySupply <- as.data.frame(lapply(SummarySupply[-c(1:2), -c(1:2)], as.numeric),
+ check.names = FALSE,
+ row.names = SummarySupply[-c(1:2), 1])
+ # Replace NA with zero
+ SummarySupply[is.na(SummarySupply)] <- 0
+ # Write data to .rda
+ writeDatatoRDA(data = SummarySupply,
+ data_name = paste0("Summary_Supply_", year))
+ # Write metadata to JSON
+ writeMetadatatoJSON(package = "useeior",
+ name = paste0("Summary_Supply_", year),
+ year = year,
+ source = "US Bureau of Economic Analysis",
+ url = url,
+ date_last_modified = date_last_modified,
+ date_accessed = date_accessed)
+ }
+}
+
+# Get BEA Summary Use (under the Supply-Use framework, 2012 schema) table from static Excel
+getBEASummaryUseSUT2012Schema <- function() {
+ # Download data
+ url <- getBEASupplyUseTables()[["url"]]
+ date_accessed <- getBEASupplyUseTables()[["date_accessed"]]
+ files <- getBEASupplyUseTables()[["files"]]
+ # Prepare file name
+ file <- files[startsWith(files, "Use") & endsWith(files, "Sum.xlsx")]
+ FileName <- file.path("inst/extdata/AllTablesSUP", file)
+ date_last_modified <- as.character(as.Date(file.mtime(FileName)))
+ # Find latest data year
+ file_split <- unlist(stringr::str_split(file, pattern = "_"))
+ year_range <- file_split[length(file_split) - 1]
+ end_year <- sub(".*-", "", year_range)
+ # Load data
+ for (year in 2010:end_year) {
+ SummaryUse <- as.data.frame(readxl::read_excel(FileName,
+ sheet = as.character(year)))
+ # Trim table, assign column names
+ SummaryUse <- SummaryUse[!is.na(SummaryUse[, 2]), ]
+ colnames(SummaryUse) <- SummaryUse[1, ]
+ colname_check <- is.na(colnames(SummaryUse))
+ colnames(SummaryUse)[colname_check] <- SummaryUse[2, colname_check]
+ # Fill NA in code column with corresponding name
+ SummaryUse[is.na(SummaryUse[, 1]), 1] <- SummaryUse[is.na(SummaryUse[, 1]), 2]
+ # Convert all values to numeric, assign row names
+ SummaryUse <- as.data.frame(lapply(SummaryUse[-c(1:2), -c(1:2)], as.numeric),
+ check.names = FALSE,
+ row.names = SummaryUse[-c(1:2), 1])
+ # Replace NA with zero
+ SummaryUse[is.na(SummaryUse)] <- 0
+ # Write data to .rda
+ writeDatatoRDA(data = SummaryUse,
+ data_name = paste0("Summary_Use_SUT_", year))
+ # Write metadata to JSON
+ writeMetadatatoJSON(package = "useeior",
+ name = paste0("Summary_Use_SUT_", year),
+ year = year,
+ source = "US Bureau of Economic Analysis",
+ url = url,
+ date_last_modified = date_last_modified,
+ date_accessed = date_accessed)
+ }
+}
+
+
+# Get BEA Sector Supply (2012 schema) table from static Excel
+getBEASectorSupply2012Schema <- function() {
+ # Download data
+ url <- getBEASupplyUseTables()[["url"]]
+ date_accessed <- getBEASupplyUseTables()[["date_accessed"]]
+ files <- getBEASupplyUseTables()[["files"]]
+ # Prepare file name
+ file <- files[startsWith(files, "Supply") & endsWith(files, "SEC.xlsx")]
+ FileName <- file.path("inst/extdata/AllTablesSUP", file)
+ date_last_modified <- as.character(as.Date(file.mtime(FileName)))
+ # Find latest data year
+ file_split <- unlist(stringr::str_split(file, pattern = "_"))
+ year_range <- file_split[length(file_split) - 1]
+ end_year <- sub(".*-", "", year_range)
+ # Load data
+ for (year in 2010:end_year) {
+ SectorSupply <- as.data.frame(readxl::read_excel(FileName,
+ sheet = as.character(year)))
+ # Trim table, assign column names
+ SectorSupply <- SectorSupply[!is.na(SectorSupply[, 2]), ]
+ colnames(SectorSupply) <- SectorSupply[1, ]
+ colname_check <- is.na(colnames(SectorSupply))
+ colnames(SectorSupply)[colname_check] <- SectorSupply[2, colname_check]
+ # Assign T017 to Total industry supply if not provided
+ if (is.na(SectorSupply[SectorSupply$`Commodities/Industries` == "Total industry supply", 1])) {
+ SectorSupply[SectorSupply$`Commodities/Industries` == "Total industry supply", 1] <- "T017"
+ }
+ # Fill NA in code column with corresponding name
+ SectorSupply[is.na(SectorSupply[, 1]), 1] <- SectorSupply[is.na(SectorSupply[, 1]), 2]
+ # Convert all values to numeric, assign row names
+ SectorSupply <- as.data.frame(lapply(SectorSupply[-c(1:2), -c(1:2)], as.numeric),
+ check.names = FALSE,
+ row.names = SectorSupply[-c(1:2), 1])
+ # Replace NA with zero
+ SectorSupply[is.na(SectorSupply)] <- 0
+ # Write data to .rda
+ writeDatatoRDA(data = SectorSupply,
+ data_name = paste0("Sector_Supply_", year))
+ # Write metadata to JSON
+ writeMetadatatoJSON(package = "useeior",
+ name = paste0("Sector_Supply_", year),
+ year = year,
+ source = "US Bureau of Economic Analysis",
+ url = url,
+ date_last_modified = date_last_modified,
+ date_accessed = date_accessed)
+ }
+}
+
+
+# Get BEA Sector Use (under the Supply-Use framework, 2012 schema) table from static Excel
+getBEASectorUseSUT2012Schema <- function() {
+ # Download data
+ url <- getBEASupplyUseTables()[["url"]]
+ date_accessed <- getBEASupplyUseTables()[["date_accessed"]]
+ files <- getBEASupplyUseTables()[["files"]]
+ # Prepare file name
+ file <- files[startsWith(files, "Use") & endsWith(files, "SECT.xlsx")]
+ FileName <- file.path("inst/extdata/AllTablesSUP", file)
+ date_last_modified <- as.character(as.Date(file.mtime(FileName)))
+ # Find latest data year
+ file_split <- unlist(stringr::str_split(file, pattern = "_"))
+ year_range <- file_split[length(file_split) - 1]
+ end_year <- sub(".*-", "", year_range)
+ # Load data
+ for (year in 2010:end_year) {
+ SectorUse <- as.data.frame(readxl::read_excel(FileName,
+ sheet = as.character(year)))
+ # Trim table, assign column names
+ SectorUse <- SectorUse[!is.na(SectorUse[, 2]), ]
+ colnames(SectorUse) <- SectorUse[1, ]
+ colname_check <- is.na(colnames(SectorUse))
+ colnames(SectorUse)[colname_check] <- SectorUse[2, colname_check]
+ # Fill NA in code column with corresponding name
+ SectorUse[is.na(SectorUse[, 1]), 1] <- SectorUse[is.na(SectorUse[, 1]), 2]
+ # Convert all values to numeric, assign row names
+ SectorUse <- as.data.frame(lapply(SectorUse[-c(1:2), -c(1:2)], as.numeric),
+ check.names = FALSE,
+ row.names = SectorUse[-c(1:2), 1])
+ # Replace NA with zero
+ SectorUse[is.na(SectorUse)] <- 0
+ # Write data to .rda
+ writeDatatoRDA(data = SectorUse,
+ data_name = paste0("Sector_Use_SUT_", year))
+ # Write metadata to JSON
+ writeMetadatatoJSON(package = "useeior",
+ name = paste0("Sector_Use_SUT_", year),
+ year = year,
+ source = "US Bureau of Economic Analysis",
+ url = url,
+ date_last_modified = date_last_modified,
+ date_accessed = date_accessed)
+ }
+}
+
diff --git a/data-raw/BEAData_Detail.R b/data-raw/BEAData_Detail.R
index 86c45fc9..bdb31c12 100644
--- a/data-raw/BEAData_Detail.R
+++ b/data-raw/BEAData_Detail.R
@@ -34,4 +34,12 @@ getBEADetailImportBeforeRedef2012Schema(schema_year)
getBEACodeName2012Schema()
# Download, save and document 2012 BEA Detail Margins table
-getBEADetailMarginsBeforeRedef2012Schema(schema_year)
\ No newline at end of file
+getBEADetailMarginsBeforeRedef2012Schema(schema_year)
+
+## Supply and Use Tables
+# Download, save and document 2012 BEA Detail Supply (2012 schema)
+getBEADetailSupply2012Schema(schema_year)
+
+# Download, save and document 2012 BEA Detail Supply (2012 schema)
+getBEADetailUseSUT2012Schema(schema_year)
+
diff --git a/data-raw/BEAData_Support.R b/data-raw/BEAData_Support.R
index 42acb117..9552b49c 100644
--- a/data-raw/BEAData_Support.R
+++ b/data-raw/BEAData_Support.R
@@ -40,3 +40,16 @@ mapBEACPItoIOIndustry2012Schema()
# Download, save and document BEA Summary and Sector Value Added tables since 2002
mapBEAValueAddedtoIOIndustry2012Schema()
+
+## Supply and Use Tables
+# Download, save and document 2010-2020 BEA Summary Supply (2012 schema)
+getBEASummarySupply2012Schema()
+
+# Download, save and document 2010-2020 BEA Summary Use (2012 schema)
+getBEASummaryUseSUT2012Schema()
+
+# Download, save and document 2010-2020 BEA Sector Supply (2012 schema)
+getBEASectorSupply2012Schema()
+
+# Download, save and document 2010-2020 BEA Sector Supply (2012 schema)
+getBEASectorUseSUT2012Schema()
diff --git a/data/Detail_Supply_2012.rda b/data/Detail_Supply_2012.rda
new file mode 100644
index 00000000..d6d17135
Binary files /dev/null and b/data/Detail_Supply_2012.rda differ
diff --git a/data/Detail_Use_SUT_2012.rda b/data/Detail_Use_SUT_2012.rda
new file mode 100644
index 00000000..a577ec6f
Binary files /dev/null and b/data/Detail_Use_SUT_2012.rda differ
diff --git a/data/Sector_Supply_2010.rda b/data/Sector_Supply_2010.rda
new file mode 100644
index 00000000..0744e0ee
Binary files /dev/null and b/data/Sector_Supply_2010.rda differ
diff --git a/data/Sector_Supply_2011.rda b/data/Sector_Supply_2011.rda
new file mode 100644
index 00000000..bc5675a4
Binary files /dev/null and b/data/Sector_Supply_2011.rda differ
diff --git a/data/Sector_Supply_2012.rda b/data/Sector_Supply_2012.rda
new file mode 100644
index 00000000..207601e2
Binary files /dev/null and b/data/Sector_Supply_2012.rda differ
diff --git a/data/Sector_Supply_2013.rda b/data/Sector_Supply_2013.rda
new file mode 100644
index 00000000..3d400cb5
Binary files /dev/null and b/data/Sector_Supply_2013.rda differ
diff --git a/data/Sector_Supply_2014.rda b/data/Sector_Supply_2014.rda
new file mode 100644
index 00000000..57e4296b
Binary files /dev/null and b/data/Sector_Supply_2014.rda differ
diff --git a/data/Sector_Supply_2015.rda b/data/Sector_Supply_2015.rda
new file mode 100644
index 00000000..88690009
Binary files /dev/null and b/data/Sector_Supply_2015.rda differ
diff --git a/data/Sector_Supply_2016.rda b/data/Sector_Supply_2016.rda
new file mode 100644
index 00000000..2f4dff32
Binary files /dev/null and b/data/Sector_Supply_2016.rda differ
diff --git a/data/Sector_Supply_2017.rda b/data/Sector_Supply_2017.rda
new file mode 100644
index 00000000..10e6eb15
Binary files /dev/null and b/data/Sector_Supply_2017.rda differ
diff --git a/data/Sector_Supply_2018.rda b/data/Sector_Supply_2018.rda
new file mode 100644
index 00000000..712b2f57
Binary files /dev/null and b/data/Sector_Supply_2018.rda differ
diff --git a/data/Sector_Supply_2019.rda b/data/Sector_Supply_2019.rda
new file mode 100644
index 00000000..ae47b131
Binary files /dev/null and b/data/Sector_Supply_2019.rda differ
diff --git a/data/Sector_Supply_2020.rda b/data/Sector_Supply_2020.rda
new file mode 100644
index 00000000..0bee6e20
Binary files /dev/null and b/data/Sector_Supply_2020.rda differ
diff --git a/data/Sector_Use_SUT_2010.rda b/data/Sector_Use_SUT_2010.rda
new file mode 100644
index 00000000..48bcfa4a
Binary files /dev/null and b/data/Sector_Use_SUT_2010.rda differ
diff --git a/data/Sector_Use_SUT_2011.rda b/data/Sector_Use_SUT_2011.rda
new file mode 100644
index 00000000..560159e9
Binary files /dev/null and b/data/Sector_Use_SUT_2011.rda differ
diff --git a/data/Sector_Use_SUT_2012.rda b/data/Sector_Use_SUT_2012.rda
new file mode 100644
index 00000000..cb9c6b3d
Binary files /dev/null and b/data/Sector_Use_SUT_2012.rda differ
diff --git a/data/Sector_Use_SUT_2013.rda b/data/Sector_Use_SUT_2013.rda
new file mode 100644
index 00000000..f1ac7127
Binary files /dev/null and b/data/Sector_Use_SUT_2013.rda differ
diff --git a/data/Sector_Use_SUT_2014.rda b/data/Sector_Use_SUT_2014.rda
new file mode 100644
index 00000000..f9bbada7
Binary files /dev/null and b/data/Sector_Use_SUT_2014.rda differ
diff --git a/data/Sector_Use_SUT_2015.rda b/data/Sector_Use_SUT_2015.rda
new file mode 100644
index 00000000..ede987d2
Binary files /dev/null and b/data/Sector_Use_SUT_2015.rda differ
diff --git a/data/Sector_Use_SUT_2016.rda b/data/Sector_Use_SUT_2016.rda
new file mode 100644
index 00000000..751f567c
Binary files /dev/null and b/data/Sector_Use_SUT_2016.rda differ
diff --git a/data/Sector_Use_SUT_2017.rda b/data/Sector_Use_SUT_2017.rda
new file mode 100644
index 00000000..20236e2a
Binary files /dev/null and b/data/Sector_Use_SUT_2017.rda differ
diff --git a/data/Sector_Use_SUT_2018.rda b/data/Sector_Use_SUT_2018.rda
new file mode 100644
index 00000000..b3e7fde3
Binary files /dev/null and b/data/Sector_Use_SUT_2018.rda differ
diff --git a/data/Sector_Use_SUT_2019.rda b/data/Sector_Use_SUT_2019.rda
new file mode 100644
index 00000000..245e604a
Binary files /dev/null and b/data/Sector_Use_SUT_2019.rda differ
diff --git a/data/Sector_Use_SUT_2020.rda b/data/Sector_Use_SUT_2020.rda
new file mode 100644
index 00000000..e3d65df4
Binary files /dev/null and b/data/Sector_Use_SUT_2020.rda differ
diff --git a/data/Summary_Supply_2010.rda b/data/Summary_Supply_2010.rda
new file mode 100644
index 00000000..e02eaba0
Binary files /dev/null and b/data/Summary_Supply_2010.rda differ
diff --git a/data/Summary_Supply_2011.rda b/data/Summary_Supply_2011.rda
new file mode 100644
index 00000000..c11ad686
Binary files /dev/null and b/data/Summary_Supply_2011.rda differ
diff --git a/data/Summary_Supply_2012.rda b/data/Summary_Supply_2012.rda
new file mode 100644
index 00000000..3f5de544
Binary files /dev/null and b/data/Summary_Supply_2012.rda differ
diff --git a/data/Summary_Supply_2013.rda b/data/Summary_Supply_2013.rda
new file mode 100644
index 00000000..98c5fb71
Binary files /dev/null and b/data/Summary_Supply_2013.rda differ
diff --git a/data/Summary_Supply_2014.rda b/data/Summary_Supply_2014.rda
new file mode 100644
index 00000000..ad8e6032
Binary files /dev/null and b/data/Summary_Supply_2014.rda differ
diff --git a/data/Summary_Supply_2015.rda b/data/Summary_Supply_2015.rda
new file mode 100644
index 00000000..e0db2235
Binary files /dev/null and b/data/Summary_Supply_2015.rda differ
diff --git a/data/Summary_Supply_2016.rda b/data/Summary_Supply_2016.rda
new file mode 100644
index 00000000..bc782939
Binary files /dev/null and b/data/Summary_Supply_2016.rda differ
diff --git a/data/Summary_Supply_2017.rda b/data/Summary_Supply_2017.rda
new file mode 100644
index 00000000..12bca757
Binary files /dev/null and b/data/Summary_Supply_2017.rda differ
diff --git a/data/Summary_Supply_2018.rda b/data/Summary_Supply_2018.rda
new file mode 100644
index 00000000..62e76643
Binary files /dev/null and b/data/Summary_Supply_2018.rda differ
diff --git a/data/Summary_Supply_2019.rda b/data/Summary_Supply_2019.rda
new file mode 100644
index 00000000..deccbccf
Binary files /dev/null and b/data/Summary_Supply_2019.rda differ
diff --git a/data/Summary_Supply_2020.rda b/data/Summary_Supply_2020.rda
new file mode 100644
index 00000000..4725179f
Binary files /dev/null and b/data/Summary_Supply_2020.rda differ
diff --git a/data/Summary_Use_SUT_2010.rda b/data/Summary_Use_SUT_2010.rda
new file mode 100644
index 00000000..d669c10a
Binary files /dev/null and b/data/Summary_Use_SUT_2010.rda differ
diff --git a/data/Summary_Use_SUT_2011.rda b/data/Summary_Use_SUT_2011.rda
new file mode 100644
index 00000000..02c71e83
Binary files /dev/null and b/data/Summary_Use_SUT_2011.rda differ
diff --git a/data/Summary_Use_SUT_2012.rda b/data/Summary_Use_SUT_2012.rda
new file mode 100644
index 00000000..d09b6751
Binary files /dev/null and b/data/Summary_Use_SUT_2012.rda differ
diff --git a/data/Summary_Use_SUT_2013.rda b/data/Summary_Use_SUT_2013.rda
new file mode 100644
index 00000000..42b7c087
Binary files /dev/null and b/data/Summary_Use_SUT_2013.rda differ
diff --git a/data/Summary_Use_SUT_2014.rda b/data/Summary_Use_SUT_2014.rda
new file mode 100644
index 00000000..03344dcd
Binary files /dev/null and b/data/Summary_Use_SUT_2014.rda differ
diff --git a/data/Summary_Use_SUT_2015.rda b/data/Summary_Use_SUT_2015.rda
new file mode 100644
index 00000000..a204c551
Binary files /dev/null and b/data/Summary_Use_SUT_2015.rda differ
diff --git a/data/Summary_Use_SUT_2016.rda b/data/Summary_Use_SUT_2016.rda
new file mode 100644
index 00000000..77db5dea
Binary files /dev/null and b/data/Summary_Use_SUT_2016.rda differ
diff --git a/data/Summary_Use_SUT_2017.rda b/data/Summary_Use_SUT_2017.rda
new file mode 100644
index 00000000..29bf0887
Binary files /dev/null and b/data/Summary_Use_SUT_2017.rda differ
diff --git a/data/Summary_Use_SUT_2018.rda b/data/Summary_Use_SUT_2018.rda
new file mode 100644
index 00000000..c97310cb
Binary files /dev/null and b/data/Summary_Use_SUT_2018.rda differ
diff --git a/data/Summary_Use_SUT_2019.rda b/data/Summary_Use_SUT_2019.rda
new file mode 100644
index 00000000..edab7151
Binary files /dev/null and b/data/Summary_Use_SUT_2019.rda differ
diff --git a/data/Summary_Use_SUT_2020.rda b/data/Summary_Use_SUT_2020.rda
new file mode 100644
index 00000000..9f5e0ed5
Binary files /dev/null and b/data/Summary_Use_SUT_2020.rda differ
diff --git a/format_specs/Model.md b/format_specs/Model.md
index 20bc9c1b..bea10acb 100644
--- a/format_specs/Model.md
+++ b/format_specs/Model.md
@@ -24,6 +24,7 @@ Items are listed in the order in which they appear in a built Model object in R.
| MultiYearIndustryOutput | data.frame | supporting data | Multi-year industry output in [sector-by-year format](#sector-by-year) |
| MultiYearCommodityOutput | data.frame | supporting data | Multi-year commodity output in [sector-by-year format](#sector-by-year) |
| Margins | data.frame | supporting data | [The final consumer margins table](#margins) |
+| TaxLessSubsidies | data.frame | supporting data | [Total product supply in basic price and tax less subsidies](#taxlesssubsidies) |
| MultiYearIndustryCPI | data.frame | supporting data | Multi-year industry CPI1 in [sector-by-year format](#sector-by-year) |
| MultiYearCommodityCPI | data.frame | supporting data | Multi-year commodity CPI1 in [sector-by-year format](#sector-by-year) |
| AggregationSpecs | list | metadata | Specifications for one or more aggregations
@@ -55,6 +56,7 @@ Items are listed in the order in which they appear in a built Model object in R.
| N_d | matrix | result matrix | [The total impact (from domestic activity) matrix](#N) |
| Rho | matrix | component matrix | [The CPI1 price year ratio matrix for a given model](#Rho)|
| Phi | matrix | component matrix | [The producer-to-purchaser price ratio matrix for a given model](#Phi)|
+| Tau | matrix | component matrix | [The basic-to-producer price ratio matrix for a given model](#Tau)|
1 Chain-type Price Index
@@ -114,6 +116,18 @@ A [sector meta table](#sector-meta) with an additional group field.
| Code_Loc | str | Code plus location (e.g. `1111A0/US`) |
| PurchasersValue | numeric | Purchaser's value (sum of ProducersValue, Transportation, Wholesale, and Retail) |
+### TaxLessSubsidies
+
+| Item | Type | Description |
+| --- | --- | --------- |
+| BasicValue | numeric | Basic value |
+| MDTY | numeric | Import duties |
+| TOP | numeric | Taxes on production |
+| SUB | numeric | Subsidies |
+| ProducerValue | numeric | Producer's value |
+| Name | str | Sector name |
+| Code_Loc | str | Code plus location (e.g. `1111A0/US`) |
+
### SatelliteTables
The SatelliteTables object contains a totals_by_sector list and a flows dataframe.
@@ -327,6 +341,18 @@ flows | |
+-------+
```
+#### Tau
+
+`Tau` is also a `sector x year` matrix and contains in each column `y` basic-to-producer price ratios. Tau ratios are year-specific ratios in the form of value in basic price/value in producer price.
+
+```
+ years
+ +-------+
+flows | |
+ | Tau |
+ +-------+
+```
+
### Model Result Matrices
diff --git a/inst/extdata/2012_Detail_Schema_Info.csv b/inst/extdata/2012_Detail_Schema_Info.csv
index ec623d92..462542a1 100644
--- a/inst/extdata/2012_Detail_Schema_Info.csv
+++ b/inst/extdata/2012_Detail_Schema_Info.csv
@@ -1,439 +1,448 @@
-Code,Commodity,Industry,Scrap,UsedGoods,NonComparableImport,RoWAdjustment,ValueAdded,CommodityTotalOutput,IndustryTotalOutput,CommodityIntermediateOutput,HouseholdDemand,InvestmentDemand,ChangeInventories,Export,Import,GovernmentDemand,NaturalGas,Water,Electricity,Petroleum,PersonalTransportRelated,Wholesale,Retail,Transportation
-1111A0,1,1,,,,,,,,,,,,,,,,,,,,,,
-1111B0,1,1,,,,,,,,,,,,,,,,,,,,,,
-111200,1,1,,,,,,,,,,,,,,,,,,,,,,
-111300,1,1,,,,,,,,,,,,,,,,,,,,,,
-111400,1,1,,,,,,,,,,,,,,,,,,,,,,
-111900,1,1,,,,,,,,,,,,,,,,,,,,,,
-112120,1,1,,,,,,,,,,,,,,,,,,,,,,
-1121A0,1,1,,,,,,,,,,,,,,,,,,,,,,
-112300,1,1,,,,,,,,,,,,,,,,,,,,,,
-112A00,1,1,,,,,,,,,,,,,,,,,,,,,,
-113000,1,1,,,,,,,,,,,,,,,,,,,,,,
-114000,1,1,,,,,,,,,,,,,,,,,,,,,,
-115000,1,1,,,,,,,,,,,,,,,,,,,,,,
-211000,1,1,,,,,,,,,,,,,,,,,,,,,,
-212100,1,1,,,,,,,,,,,,,,,,,,,,,,
-212230,1,1,,,,,,,,,,,,,,,,,,,,,,
-2122A0,1,1,,,,,,,,,,,,,,,,,,,,,,
-212310,1,1,,,,,,,,,,,,,,,,,,,,,,
-2123A0,1,1,,,,,,,,,,,,,,,,,,,,,,
-213111,1,1,,,,,,,,,,,,,,,,,,,,,,
-21311A,1,1,,,,,,,,,,,,,,,,,,,,,,
-221100,1,1,,,,,,,,,,,,,,,,,1,,,,,
-221200,1,1,,,,,,,,,,,,,,,1,,,,,,,
-221300,1,1,,,,,,,,,,,,,,,,1,,,,,,
-233210,1,1,,,,,,,,,,,,,,,,,,,,,,
-233262,1,1,,,,,,,,,,,,,,,,,,,,,,
-230301,1,1,,,,,,,,,,,,,,,,,,,,,,
-230302,1,1,,,,,,,,,,,,,,,,,,,,,,
-2332A0,1,1,,,,,,,,,,,,,,,,,,,,,,
-233412,1,1,,,,,,,,,,,,,,,,,,,,,,
-2334A0,1,1,,,,,,,,,,,,,,,,,,,,,,
-233230,1,1,,,,,,,,,,,,,,,,,,,,,,
-2332D0,1,1,,,,,,,,,,,,,,,,,,,,,,
-233240,1,1,,,,,,,,,,,,,,,,,,,,,,
-233411,1,1,,,,,,,,,,,,,,,,,,,,,,
-2332C0,1,1,,,,,,,,,,,,,,,,,,,,,,
-321100,1,1,,,,,,,,,,,,,,,,,,,,,,
-321200,1,1,,,,,,,,,,,,,,,,,,,,,,
-321910,1,1,,,,,,,,,,,,,,,,,,,,,,
-3219A0,1,1,,,,,,,,,,,,,,,,,,,,,,
-327100,1,1,,,,,,,,,,,,,,,,,,,,,,
-327200,1,1,,,,,,,,,,,,,,,,,,,,,,
-327310,1,1,,,,,,,,,,,,,,,,,,,,,,
-327320,1,1,,,,,,,,,,,,,,,,,,,,,,
-327330,1,1,,,,,,,,,,,,,,,,,,,,,,
-327390,1,1,,,,,,,,,,,,,,,,,,,,,,
-327400,1,1,,,,,,,,,,,,,,,,,,,,,,
-327910,1,1,,,,,,,,,,,,,,,,,,,,,,
-327991,1,1,,,,,,,,,,,,,,,,,,,,,,
-327992,1,1,,,,,,,,,,,,,,,,,,,,,,
-327993,1,1,,,,,,,,,,,,,,,,,,,,,,
-327999,1,1,,,,,,,,,,,,,,,,,,,,,,
-331110,1,1,,,,,,,,,,,,,,,,,,,,,,
-331200,1,1,,,,,,,,,,,,,,,,,,,,,,
-331314,,1,,,,,,,,,,,,,,,,,,,,,,
-331313,1,1,,,,,,,,,,,,,,,,,,,,,,
-33131B,1,1,,,,,,,,,,,,,,,,,,,,,,
-331410,1,1,,,,,,,,,,,,,,,,,,,,,,
-331420,1,1,,,,,,,,,,,,,,,,,,,,,,
-331490,1,1,,,,,,,,,,,,,,,,,,,,,,
-331510,1,1,,,,,,,,,,,,,,,,,,,,,,
-331520,1,1,,,,,,,,,,,,,,,,,,,,,,
-332114,1,1,,,,,,,,,,,,,,,,,,,,,,
-33211A,1,1,,,,,,,,,,,,,,,,,,,,,,
-332119,1,1,,,,,,,,,,,,,,,,,,,,,,
-332200,1,1,,,,,,,,,,,,,,,,,,,,,,
-332310,1,1,,,,,,,,,,,,,,,,,,,,,,
-332320,1,1,,,,,,,,,,,,,,,,,,,,,,
-332410,1,1,,,,,,,,,,,,,,,,,,,,,,
-332420,1,1,,,,,,,,,,,,,,,,,,,,,,
-332430,1,1,,,,,,,,,,,,,,,,,,,,,,
-332500,1,1,,,,,,,,,,,,,,,,,,,,,,
-332600,1,1,,,,,,,,,,,,,,,,,,,,,,
-332710,1,1,,,,,,,,,,,,,,,,,,,,,,
-332720,1,1,,,,,,,,,,,,,,,,,,,,,,
-332800,1,1,,,,,,,,,,,,,,,,,,,,,,
-332913,1,1,,,,,,,,,,,,,,,,,,,,,,
-33291A,1,1,,,,,,,,,,,,,,,,,,,,,,
-332991,1,1,,,,,,,,,,,,,,,,,,,,,,
-332996,1,1,,,,,,,,,,,,,,,,,,,,,,
-33299A,1,1,,,,,,,,,,,,,,,,,,,,,,
-332999,1,1,,,,,,,,,,,,,,,,,,,,,,
-333111,1,1,,,,,,,,,,,,,,,,,,,,,,
-333112,1,1,,,,,,,,,,,,,,,,,,,,,,
-333120,1,1,,,,,,,,,,,,,,,,,,,,,,
-333130,1,1,,,,,,,,,,,,,,,,,,,,,,
-333242,1,1,,,,,,,,,,,,,,,,,,,,,,
-33329A,1,1,,,,,,,,,,,,,,,,,,,,,,
-333314,1,1,,,,,,,,,,,,,,,,,,,,,,
-333316,1,1,,,,,,,,,,,,,,,,,,,,,,
-333318,1,1,,,,,,,,,,,,,,,,,,,,,,
-333414,1,1,,,,,,,,,,,,,,,,,,,,,,
-333415,1,1,,,,,,,,,,,,,,,,,,,,,,
-333413,1,1,,,,,,,,,,,,,,,,,,,,,,
-333511,1,1,,,,,,,,,,,,,,,,,,,,,,
-333514,1,1,,,,,,,,,,,,,,,,,,,,,,
-333517,1,1,,,,,,,,,,,,,,,,,,,,,,
-33351B,1,1,,,,,,,,,,,,,,,,,,,,,,
-333611,1,1,,,,,,,,,,,,,,,,,,,1,,,
-333612,1,1,,,,,,,,,,,,,,,,,,,1,,,
-333613,1,1,,,,,,,,,,,,,,,,,,,,,,
-333618,1,1,,,,,,,,,,,,,,,,,,,,,,
-333912,1,1,,,,,,,,,,,,,,,,,,,,,,
-33391A,1,1,,,,,,,,,,,,,,,,,,,,,,
-333920,1,1,,,,,,,,,,,,,,,,,,,,,,
-333991,1,1,,,,,,,,,,,,,,,,,,,,,,
-333993,1,1,,,,,,,,,,,,,,,,,,,,,,
-333994,1,1,,,,,,,,,,,,,,,,,,,,,,
-33399A,1,1,,,,,,,,,,,,,,,,,,,,,,
-33399B,1,1,,,,,,,,,,,,,,,,,,,,,,
-334111,1,1,,,,,,,,,,,,,,,,,,,,,,
-334112,1,1,,,,,,,,,,,,,,,,,,,,,,
-334118,1,1,,,,,,,,,,,,,,,,,,,,,,
-334210,1,1,,,,,,,,,,,,,,,,,,,,,,
-334220,1,1,,,,,,,,,,,,,,,,,,,,,,
-334290,1,1,,,,,,,,,,,,,,,,,,,,,,
-334413,1,1,,,,,,,,,,,,,,,,,,,,,,
-334418,1,1,,,,,,,,,,,,,,,,,,,,,,
-33441A,1,1,,,,,,,,,,,,,,,,,,,,,,
-334510,1,1,,,,,,,,,,,,,,,,,,,,,,
-334511,1,1,,,,,,,,,,,,,,,,,,,,,,
-334512,1,1,,,,,,,,,,,,,,,,,,,,,,
-334513,1,1,,,,,,,,,,,,,,,,,,,,,,
-334514,1,1,,,,,,,,,,,,,,,,,,,,,,
-334515,1,1,,,,,,,,,,,,,,,,,,,,,,
-334516,1,1,,,,,,,,,,,,,,,,,,,,,,
-334517,1,1,,,,,,,,,,,,,,,,,,,,,,
-33451A,1,1,,,,,,,,,,,,,,,,,,,,,,
-334300,1,1,,,,,,,,,,,,,,,,,,,,,,
-334610,1,1,,,,,,,,,,,,,,,,,,,,,,
-335110,1,1,,,,,,,,,,,,,,,,,,,,,,
-335120,1,1,,,,,,,,,,,,,,,,,,,,,,
-335210,1,1,,,,,,,,,,,,,,,,,,,,,,
-335221,1,1,,,,,,,,,,,,,,,,,,,,,,
-335222,1,1,,,,,,,,,,,,,,,,,,,,,,
-335224,1,1,,,,,,,,,,,,,,,,,,,,,,
-335228,1,1,,,,,,,,,,,,,,,,,,,,,,
-335311,1,1,,,,,,,,,,,,,,,,,,,,,,
-335312,1,1,,,,,,,,,,,,,,,,,,,,,,
-335313,1,1,,,,,,,,,,,,,,,,,,,,,,
-335314,1,1,,,,,,,,,,,,,,,,,,,,,,
-335911,1,1,,,,,,,,,,,,,,,,,,,,,,
-335912,1,1,,,,,,,,,,,,,,,,,,,,,,
-335920,1,1,,,,,,,,,,,,,,,,,,,,,,
-335930,1,1,,,,,,,,,,,,,,,,,,,,,,
-335991,1,1,,,,,,,,,,,,,,,,,,,,,,
-335999,1,1,,,,,,,,,,,,,,,,,,,,,,
-336111,1,1,,,,,,,,,,,,,,,,,,,,,,
-336112,1,1,,,,,,,,,,,,,,,,,,,,,,
-336120,1,1,,,,,,,,,,,,,,,,,,,,,,
-336211,1,1,,,,,,,,,,,,,,,,,,,,,,
-336212,1,1,,,,,,,,,,,,,,,,,,,,,,
-336213,1,1,,,,,,,,,,,,,,,,,,,,,,
-336214,1,1,,,,,,,,,,,,,,,,,,,,,,
-336310,1,1,,,,,,,,,,,,,,,,,,,1,,,
-336320,1,1,,,,,,,,,,,,,,,,,,,1,,,
-336350,1,1,,,,,,,,,,,,,,,,,,,1,,,
-336360,1,1,,,,,,,,,,,,,,,,,,,1,,,
-336370,1,1,,,,,,,,,,,,,,,,,,,,,,
-336390,1,1,,,,,,,,,,,,,,,,,,,1,,,
-3363A0,1,1,,,,,,,,,,,,,,,,,,,1,,,
-336411,1,1,,,,,,,,,,,,,,,,,,,,,,
-336412,1,1,,,,,,,,,,,,,,,,,,,,,,
-336413,1,1,,,,,,,,,,,,,,,,,,,,,,
-336414,1,1,,,,,,,,,,,,,,,,,,,,,,
-33641A,1,1,,,,,,,,,,,,,,,,,,,,,,
-336500,1,1,,,,,,,,,,,,,,,,,,,,,,
-336611,1,1,,,,,,,,,,,,,,,,,,,,,,
-336612,1,1,,,,,,,,,,,,,,,,,,,,,,
-336991,1,1,,,,,,,,,,,,,,,,,,,,,,
-336992,1,1,,,,,,,,,,,,,,,,,,,,,,
-336999,1,1,,,,,,,,,,,,,,,,,,,,,,
-337110,1,1,,,,,,,,,,,,,,,,,,,,,,
-337121,1,1,,,,,,,,,,,,,,,,,,,,,,
-337122,1,1,,,,,,,,,,,,,,,,,,,,,,
-337127,1,1,,,,,,,,,,,,,,,,,,,,,,
-33712N,1,1,,,,,,,,,,,,,,,,,,,,,,
-337215,1,1,,,,,,,,,,,,,,,,,,,,,,
-33721A,1,1,,,,,,,,,,,,,,,,,,,,,,
-337900,1,1,,,,,,,,,,,,,,,,,,,,,,
-339112,1,1,,,,,,,,,,,,,,,,,,,,,,
-339113,1,1,,,,,,,,,,,,,,,,,,,,,,
-339114,1,1,,,,,,,,,,,,,,,,,,,,,,
-339115,1,1,,,,,,,,,,,,,,,,,,,,,,
-339116,1,1,,,,,,,,,,,,,,,,,,,,,,
-339910,1,1,,,,,,,,,,,,,,,,,,,,,,
-339920,1,1,,,,,,,,,,,,,,,,,,,,,,
-339930,1,1,,,,,,,,,,,,,,,,,,,,,,
-339940,1,1,,,,,,,,,,,,,,,,,,,,,,
-339950,1,1,,,,,,,,,,,,,,,,,,,,,,
-339990,1,1,,,,,,,,,,,,,,,,,,,,,,
-311111,1,1,,,,,,,,,,,,,,,,,,,,,,
-311119,1,1,,,,,,,,,,,,,,,,,,,,,,
-311210,1,1,,,,,,,,,,,,,,,,,,,,,,
-311221,1,1,,,,,,,,,,,,,,,,,,,,,,
-311225,1,1,,,,,,,,,,,,,,,,,,,,,,
-311224,1,1,,,,,,,,,,,,,,,,,,,,,,
-311230,1,1,,,,,,,,,,,,,,,,,,,,,,
-311300,1,1,,,,,,,,,,,,,,,,,,,,,,
-311410,1,1,,,,,,,,,,,,,,,,,,,,,,
-311420,1,1,,,,,,,,,,,,,,,,,,,,,,
-311513,1,1,,,,,,,,,,,,,,,,,,,,,,
-311514,1,1,,,,,,,,,,,,,,,,,,,,,,
-31151A,1,1,,,,,,,,,,,,,,,,,,,,,,
-311520,1,1,,,,,,,,,,,,,,,,,,,,,,
-311615,1,1,,,,,,,,,,,,,,,,,,,,,,
-31161A,1,1,,,,,,,,,,,,,,,,,,,,,,
-311700,1,1,,,,,,,,,,,,,,,,,,,,,,
-311810,1,1,,,,,,,,,,,,,,,,,,,,,,
-3118A0,1,1,,,,,,,,,,,,,,,,,,,,,,
-311910,1,1,,,,,,,,,,,,,,,,,,,,,,
-311920,1,1,,,,,,,,,,,,,,,,,,,,,,
-311930,1,1,,,,,,,,,,,,,,,,,,,,,,
-311940,1,1,,,,,,,,,,,,,,,,,,,,,,
-311990,1,1,,,,,,,,,,,,,,,,,,,,,,
-312110,1,1,,,,,,,,,,,,,,,,,,,,,,
-312120,1,1,,,,,,,,,,,,,,,,,,,,,,
-312130,1,1,,,,,,,,,,,,,,,,,,,,,,
-312140,1,1,,,,,,,,,,,,,,,,,,,,,,
-312200,1,1,,,,,,,,,,,,,,,,,,,,,,
-313100,1,1,,,,,,,,,,,,,,,,,,,,,,
-313200,1,1,,,,,,,,,,,,,,,,,,,,,,
-313300,1,1,,,,,,,,,,,,,,,,,,,,,,
-314110,1,1,,,,,,,,,,,,,,,,,,,,,,
-314120,1,1,,,,,,,,,,,,,,,,,,,,,,
-314900,1,1,,,,,,,,,,,,,,,,,,,,,,
-315000,1,1,,,,,,,,,,,,,,,,,,,,,,
-316000,1,1,,,,,,,,,,,,,,,,,,,,,,
-322110,1,1,,,,,,,,,,,,,,,,,,,,,,
-322120,1,1,,,,,,,,,,,,,,,,,,,,,,
-322130,1,1,,,,,,,,,,,,,,,,,,,,,,
-322210,1,1,,,,,,,,,,,,,,,,,,,,,,
-322220,1,1,,,,,,,,,,,,,,,,,,,,,,
-322230,1,1,,,,,,,,,,,,,,,,,,,,,,
-322291,1,1,,,,,,,,,,,,,,,,,,,,,,
-322299,1,1,,,,,,,,,,,,,,,,,,,,,,
-323110,1,1,,,,,,,,,,,,,,,,,,,,,,
-323120,1,1,,,,,,,,,,,,,,,,,,,,,,
-324110,1,1,,,,,,,,,,,,,,,,,,1,1,,,
-324121,1,1,,,,,,,,,,,,,,,,,,,,,,
-324122,1,1,,,,,,,,,,,,,,,,,,,,,,
-324190,1,1,,,,,,,,,,,,,,,,,,,,,,
-325110,1,1,,,,,,,,,,,,,,,,,,,,,,
-325120,1,1,,,,,,,,,,,,,,,,,,,,,,
-325130,1,1,,,,,,,,,,,,,,,,,,,,,,
-325180,1,1,,,,,,,,,,,,,,,,,,,,,,
-325190,1,1,,,,,,,,,,,,,,,,,,,,,,
-325211,1,1,,,,,,,,,,,,,,,,,,,,,,
-3252A0,1,1,,,,,,,,,,,,,,,,,,,,,,
-325411,1,1,,,,,,,,,,,,,,,,,,,,,,
-325412,1,1,,,,,,,,,,,,,,,,,,,,,,
-325413,1,1,,,,,,,,,,,,,,,,,,,,,,
-325414,1,1,,,,,,,,,,,,,,,,,,,,,,
-325310,1,1,,,,,,,,,,,,,,,,,,,,,,
-325320,1,1,,,,,,,,,,,,,,,,,,,,,,
-325510,1,1,,,,,,,,,,,,,,,,,,,,,,
-325520,1,1,,,,,,,,,,,,,,,,,,,,,,
-325610,1,1,,,,,,,,,,,,,,,,,,,,,,
-325620,1,1,,,,,,,,,,,,,,,,,,,,,,
-325910,1,1,,,,,,,,,,,,,,,,,,,,,,
-3259A0,1,1,,,,,,,,,,,,,,,,,,,,,,
-326110,1,1,,,,,,,,,,,,,,,,,,,1,,,
-326120,1,1,,,,,,,,,,,,,,,,,,,,,,
-326130,1,1,,,,,,,,,,,,,,,,,,,,,,
-326140,1,1,,,,,,,,,,,,,,,,,,,,,,
-326150,1,1,,,,,,,,,,,,,,,,,,,,,,
-326160,1,1,,,,,,,,,,,,,,,,,,,,,,
-326190,1,1,,,,,,,,,,,,,,,,,,,,,,
-326210,1,1,,,,,,,,,,,,,,,,,,,,,,
-326220,1,1,,,,,,,,,,,,,,,,,,,,,,
-326290,1,1,,,,,,,,,,,,,,,,,,,,,,
-423100,1,1,,,,,,,,,,,,,,,,,,,,1,,
-423400,1,1,,,,,,,,,,,,,,,,,,,,1,,
-423600,1,1,,,,,,,,,,,,,,,,,,,,1,,
-423800,1,1,,,,,,,,,,,,,,,,,,,,1,,
-423A00,1,1,,,,,,,,,,,,,,,,,,,,1,,
-424200,1,1,,,,,,,,,,,,,,,,,,,,1,,
-424400,1,1,,,,,,,,,,,,,,,,,,,,1,,
-424700,1,1,,,,,,,,,,,,,,,,,,,1,1,,
-424A00,1,1,,,,,,,,,,,,,,,,,,,,1,,
-425000,1,1,,,,,,,,,,,,,,,,,,,,1,,
-4200ID,1,1,,,,,,,,,,,,,,,,,,,,1,,
-441000,1,1,,,,,,,,,,,,,,,,,,,1,,1,
-445000,1,1,,,,,,,,,,,,,,,,,,,,,1,
-452000,1,1,,,,,,,,,,,,,,,,,,,,,1,
-444000,1,1,,,,,,,,,,,,,,,,,,,,,1,
-446000,1,1,,,,,,,,,,,,,,,,,,,,,1,
-447000,1,1,,,,,,,,,,,,,,,,,,,,,1,
-448000,1,1,,,,,,,,,,,,,,,,,,,,,1,
-454000,1,1,,,,,,,,,,,,,,,,,,,,,1,
-4B0000,1,1,,,,,,,,,,,,,,,,,,,,,1,
-481000,1,1,,,,,,,,,,,,,,,,,,,,,,1
-482000,1,1,,,,,,,,,,,,,,,,,,,,,,1
-483000,1,1,,,,,,,,,,,,,,,,,,,,,,1
-484000,1,1,,,,,,,,,,,,,,,,,,,,,,1
-485000,1,1,,,,,,,,,,,,,,,,,,,,,,1
-486000,1,1,,,,,,,,,,,,,,,,,,,,,,1
-48A000,1,1,,,,,,,,,,,,,,,,,,,,,,1
-492000,1,1,,,,,,,,,,,,,,,,,,,,,,1
-493000,1,1,,,,,,,,,,,,,,,,,,,,,,1
-511110,1,1,,,,,,,,,,,,,,,,,,,,,,
-511120,1,1,,,,,,,,,,,,,,,,,,,,,,
-511130,1,1,,,,,,,,,,,,,,,,,,,,,,
-5111A0,1,1,,,,,,,,,,,,,,,,,,,,,,
-511200,1,1,,,,,,,,,,,,,,,,,,,,,,
-512100,1,1,,,,,,,,,,,,,,,,,,,,,,
-512200,1,1,,,,,,,,,,,,,,,,,,,,,,
-515100,1,1,,,,,,,,,,,,,,,,,,,,,,
-515200,1,1,,,,,,,,,,,,,,,,,,,,,,
-517110,1,1,,,,,,,,,,,,,,,,,,,,,,
-517210,1,1,,,,,,,,,,,,,,,,,,,,,,
-517A00,1,1,,,,,,,,,,,,,,,,,,,,,,
-518200,1,1,,,,,,,,,,,,,,,,,,,,,,
-519130,1,1,,,,,,,,,,,,,,,,,,,,,,
-5191A0,1,1,,,,,,,,,,,,,,,,,,,,,,
-522A00,1,1,,,,,,,,,,,,,,,,,,,,,,
-52A000,1,1,,,,,,,,,,,,,,,,,,,,,,
-523900,1,1,,,,,,,,,,,,,,,,,,,,,,
-523A00,1,1,,,,,,,,,,,,,,,,,,,,,,
-524113,1,1,,,,,,,,,,,,,,,,,,,,,,
-5241XX,1,1,,,,,,,,,,,,,,,,,,,,,,
-524200,1,1,,,,,,,,,,,,,,,,,,,,,,
-525000,1,1,,,,,,,,,,,,,,,,,,,,,,
-531HSO,1,1,,,,,,,,,,,,,,,,,,,,,,
-531HST,1,1,,,,,,,,,,,,,,,,,,,,,,
-531ORE,1,1,,,,,,,,,,,,,,,,,,,,,,
-532100,1,1,,,,,,,,,,,,,,,,,,,1,,,
-532400,1,1,,,,,,,,,,,,,,,,,,,,,,
-532A00,1,1,,,,,,,,,,,,,,,,,,,,,,
-533000,1,1,,,,,,,,,,,,,,,,,,,,,,
-541100,1,1,,,,,,,,,,,,,,,,,,,,,,
-541511,1,1,,,,,,,,,,,,,,,,,,,,,,
-541512,1,1,,,,,,,,,,,,,,,,,,,,,,
-54151A,1,1,,,,,,,,,,,,,,,,,,,,,,
-541200,1,1,,,,,,,,,,,,,,,,,,,,,,
-541300,1,1,,,,,,,,,,,,,,,,,,,,,,
-541610,1,1,,,,,,,,,,,,,,,,,,,,,,
-5416A0,1,1,,,,,,,,,,,,,,,,,,,,,,
-541700,1,1,,,,,,,,,,,,,,,,,,,,,,
-541800,1,1,,,,,,,,,,,,,,,,,,,,,,
-541400,1,1,,,,,,,,,,,,,,,,,,,,,,
-541920,1,1,,,,,,,,,,,,,,,,,,,,,,
-541940,1,1,,,,,,,,,,,,,,,,,,,,,,
-5419A0,1,1,,,,,,,,,,,,,,,,,,,,,,
-550000,1,1,,,,,,,,,,,,,,,,,,,,,,
-561300,1,1,,,,,,,,,,,,,,,,,,,,,,
-561700,1,1,,,,,,,,,,,,,,,,,,,,,,
-561100,1,1,,,,,,,,,,,,,,,,,,,,,,
-561200,1,1,,,,,,,,,,,,,,,,,,,,,,
-561400,1,1,,,,,,,,,,,,,,,,,,,,,,
-561500,1,1,,,,,,,,,,,,,,,,,,,,,,
-561600,1,1,,,,,,,,,,,,,,,,,,,,,,
-561900,1,1,,,,,,,,,,,,,,,,,,,,,,
-562000,1,1,,,,,,,,,,,,,,,,,,,,,,
-611100,1,1,,,,,,,,,,,,,,,,,,,,,,
-611A00,1,1,,,,,,,,,,,,,,,,,,,,,,
-611B00,1,1,,,,,,,,,,,,,,,,,,,,,,
-621100,1,1,,,,,,,,,,,,,,,,,,,,,,
-621200,1,1,,,,,,,,,,,,,,,,,,,,,,
-621300,1,1,,,,,,,,,,,,,,,,,,,,,,
-621400,1,1,,,,,,,,,,,,,,,,,,,,,,
-621500,1,1,,,,,,,,,,,,,,,,,,,,,,
-621600,1,1,,,,,,,,,,,,,,,,,,,,,,
-621900,1,1,,,,,,,,,,,,,,,,,,,,,,
-622000,1,1,,,,,,,,,,,,,,,,,,,,,,
-623A00,1,1,,,,,,,,,,,,,,,,,,,,,,
-623B00,1,1,,,,,,,,,,,,,,,,,,,,,,
-624100,1,1,,,,,,,,,,,,,,,,,,,,,,
-624400,1,1,,,,,,,,,,,,,,,,,,,,,,
-624A00,1,1,,,,,,,,,,,,,,,,,,,,,,
-711100,1,1,,,,,,,,,,,,,,,,,,,,,,
-711200,1,1,,,,,,,,,,,,,,,,,,,,,,
-711500,1,1,,,,,,,,,,,,,,,,,,,,,,
-711A00,1,1,,,,,,,,,,,,,,,,,,,,,,
-712000,1,1,,,,,,,,,,,,,,,,,,,,,,
-713100,1,1,,,,,,,,,,,,,,,,,,,,,,
-713200,1,1,,,,,,,,,,,,,,,,,,,,,,
-713900,1,1,,,,,,,,,,,,,,,,,,,,,,
-721000,1,1,,,,,,,,,,,,,,,,,,,,,,
-722110,1,1,,,,,,,,,,,,,,,,,,,,,,
-722211,1,1,,,,,,,,,,,,,,,,,,,,,,
-722A00,1,1,,,,,,,,,,,,,,,,,,,,,,
-811100,1,1,,,,,,,,,,,,,,,,,,,1,,,
-811200,1,1,,,,,,,,,,,,,,,,,,,,,,
-811300,1,1,,,,,,,,,,,,,,,,,,,,,,
-811400,1,1,,,,,,,,,,,,,,,,,,,,,,
-812100,1,1,,,,,,,,,,,,,,,,,,,,,,
-812200,1,1,,,,,,,,,,,,,,,,,,,,,,
-812300,1,1,,,,,,,,,,,,,,,,,,,,,,
-812900,1,1,,,,,,,,,,,,,,,,,,,,,,
-813100,1,1,,,,,,,,,,,,,,,,,,,,,,
-813A00,1,1,,,,,,,,,,,,,,,,,,,,,,
-813B00,1,1,,,,,,,,,,,,,,,,,,,,,,
-814000,1,1,,,,,,,,,,,,,,,,,,,,,,
-S00500,1,1,,,,,,,,,,,,,,,,,,,,,,
-S00600,1,1,,,,,,,,,,,,,,,,,,,,,,
-491000,1,1,,,,,,,,,,,,,,,,,,,,,,
-S00101,,1,,,,,,,,,,,,,,,,,,,,,,
-S00102,1,1,,,,,,,,,,,,,,,,,,,,,,
-GSLGE,1,1,,,,,,,,,,,,,,,,,,,,,,
-GSLGH,1,1,,,,,,,,,,,,,,,,,,,,,,
-GSLGO,1,1,,,,,,,,,,,,,,,,,,,,,,
-S00201,,1,,,,,,,,,,,,,,,,,,,,,,
-S00202,,1,,,,,,,,,,,,,,,,,,,,,,
-S00203,1,1,,,,,,,,,,,,,,,,,,,,,,
-S00401,1,,1,,,,,,,,,,,,,,,,,,,,,
-S00402,1,,,1,,,,,,,,,,,,,,,,,,,,
-S00300,1,,,,1,,,,,,,,,,,,,,,,,,,
-S00900,1,,,,,1,,,,,,,,,,,,,,,,,,
-T005,,,,,,,,,,1,,,,,,,,,,,,,,
-V00100,,,,,,,1,,,,,,,,,,,,,,,,,
-V00200,,,,,,,1,,,,,,,,,,,,,,,,,
-V00300,,,,,,,1,,,,,,,,,,,,,,,,,
-T006,,,,,,,,,,,,,,,,,,,,,,,,
-T008,,,,,,,,,1,,,,,,,,,,,,,,,
-T001,,,,,,,,,,,,,,,,,,,,,,,,
-F01000,,,,,,,,,,,1,,,,,,,,,,,,,
-F02E00,,,,,,,,,,,,1,,,,,,,,,,,,
-F02N00,,,,,,,,,,,,1,,,,,,,,,,,,
-F02R00,,,,,,,,,,,,1,,,,,,,,,,,,
-F02S00,,,,,,,,,,,,1,,,,,,,,,,,,
-F03000,,,,,,,,,,,,,1,,,,,,,,,,,
-F04000,,,,,,,,,,,,,,1,,,,,,,,,,
-F05000,,,,,,,,,,,,,,,1,,,,,,,,,
-F06C00,,,,,,,,,,,,,,,,1,,,,,,,,
-F06E00,,,,,,,,,,,,,,,,1,,,,,,,,
-F06N00,,,,,,,,,,,,,,,,1,,,,,,,,
-F06S00,,,,,,,,,,,,,,,,1,,,,,,,,
-F07C00,,,,,,,,,,,,,,,,1,,,,,,,,
-F07E00,,,,,,,,,,,,,,,,1,,,,,,,,
-F07N00,,,,,,,,,,,,,,,,1,,,,,,,,
-F07S00,,,,,,,,,,,,,,,,1,,,,,,,,
-F10C00,,,,,,,,,,,,,,,,1,,,,,,,,
-F10E00,,,,,,,,,,,,,,,,1,,,,,,,,
-F10N00,,,,,,,,,,,,,,,,1,,,,,,,,
-F10S00,,,,,,,,,,,,,,,,1,,,,,,,,
-T004,,,,,,,,,,,,,,,,,,,,,,,,
-T007,,,,,,,,1,,,,,,,,,,,,,,,,
+Code,Commodity,Industry,Scrap,UsedGoods,NonComparableImport,RoWAdjustment,ValueAdded,CommodityTotalOutput,IndustryTotalOutput,CommodityIntermediateOutput,HouseholdDemand,InvestmentDemand,ChangeInventories,Export,Import,GovernmentDemand,NaturalGas,Water,Electricity,Petroleum,PersonalTransportRelated,Wholesale,Retail,Transportation,InternationalTradeAdjustment,TaxLessSubsidies
+1111A0,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+1111B0,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+111200,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+111300,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+111400,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+111900,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+112120,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+1121A0,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+112300,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+112A00,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+113000,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+114000,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+115000,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+211000,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+212100,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+212230,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+2122A0,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+212310,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+2123A0,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+213111,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+21311A,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+221100,1,1,,,,,,,,,,,,,,,,,1,,,,,,,
+221200,1,1,,,,,,,,,,,,,,,1,,,,,,,,,
+221300,1,1,,,,,,,,,,,,,,,,1,,,,,,,,
+233210,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+233262,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+230301,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+230302,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+2332A0,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+233412,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+2334A0,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+233230,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+2332D0,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+233240,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+233411,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+2332C0,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+321100,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+321200,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+321910,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+3219A0,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+327100,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+327200,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+327310,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+327320,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+327330,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+327390,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+327400,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+327910,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+327991,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+327992,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+327993,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+327999,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+331110,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+331200,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+331314,,1,,,,,,,,,,,,,,,,,,,,,,,,
+331313,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+33131B,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+331410,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+331420,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+331490,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+331510,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+331520,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+332114,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+33211A,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+332119,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+332200,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+332310,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+332320,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+332410,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+332420,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+332430,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+332500,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+332600,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+332710,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+332720,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+332800,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+332913,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+33291A,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+332991,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+332996,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+33299A,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+332999,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+333111,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+333112,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+333120,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+333130,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+333242,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+33329A,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+333314,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+333316,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+333318,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+333414,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+333415,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+333413,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+333511,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+333514,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+333517,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+33351B,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+333611,1,1,,,,,,,,,,,,,,,,,,,1,,,,,
+333612,1,1,,,,,,,,,,,,,,,,,,,1,,,,,
+333613,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+333618,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+333912,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+33391A,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+333920,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+333991,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+333993,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+333994,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+33399A,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+33399B,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+334111,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+334112,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+334118,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+334210,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+334220,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+334290,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+334413,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+334418,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+33441A,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+334510,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+334511,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+334512,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+334513,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+334514,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+334515,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+334516,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+334517,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+33451A,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+334300,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+334610,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+335110,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+335120,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+335210,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+335221,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+335222,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+335224,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+335228,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+335311,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+335312,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+335313,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+335314,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+335911,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+335912,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+335920,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+335930,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+335991,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+335999,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+336111,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+336112,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+336120,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+336211,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+336212,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+336213,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+336214,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+336310,1,1,,,,,,,,,,,,,,,,,,,1,,,,,
+336320,1,1,,,,,,,,,,,,,,,,,,,1,,,,,
+336350,1,1,,,,,,,,,,,,,,,,,,,1,,,,,
+336360,1,1,,,,,,,,,,,,,,,,,,,1,,,,,
+336370,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+336390,1,1,,,,,,,,,,,,,,,,,,,1,,,,,
+3363A0,1,1,,,,,,,,,,,,,,,,,,,1,,,,,
+336411,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+336412,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+336413,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+336414,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+33641A,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+336500,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+336611,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+336612,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+336991,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+336992,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+336999,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+337110,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+337121,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+337122,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+337127,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+33712N,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+337215,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+33721A,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+337900,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+339112,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+339113,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+339114,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+339115,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+339116,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+339910,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+339920,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+339930,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+339940,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+339950,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+339990,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+311111,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+311119,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+311210,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+311221,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+311225,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+311224,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+311230,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+311300,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+311410,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+311420,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+311513,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+311514,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+31151A,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+311520,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+311615,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+31161A,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+311700,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+311810,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+3118A0,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+311910,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+311920,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+311930,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+311940,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+311990,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+312110,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+312120,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+312130,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+312140,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+312200,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+313100,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+313200,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+313300,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+314110,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+314120,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+314900,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+315000,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+316000,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+322110,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+322120,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+322130,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+322210,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+322220,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+322230,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+322291,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+322299,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+323110,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+323120,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+324110,1,1,,,,,,,,,,,,,,,,,,1,1,,,,,
+324121,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+324122,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+324190,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+325110,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+325120,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+325130,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+325180,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+325190,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+325211,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+3252A0,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+325411,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+325412,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+325413,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+325414,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+325310,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+325320,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+325510,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+325520,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+325610,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+325620,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+325910,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+3259A0,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+326110,1,1,,,,,,,,,,,,,,,,,,,1,,,,,
+326120,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+326130,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+326140,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+326150,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+326160,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+326190,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+326210,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+326220,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+326290,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+423100,1,1,,,,,,,,,,,,,,,,,,,,1,,,,
+423400,1,1,,,,,,,,,,,,,,,,,,,,1,,,,
+423600,1,1,,,,,,,,,,,,,,,,,,,,1,,,,
+423800,1,1,,,,,,,,,,,,,,,,,,,,1,,,,
+423A00,1,1,,,,,,,,,,,,,,,,,,,,1,,,,
+424200,1,1,,,,,,,,,,,,,,,,,,,,1,,,,
+424400,1,1,,,,,,,,,,,,,,,,,,,,1,,,,
+424700,1,1,,,,,,,,,,,,,,,,,,,1,1,,,,
+424A00,1,1,,,,,,,,,,,,,,,,,,,,1,,,,
+425000,1,1,,,,,,,,,,,,,,,,,,,,1,,,,
+4200ID,1,1,,,,,,,,,,,,,,,,,,,,1,,,,
+441000,1,1,,,,,,,,,,,,,,,,,,,1,,1,,,
+445000,1,1,,,,,,,,,,,,,,,,,,,,,1,,,
+452000,1,1,,,,,,,,,,,,,,,,,,,,,1,,,
+444000,1,1,,,,,,,,,,,,,,,,,,,,,1,,,
+446000,1,1,,,,,,,,,,,,,,,,,,,,,1,,,
+447000,1,1,,,,,,,,,,,,,,,,,,,,,1,,,
+448000,1,1,,,,,,,,,,,,,,,,,,,,,1,,,
+454000,1,1,,,,,,,,,,,,,,,,,,,,,1,,,
+4B0000,1,1,,,,,,,,,,,,,,,,,,,,,1,,,
+481000,1,1,,,,,,,,,,,,,,,,,,,,,,1,,
+482000,1,1,,,,,,,,,,,,,,,,,,,,,,1,,
+483000,1,1,,,,,,,,,,,,,,,,,,,,,,1,,
+484000,1,1,,,,,,,,,,,,,,,,,,,,,,1,,
+485000,1,1,,,,,,,,,,,,,,,,,,,,,,1,,
+486000,1,1,,,,,,,,,,,,,,,,,,,,,,1,,
+48A000,1,1,,,,,,,,,,,,,,,,,,,,,,1,,
+492000,1,1,,,,,,,,,,,,,,,,,,,,,,1,,
+493000,1,1,,,,,,,,,,,,,,,,,,,,,,1,,
+511110,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+511120,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+511130,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+5111A0,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+511200,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+512100,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+512200,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+515100,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+515200,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+517110,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+517210,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+517A00,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+518200,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+519130,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+5191A0,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+522A00,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+52A000,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+523900,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+523A00,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+524113,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+5241XX,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+524200,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+525000,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+531HSO,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+531HST,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+531ORE,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+532100,1,1,,,,,,,,,,,,,,,,,,,1,,,,,
+532400,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+532A00,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+533000,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+541100,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+541511,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+541512,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+54151A,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+541200,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+541300,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+541610,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+5416A0,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+541700,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+541800,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+541400,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+541920,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+541940,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+5419A0,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+550000,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+561300,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+561700,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+561100,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+561200,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+561400,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+561500,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+561600,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+561900,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+562000,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+611100,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+611A00,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+611B00,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+621100,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+621200,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+621300,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+621400,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+621500,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+621600,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+621900,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+622000,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+623A00,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+623B00,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+624100,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+624400,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+624A00,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+711100,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+711200,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+711500,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+711A00,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+712000,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+713100,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+713200,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+713900,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+721000,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+722110,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+722211,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+722A00,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+811100,1,1,,,,,,,,,,,,,,,,,,,1,,,,,
+811200,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+811300,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+811400,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+812100,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+812200,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+812300,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+812900,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+813100,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+813A00,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+813B00,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+814000,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+S00500,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+S00600,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+491000,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+S00101,,1,,,,,,,,,,,,,,,,,,,,,,,,
+S00102,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+GSLGE,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+GSLGH,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+GSLGO,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+S00201,,1,,,,,,,,,,,,,,,,,,,,,,,,
+S00202,,1,,,,,,,,,,,,,,,,,,,,,,,,
+S00203,1,1,,,,,,,,,,,,,,,,,,,,,,,,
+S00401,1,,1,,,,,,,,,,,,,,,,,,,,,,,
+S00402,1,,,1,,,,,,,,,,,,,,,,,,,,,,
+S00300,1,,,,1,,,,,,,,,,,,,,,,,,,,,
+S00900,1,,,,,1,,,,,,,,,,,,,,,,,,,,
+T005,,,,,,,,,,1,,,,,,,,,,,,,,,,
+V00100,,,,,,,1,,,,,,,,,,,,,,,,,,,
+V00200,,,,,,,1,,,,,,,,,,,,,,,,,,,
+V00300,,,,,,,1,,,,,,,,,,,,,,,,,,,
+T006,,,,,,,,,,,,,,,,,,,,,,,,,,
+T008,,,,,,,,,1,,,,,,,,,,,,,,,,,
+T001,,,,,,,,,,,,,,,,,,,,,,,,,,
+F01000,,,,,,,,,,,1,,,,,,,,,,,,,,,
+F02E00,,,,,,,,,,,,1,,,,,,,,,,,,,,
+F02N00,,,,,,,,,,,,1,,,,,,,,,,,,,,
+F02R00,,,,,,,,,,,,1,,,,,,,,,,,,,,
+F02S00,,,,,,,,,,,,1,,,,,,,,,,,,,,
+F03000,,,,,,,,,,,,,1,,,,,,,,,,,,,
+F04000,,,,,,,,,,,,,,1,,,,,,,,,,,,
+F05000,,,,,,,,,,,,,,,1,,,,,,,,,,,
+F06C00,,,,,,,,,,,,,,,,1,,,,,,,,,,
+F06E00,,,,,,,,,,,,,,,,1,,,,,,,,,,
+F06N00,,,,,,,,,,,,,,,,1,,,,,,,,,,
+F06S00,,,,,,,,,,,,,,,,1,,,,,,,,,,
+F07C00,,,,,,,,,,,,,,,,1,,,,,,,,,,
+F07E00,,,,,,,,,,,,,,,,1,,,,,,,,,,
+F07N00,,,,,,,,,,,,,,,,1,,,,,,,,,,
+F07S00,,,,,,,,,,,,,,,,1,,,,,,,,,,
+F10C00,,,,,,,,,,,,,,,,1,,,,,,,,,,
+F10E00,,,,,,,,,,,,,,,,1,,,,,,,,,,
+F10N00,,,,,,,,,,,,,,,,1,,,,,,,,,,
+F10S00,,,,,,,,,,,,,,,,1,,,,,,,,,,
+T004,,,,,,,,,,,,,,,,,,,,,,,,,,
+T007,,,,,,,,1,,,,,,,,,,,,,,,,,,
+F05100,,,,,,,,,,,,,,,,,,,,,,,,,1,
+MDTY,,,,,,,,,,,,,,,,,,,,,,,,,,1
+TOP,,,,,,,,,,,,,,,,,,,,,,,,,,1
+SUB,,,,,,,,,,,,,,,,,,,,,,,,,,1
+T00OTOP,,,,,,,1,,,,,,,,,,,,,,,,,,,
+T00TOP,,,,,,,1,,,,,,,,,,,,,,,,,,,
+T00SUB,,,,,,,1,,,,,,,,,,,,,,,,,,,
+MCIF,,,,,,,,,,,,,,,1,,,,,,,,,,,
+MADJ,,,,,,,,,,,,,,,1,,,,,,,,,,,
\ No newline at end of file
diff --git a/inst/extdata/2012_Sector_Schema_Info.csv b/inst/extdata/2012_Sector_Schema_Info.csv
index ee65687e..984ac793 100644
--- a/inst/extdata/2012_Sector_Schema_Info.csv
+++ b/inst/extdata/2012_Sector_Schema_Info.csv
@@ -1,38 +1,47 @@
-Code,Commodity,Industry,Scrap,UsedGoods,NonComparableImport,RoWAdjustment,ValueAdded,CommodityTotalOutput,IndustryTotalOutput,CommodityIntermediateOutput,HouseholdDemand,InvestmentDemand,ChangeInventories,Export,Import,GovernmentDemand,Wholesale,Retail,Transportation
-11,1,1,,,,,,,,,,,,,,,,,
-21,1,1,,,,,,,,,,,,,,,,,
-22,1,1,,,,,,,,,,,,,,,,,
-23,1,1,,,,,,,,,,,,,,,,,
-31G,1,1,,,,,,,,,,,,,,,,,
-42,1,1,,,,,,,,,,,,,,,1,,
-44RT,1,1,,,,,,,,,,,,,,,,1,
-48TW,1,1,,,,,,,,,,,,,,,,,1
-51,1,1,,,,,,,,,,,,,,,,,
-FIRE,1,1,,,,,,,,,,,,,,,,,
-PROF,1,1,,,,,,,,,,,,,,,,,
-6,1,1,,,,,,,,,,,,,,,,,
-7,1,1,,,,,,,,,,,,,,,,,
-81,1,1,,,,,,,,,,,,,,,,,
-G,1,1,,,,,,,,,,,,,,,,,
-Used,1,,1,1,,,,,,,,,,,,,,,
-Other,1,,,,1,1,,,,,,,,,,,,,
-Sum of Intermediate Selected,,,,,,,,,,,,,,,,,,,
-Intermediate Not Selected,,,,,,,,,,,,,,,,,,,
-Total Intermediate,,,,,,,,,,1,,,,,,,,,
-V001,,,,,,,1,,,,,,,,,,,,
-V002,,,,,,,1,,,,,,,,,,,,
-V003,,,,,,,1,,,,,,,,,,,,
-Sum of Value Added Selected,,,,,,,,,,,,,,,,,,,
-Sum of Value Added Not Selected,,,,,,,,,,,,,,,,,,,
-Total Value Added,,,,,,,,,,,,,,,,,,,
-Total Industry Output,,,,,,,,,1,,,,,,,,,,
-F010,,,,,,,,,,,1,,,,,,,,
-F020,,,,,,,,,,,,1,,,,,,,
-F030,,,,,,,,,,,,,1,,,,,,
-F040,,,,,,,,,,,,,,1,,,,,
-F050,,,,,,,,,,,,,,,1,,,,
-F100,,,,,,,,,,,,,,,,1,,,
-Sum of Final Uses (GDP) Selected,,,,,,,,,,,,,,,,,,,
-Sum of Final Uses (GDP) Not Selected,,,,,,,,,,,,,,,,,,,
-Total Final Uses (GDP),,,,,,,,,,,,,,,,,,,
-Total Commodity Output,,,,,,,,1,,,,,,,,,,,
\ No newline at end of file
+Code,Commodity,Industry,Scrap,UsedGoods,NonComparableImport,RoWAdjustment,ValueAdded,CommodityTotalOutput,IndustryTotalOutput,CommodityIntermediateOutput,HouseholdDemand,InvestmentDemand,ChangeInventories,Export,Import,GovernmentDemand,Wholesale,Retail,Transportation,InternationalTradeAdjustment,TaxLessSubsidies
+11,1,1,,,,,,,,,,,,,,,,,,,
+21,1,1,,,,,,,,,,,,,,,,,,,
+22,1,1,,,,,,,,,,,,,,,,,,,
+23,1,1,,,,,,,,,,,,,,,,,,,
+31G,1,1,,,,,,,,,,,,,,,,,,,
+42,1,1,,,,,,,,,,,,,,,1,,,,
+44RT,1,1,,,,,,,,,,,,,,,,1,,,
+48TW,1,1,,,,,,,,,,,,,,,,,1,,
+51,1,1,,,,,,,,,,,,,,,,,,,
+FIRE,1,1,,,,,,,,,,,,,,,,,,,
+PROF,1,1,,,,,,,,,,,,,,,,,,,
+6,1,1,,,,,,,,,,,,,,,,,,,
+7,1,1,,,,,,,,,,,,,,,,,,,
+81,1,1,,,,,,,,,,,,,,,,,,,
+G,1,1,,,,,,,,,,,,,,,,,,,
+Used,1,,1,1,,,,,,,,,,,,,,,,,
+Other,1,,,,1,1,,,,,,,,,,,,,,,
+Sum of Intermediate Selected,,,,,,,,,,,,,,,,,,,,,
+Intermediate Not Selected,,,,,,,,,,,,,,,,,,,,,
+Total Intermediate,,,,,,,,,,1,,,,,,,,,,,
+V001,,,,,,,1,,,,,,,,,,,,,,
+V002,,,,,,,1,,,,,,,,,,,,,,
+V003,,,,,,,1,,,,,,,,,,,,,,
+Sum of Value Added Selected,,,,,,,,,,,,,,,,,,,,,
+Sum of Value Added Not Selected,,,,,,,,,,,,,,,,,,,,,
+Total Value Added,,,,,,,,,,,,,,,,,,,,,
+Total Industry Output,,,,,,,,,1,,,,,,,,,,,,
+F010,,,,,,,,,,,1,,,,,,,,,,
+F020,,,,,,,,,,,,1,,,,,,,,,
+F030,,,,,,,,,,,,,1,,,,,,,,
+F040,,,,,,,,,,,,,,1,,,,,,,
+F050,,,,,,,,,,,,,,,1,,,,,,
+F100,,,,,,,,,,,,,,,,1,,,,,
+Sum of Final Uses (GDP) Selected,,,,,,,,,,,,,,,,,,,,,
+Sum of Final Uses (GDP) Not Selected,,,,,,,,,,,,,,,,,,,,,
+Total Final Uses (GDP),,,,,,,,,,,,,,,,,,,,,
+Total Commodity Output,,,,,,,,1,,,,,,,,,,,,,
+F051,,,,,,,,,,,,,,,,,,,,1,
+MDTY,,,,,,,,,,,,,,,,,,,,,1
+TOP,,,,,,,,,,,,,,,,,,,,,1
+SUB,,,,,,,,,,,,,,,,,,,,,1
+T00OTOP,,,,,,,1,,,,,,,,,,,,,,
+T00TOP,,,,,,,1,,,,,,,,,,,,,,
+T00SUB,,,,,,,1,,,,,,,,,,,,,,
+MCIF,,,,,,,,,,,,,,,1,,,,,,
+MADJ,,,,,,,,,,,,,,,1,,,,,,
\ No newline at end of file
diff --git a/inst/extdata/2012_Summary_Schema_Info.csv b/inst/extdata/2012_Summary_Schema_Info.csv
index 7ed61467..20f53629 100644
--- a/inst/extdata/2012_Summary_Schema_Info.csv
+++ b/inst/extdata/2012_Summary_Schema_Info.csv
@@ -1,108 +1,117 @@
-Code,Commodity,Industry,Scrap,UsedGoods,NonComparableImport,RoWAdjustment,ValueAdded,CommodityTotalOutput,IndustryTotalOutput,CommodityIntermediateOutput,HouseholdDemand,InvestmentDemand,ChangeInventories,Export,Import,GovernmentDemand,Wholesale,Retail,Transportation
-111CA,1,1,,,,,,,,,,,,,,,,,
-113FF,1,1,,,,,,,,,,,,,,,,,
-211,1,1,,,,,,,,,,,,,,,,,
-212,1,1,,,,,,,,,,,,,,,,,
-213,1,1,,,,,,,,,,,,,,,,,
-22,1,1,,,,,,,,,,,,,,,,,
-23,1,1,,,,,,,,,,,,,,,,,
-321,1,1,,,,,,,,,,,,,,,,,
-327,1,1,,,,,,,,,,,,,,,,,
-331,1,1,,,,,,,,,,,,,,,,,
-332,1,1,,,,,,,,,,,,,,,,,
-333,1,1,,,,,,,,,,,,,,,,,
-334,1,1,,,,,,,,,,,,,,,,,
-335,1,1,,,,,,,,,,,,,,,,,
-3361MV,1,1,,,,,,,,,,,,,,,,,
-3364OT,1,1,,,,,,,,,,,,,,,,,
-337,1,1,,,,,,,,,,,,,,,,,
-339,1,1,,,,,,,,,,,,,,,,,
-311FT,1,1,,,,,,,,,,,,,,,,,
-313TT,1,1,,,,,,,,,,,,,,,,,
-315AL,1,1,,,,,,,,,,,,,,,,,
-322,1,1,,,,,,,,,,,,,,,,,
-323,1,1,,,,,,,,,,,,,,,,,
-324,1,1,,,,,,,,,,,,,,,,,
-325,1,1,,,,,,,,,,,,,,,,,
-326,1,1,,,,,,,,,,,,,,,,,
-42,1,1,,,,,,,,,,,,,,,1,,
-441,1,1,,,,,,,,,,,,,,,,1,
-445,1,1,,,,,,,,,,,,,,,,1,
-452,1,1,,,,,,,,,,,,,,,,1,
-4A0,1,1,,,,,,,,,,,,,,,,1,
-481,1,1,,,,,,,,,,,,,,,,,1
-482,1,1,,,,,,,,,,,,,,,,,1
-483,1,1,,,,,,,,,,,,,,,,,1
-484,1,1,,,,,,,,,,,,,,,,,1
-485,1,1,,,,,,,,,,,,,,,,,1
-486,1,1,,,,,,,,,,,,,,,,,1
-487OS,1,1,,,,,,,,,,,,,,,,,1
-493,1,1,,,,,,,,,,,,,,,,,1
-511,1,1,,,,,,,,,,,,,,,,,
-512,1,1,,,,,,,,,,,,,,,,,
-513,1,1,,,,,,,,,,,,,,,,,
-514,1,1,,,,,,,,,,,,,,,,,
-521CI,1,1,,,,,,,,,,,,,,,,,
-523,1,1,,,,,,,,,,,,,,,,,
-524,1,1,,,,,,,,,,,,,,,,,
-525,1,1,,,,,,,,,,,,,,,,,
-HS,1,1,,,,,,,,,,,,,,,,,
-ORE,1,1,,,,,,,,,,,,,,,,,
-532RL,1,1,,,,,,,,,,,,,,,,,
-5411,1,1,,,,,,,,,,,,,,,,,
-5415,1,1,,,,,,,,,,,,,,,,,
-5412OP,1,1,,,,,,,,,,,,,,,,,
-55,1,1,,,,,,,,,,,,,,,,,
-561,1,1,,,,,,,,,,,,,,,,,
-562,1,1,,,,,,,,,,,,,,,,,
-61,1,1,,,,,,,,,,,,,,,,,
-621,1,1,,,,,,,,,,,,,,,,,
-622,1,1,,,,,,,,,,,,,,,,,
-623,1,1,,,,,,,,,,,,,,,,,
-624,1,1,,,,,,,,,,,,,,,,,
-711AS,1,1,,,,,,,,,,,,,,,,,
-713,1,1,,,,,,,,,,,,,,,,,
-721,1,1,,,,,,,,,,,,,,,,,
-722,1,1,,,,,,,,,,,,,,,,,
-81,1,1,,,,,,,,,,,,,,,,,
-GFGD,1,1,,,,,,,,,,,,,,,,,
-GFGN,1,1,,,,,,,,,,,,,,,,,
-GFE,1,1,,,,,,,,,,,,,,,,,
-GSLG,1,1,,,,,,,,,,,,,,,,,
-GSLE,1,1,,,,,,,,,,,,,,,,,
-Used,1,,1,1,,,,,,,,,,,,,,,
-Other,1,,,,1,1,,,,,,,,,,,,,
-Sum of Intermediate Selected,,,,,,,,,,,,,,,,,,,
-Intermediate Not Selected,,,,,,,,,,,,,,,,,,,
-Total Intermediate,,,,,,,,,,1,,,,,,,,,
-V001,,,,,,,1,,,,,,,,,,,,
-V002,,,,,,,1,,,,,,,,,,,,
-V003,,,,,,,1,,,,,,,,,,,,
-Sum of Value Added Selected,,,,,,,,,,,,,,,,,,,
-Sum of Value Added Not Selected,,,,,,,,,,,,,,,,,,,
-Total Value Added,,,,,,,,,,,,,,,,,,,
-Total Industry Output,,,,,,,,,1,,,,,,,,,,
-F010,,,,,,,,,,,1,,,,,,,,
-F02S,,,,,,,,,,,,1,,,,,,,
-F02E,,,,,,,,,,,,1,,,,,,,
-F02N,,,,,,,,,,,,1,,,,,,,
-F02R,,,,,,,,,,,,1,,,,,,,
-F030,,,,,,,,,,,,,1,,,,,,
-F040,,,,,,,,,,,,,,1,,,,,
-F050,,,,,,,,,,,,,,,1,,,,
-F06C,,,,,,,,,,,,,,,,1,,,
-F06S,,,,,,,,,,,,,,,,1,,,
-F06E,,,,,,,,,,,,,,,,1,,,
-F06N,,,,,,,,,,,,,,,,1,,,
-F07C,,,,,,,,,,,,,,,,1,,,
-F07S,,,,,,,,,,,,,,,,1,,,
-F07E,,,,,,,,,,,,,,,,1,,,
-F07N,,,,,,,,,,,,,,,,1,,,
-F10C,,,,,,,,,,,,,,,,1,,,
-F10S,,,,,,,,,,,,,,,,1,,,
-F10E,,,,,,,,,,,,,,,,1,,,
-F10N,,,,,,,,,,,,,,,,1,,,
-Sum of Final Uses (GDP) Selected,,,,,,,,,,,,,,,,,,,
-Sum of Final Uses (GDP) Not Selected,,,,,,,,,,,,,,,,,,,
-Total Final Uses (GDP),,,,,,,,,,,,,,,,,,,
-Total Commodity Output,,,,,,,,1,,,,,,,,,,,
+Code,Commodity,Industry,Scrap,UsedGoods,NonComparableImport,RoWAdjustment,ValueAdded,CommodityTotalOutput,IndustryTotalOutput,CommodityIntermediateOutput,HouseholdDemand,InvestmentDemand,ChangeInventories,Export,Import,GovernmentDemand,Wholesale,Retail,Transportation,InternationalTradeAdjustment,TaxLessSubsidies
+111CA,1,1,,,,,,,,,,,,,,,,,,,
+113FF,1,1,,,,,,,,,,,,,,,,,,,
+211,1,1,,,,,,,,,,,,,,,,,,,
+212,1,1,,,,,,,,,,,,,,,,,,,
+213,1,1,,,,,,,,,,,,,,,,,,,
+22,1,1,,,,,,,,,,,,,,,,,,,
+23,1,1,,,,,,,,,,,,,,,,,,,
+321,1,1,,,,,,,,,,,,,,,,,,,
+327,1,1,,,,,,,,,,,,,,,,,,,
+331,1,1,,,,,,,,,,,,,,,,,,,
+332,1,1,,,,,,,,,,,,,,,,,,,
+333,1,1,,,,,,,,,,,,,,,,,,,
+334,1,1,,,,,,,,,,,,,,,,,,,
+335,1,1,,,,,,,,,,,,,,,,,,,
+3361MV,1,1,,,,,,,,,,,,,,,,,,,
+3364OT,1,1,,,,,,,,,,,,,,,,,,,
+337,1,1,,,,,,,,,,,,,,,,,,,
+339,1,1,,,,,,,,,,,,,,,,,,,
+311FT,1,1,,,,,,,,,,,,,,,,,,,
+313TT,1,1,,,,,,,,,,,,,,,,,,,
+315AL,1,1,,,,,,,,,,,,,,,,,,,
+322,1,1,,,,,,,,,,,,,,,,,,,
+323,1,1,,,,,,,,,,,,,,,,,,,
+324,1,1,,,,,,,,,,,,,,,,,,,
+325,1,1,,,,,,,,,,,,,,,,,,,
+326,1,1,,,,,,,,,,,,,,,,,,,
+42,1,1,,,,,,,,,,,,,,,1,,,,
+441,1,1,,,,,,,,,,,,,,,,1,,,
+445,1,1,,,,,,,,,,,,,,,,1,,,
+452,1,1,,,,,,,,,,,,,,,,1,,,
+4A0,1,1,,,,,,,,,,,,,,,,1,,,
+481,1,1,,,,,,,,,,,,,,,,,1,,
+482,1,1,,,,,,,,,,,,,,,,,1,,
+483,1,1,,,,,,,,,,,,,,,,,1,,
+484,1,1,,,,,,,,,,,,,,,,,1,,
+485,1,1,,,,,,,,,,,,,,,,,1,,
+486,1,1,,,,,,,,,,,,,,,,,1,,
+487OS,1,1,,,,,,,,,,,,,,,,,1,,
+493,1,1,,,,,,,,,,,,,,,,,1,,
+511,1,1,,,,,,,,,,,,,,,,,,,
+512,1,1,,,,,,,,,,,,,,,,,,,
+513,1,1,,,,,,,,,,,,,,,,,,,
+514,1,1,,,,,,,,,,,,,,,,,,,
+521CI,1,1,,,,,,,,,,,,,,,,,,,
+523,1,1,,,,,,,,,,,,,,,,,,,
+524,1,1,,,,,,,,,,,,,,,,,,,
+525,1,1,,,,,,,,,,,,,,,,,,,
+HS,1,1,,,,,,,,,,,,,,,,,,,
+ORE,1,1,,,,,,,,,,,,,,,,,,,
+532RL,1,1,,,,,,,,,,,,,,,,,,,
+5411,1,1,,,,,,,,,,,,,,,,,,,
+5415,1,1,,,,,,,,,,,,,,,,,,,
+5412OP,1,1,,,,,,,,,,,,,,,,,,,
+55,1,1,,,,,,,,,,,,,,,,,,,
+561,1,1,,,,,,,,,,,,,,,,,,,
+562,1,1,,,,,,,,,,,,,,,,,,,
+61,1,1,,,,,,,,,,,,,,,,,,,
+621,1,1,,,,,,,,,,,,,,,,,,,
+622,1,1,,,,,,,,,,,,,,,,,,,
+623,1,1,,,,,,,,,,,,,,,,,,,
+624,1,1,,,,,,,,,,,,,,,,,,,
+711AS,1,1,,,,,,,,,,,,,,,,,,,
+713,1,1,,,,,,,,,,,,,,,,,,,
+721,1,1,,,,,,,,,,,,,,,,,,,
+722,1,1,,,,,,,,,,,,,,,,,,,
+81,1,1,,,,,,,,,,,,,,,,,,,
+GFGD,1,1,,,,,,,,,,,,,,,,,,,
+GFGN,1,1,,,,,,,,,,,,,,,,,,,
+GFE,1,1,,,,,,,,,,,,,,,,,,,
+GSLG,1,1,,,,,,,,,,,,,,,,,,,
+GSLE,1,1,,,,,,,,,,,,,,,,,,,
+Used,1,,1,1,,,,,,,,,,,,,,,,,
+Other,1,,,,1,1,,,,,,,,,,,,,,,
+Sum of Intermediate Selected,,,,,,,,,,,,,,,,,,,,,
+Intermediate Not Selected,,,,,,,,,,,,,,,,,,,,,
+Total Intermediate,,,,,,,,,,1,,,,,,,,,,,
+V001,,,,,,,1,,,,,,,,,,,,,,
+V002,,,,,,,1,,,,,,,,,,,,,,
+V003,,,,,,,1,,,,,,,,,,,,,,
+Sum of Value Added Selected,,,,,,,,,,,,,,,,,,,,,
+Sum of Value Added Not Selected,,,,,,,,,,,,,,,,,,,,,
+Total Value Added,,,,,,,,,,,,,,,,,,,,,
+Total Industry Output,,,,,,,,,1,,,,,,,,,,,,
+F010,,,,,,,,,,,1,,,,,,,,,,
+F02S,,,,,,,,,,,,1,,,,,,,,,
+F02E,,,,,,,,,,,,1,,,,,,,,,
+F02N,,,,,,,,,,,,1,,,,,,,,,
+F02R,,,,,,,,,,,,1,,,,,,,,,
+F030,,,,,,,,,,,,,1,,,,,,,,
+F040,,,,,,,,,,,,,,1,,,,,,,
+F050,,,,,,,,,,,,,,,1,,,,,,
+F06C,,,,,,,,,,,,,,,,1,,,,,
+F06S,,,,,,,,,,,,,,,,1,,,,,
+F06E,,,,,,,,,,,,,,,,1,,,,,
+F06N,,,,,,,,,,,,,,,,1,,,,,
+F07C,,,,,,,,,,,,,,,,1,,,,,
+F07S,,,,,,,,,,,,,,,,1,,,,,
+F07E,,,,,,,,,,,,,,,,1,,,,,
+F07N,,,,,,,,,,,,,,,,1,,,,,
+F10C,,,,,,,,,,,,,,,,1,,,,,
+F10S,,,,,,,,,,,,,,,,1,,,,,
+F10E,,,,,,,,,,,,,,,,1,,,,,
+F10N,,,,,,,,,,,,,,,,1,,,,,
+Sum of Final Uses (GDP) Selected,,,,,,,,,,,,,,,,,,,,,
+Sum of Final Uses (GDP) Not Selected,,,,,,,,,,,,,,,,,,,,,
+Total Final Uses (GDP),,,,,,,,,,,,,,,,,,,,,
+Total Commodity Output,,,,,,,,1,,,,,,,,,,,,,
+F051,,,,,,,,,,,,,,,,,,,,1,
+MDTY,,,,,,,,,,,,,,,,,,,,,1
+TOP,,,,,,,,,,,,,,,,,,,,,1
+SUB,,,,,,,,,,,,,,,,,,,,,1
+T00OTOP,,,,,,,1,,,,,,,,,,,,,,
+T00TOP,,,,,,,1,,,,,,,,,,,,,,
+T00SUB,,,,,,,1,,,,,,,,,,,,,,
+MCIF,,,,,,,,,,,,,,,1,,,,,,
+MADJ,,,,,,,,,,,,,,,1,,,,,,
\ No newline at end of file
diff --git a/inst/extdata/metadata/Detail_Supply_2012_metadata.json b/inst/extdata/metadata/Detail_Supply_2012_metadata.json
new file mode 100644
index 00000000..4f4bfb14
--- /dev/null
+++ b/inst/extdata/metadata/Detail_Supply_2012_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Detail_Supply_2012"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2012],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2021-09-28"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Detail_Use_SUT_2012_metadata.json b/inst/extdata/metadata/Detail_Use_SUT_2012_metadata.json
new file mode 100644
index 00000000..7412e435
--- /dev/null
+++ b/inst/extdata/metadata/Detail_Use_SUT_2012_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Detail_Use_SUT_2012"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2012],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2021-09-29"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Sector_Supply_2010_metadata.json b/inst/extdata/metadata/Sector_Supply_2010_metadata.json
new file mode 100644
index 00000000..e351b745
--- /dev/null
+++ b/inst/extdata/metadata/Sector_Supply_2010_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Sector_Supply_2010"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2010],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Sector_Supply_2011_metadata.json b/inst/extdata/metadata/Sector_Supply_2011_metadata.json
new file mode 100644
index 00000000..dc7fcc27
--- /dev/null
+++ b/inst/extdata/metadata/Sector_Supply_2011_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Sector_Supply_2011"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2011],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Sector_Supply_2012_metadata.json b/inst/extdata/metadata/Sector_Supply_2012_metadata.json
new file mode 100644
index 00000000..48cd4919
--- /dev/null
+++ b/inst/extdata/metadata/Sector_Supply_2012_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Sector_Supply_2012"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2012],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Sector_Supply_2013_metadata.json b/inst/extdata/metadata/Sector_Supply_2013_metadata.json
new file mode 100644
index 00000000..85f4b59e
--- /dev/null
+++ b/inst/extdata/metadata/Sector_Supply_2013_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Sector_Supply_2013"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2013],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Sector_Supply_2014_metadata.json b/inst/extdata/metadata/Sector_Supply_2014_metadata.json
new file mode 100644
index 00000000..8e2b8209
--- /dev/null
+++ b/inst/extdata/metadata/Sector_Supply_2014_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Sector_Supply_2014"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2014],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Sector_Supply_2015_metadata.json b/inst/extdata/metadata/Sector_Supply_2015_metadata.json
new file mode 100644
index 00000000..60b8ea96
--- /dev/null
+++ b/inst/extdata/metadata/Sector_Supply_2015_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Sector_Supply_2015"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2015],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Sector_Supply_2016_metadata.json b/inst/extdata/metadata/Sector_Supply_2016_metadata.json
new file mode 100644
index 00000000..7db8ee70
--- /dev/null
+++ b/inst/extdata/metadata/Sector_Supply_2016_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Sector_Supply_2016"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2016],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Sector_Supply_2017_metadata.json b/inst/extdata/metadata/Sector_Supply_2017_metadata.json
new file mode 100644
index 00000000..dae1aa8e
--- /dev/null
+++ b/inst/extdata/metadata/Sector_Supply_2017_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Sector_Supply_2017"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2017],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Sector_Supply_2018_metadata.json b/inst/extdata/metadata/Sector_Supply_2018_metadata.json
new file mode 100644
index 00000000..aec067a9
--- /dev/null
+++ b/inst/extdata/metadata/Sector_Supply_2018_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Sector_Supply_2018"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2018],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Sector_Supply_2019_metadata.json b/inst/extdata/metadata/Sector_Supply_2019_metadata.json
new file mode 100644
index 00000000..4eeb62fb
--- /dev/null
+++ b/inst/extdata/metadata/Sector_Supply_2019_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Sector_Supply_2019"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2019],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Sector_Supply_2020_metadata.json b/inst/extdata/metadata/Sector_Supply_2020_metadata.json
new file mode 100644
index 00000000..8df73628
--- /dev/null
+++ b/inst/extdata/metadata/Sector_Supply_2020_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Sector_Supply_2020"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2020],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Sector_Use_SUT_2010_metadata.json b/inst/extdata/metadata/Sector_Use_SUT_2010_metadata.json
new file mode 100644
index 00000000..ce2e8614
--- /dev/null
+++ b/inst/extdata/metadata/Sector_Use_SUT_2010_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Sector_Use_SUT_2010"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2010],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Sector_Use_SUT_2011_metadata.json b/inst/extdata/metadata/Sector_Use_SUT_2011_metadata.json
new file mode 100644
index 00000000..d758b3c2
--- /dev/null
+++ b/inst/extdata/metadata/Sector_Use_SUT_2011_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Sector_Use_SUT_2011"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2011],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Sector_Use_SUT_2012_metadata.json b/inst/extdata/metadata/Sector_Use_SUT_2012_metadata.json
new file mode 100644
index 00000000..02a958c4
--- /dev/null
+++ b/inst/extdata/metadata/Sector_Use_SUT_2012_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Sector_Use_SUT_2012"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2012],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Sector_Use_SUT_2013_metadata.json b/inst/extdata/metadata/Sector_Use_SUT_2013_metadata.json
new file mode 100644
index 00000000..c7451ae6
--- /dev/null
+++ b/inst/extdata/metadata/Sector_Use_SUT_2013_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Sector_Use_SUT_2013"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2013],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Sector_Use_SUT_2014_metadata.json b/inst/extdata/metadata/Sector_Use_SUT_2014_metadata.json
new file mode 100644
index 00000000..1730813f
--- /dev/null
+++ b/inst/extdata/metadata/Sector_Use_SUT_2014_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Sector_Use_SUT_2014"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2014],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Sector_Use_SUT_2015_metadata.json b/inst/extdata/metadata/Sector_Use_SUT_2015_metadata.json
new file mode 100644
index 00000000..f36e1e90
--- /dev/null
+++ b/inst/extdata/metadata/Sector_Use_SUT_2015_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Sector_Use_SUT_2015"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2015],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Sector_Use_SUT_2016_metadata.json b/inst/extdata/metadata/Sector_Use_SUT_2016_metadata.json
new file mode 100644
index 00000000..19c41948
--- /dev/null
+++ b/inst/extdata/metadata/Sector_Use_SUT_2016_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Sector_Use_SUT_2016"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2016],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Sector_Use_SUT_2017_metadata.json b/inst/extdata/metadata/Sector_Use_SUT_2017_metadata.json
new file mode 100644
index 00000000..2fa9109b
--- /dev/null
+++ b/inst/extdata/metadata/Sector_Use_SUT_2017_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Sector_Use_SUT_2017"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2017],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Sector_Use_SUT_2018_metadata.json b/inst/extdata/metadata/Sector_Use_SUT_2018_metadata.json
new file mode 100644
index 00000000..e167e3fb
--- /dev/null
+++ b/inst/extdata/metadata/Sector_Use_SUT_2018_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Sector_Use_SUT_2018"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2018],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Sector_Use_SUT_2019_metadata.json b/inst/extdata/metadata/Sector_Use_SUT_2019_metadata.json
new file mode 100644
index 00000000..111a7789
--- /dev/null
+++ b/inst/extdata/metadata/Sector_Use_SUT_2019_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Sector_Use_SUT_2019"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2019],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Sector_Use_SUT_2020_metadata.json b/inst/extdata/metadata/Sector_Use_SUT_2020_metadata.json
new file mode 100644
index 00000000..dccfb258
--- /dev/null
+++ b/inst/extdata/metadata/Sector_Use_SUT_2020_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Sector_Use_SUT_2020"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2020],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Summary_Supply_2010_metadata.json b/inst/extdata/metadata/Summary_Supply_2010_metadata.json
new file mode 100644
index 00000000..850c113d
--- /dev/null
+++ b/inst/extdata/metadata/Summary_Supply_2010_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Summary_Supply_2010"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2010],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Summary_Supply_2011_metadata.json b/inst/extdata/metadata/Summary_Supply_2011_metadata.json
new file mode 100644
index 00000000..fc3b1391
--- /dev/null
+++ b/inst/extdata/metadata/Summary_Supply_2011_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Summary_Supply_2011"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2011],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Summary_Supply_2012_metadata.json b/inst/extdata/metadata/Summary_Supply_2012_metadata.json
new file mode 100644
index 00000000..0ea17ece
--- /dev/null
+++ b/inst/extdata/metadata/Summary_Supply_2012_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Summary_Supply_2012"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2012],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Summary_Supply_2013_metadata.json b/inst/extdata/metadata/Summary_Supply_2013_metadata.json
new file mode 100644
index 00000000..38a3ae86
--- /dev/null
+++ b/inst/extdata/metadata/Summary_Supply_2013_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Summary_Supply_2013"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2013],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Summary_Supply_2014_metadata.json b/inst/extdata/metadata/Summary_Supply_2014_metadata.json
new file mode 100644
index 00000000..b750e49a
--- /dev/null
+++ b/inst/extdata/metadata/Summary_Supply_2014_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Summary_Supply_2014"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2014],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Summary_Supply_2015_metadata.json b/inst/extdata/metadata/Summary_Supply_2015_metadata.json
new file mode 100644
index 00000000..e68ae36f
--- /dev/null
+++ b/inst/extdata/metadata/Summary_Supply_2015_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Summary_Supply_2015"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2015],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Summary_Supply_2016_metadata.json b/inst/extdata/metadata/Summary_Supply_2016_metadata.json
new file mode 100644
index 00000000..948351d1
--- /dev/null
+++ b/inst/extdata/metadata/Summary_Supply_2016_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Summary_Supply_2016"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2016],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Summary_Supply_2017_metadata.json b/inst/extdata/metadata/Summary_Supply_2017_metadata.json
new file mode 100644
index 00000000..64c62856
--- /dev/null
+++ b/inst/extdata/metadata/Summary_Supply_2017_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Summary_Supply_2017"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2017],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Summary_Supply_2018_metadata.json b/inst/extdata/metadata/Summary_Supply_2018_metadata.json
new file mode 100644
index 00000000..970d70db
--- /dev/null
+++ b/inst/extdata/metadata/Summary_Supply_2018_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Summary_Supply_2018"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2018],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Summary_Supply_2019_metadata.json b/inst/extdata/metadata/Summary_Supply_2019_metadata.json
new file mode 100644
index 00000000..382428c1
--- /dev/null
+++ b/inst/extdata/metadata/Summary_Supply_2019_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Summary_Supply_2019"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2019],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Summary_Supply_2020_metadata.json b/inst/extdata/metadata/Summary_Supply_2020_metadata.json
new file mode 100644
index 00000000..1a81f41a
--- /dev/null
+++ b/inst/extdata/metadata/Summary_Supply_2020_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Summary_Supply_2020"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2020],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Summary_Use_SUT_2010_metadata.json b/inst/extdata/metadata/Summary_Use_SUT_2010_metadata.json
new file mode 100644
index 00000000..76a83c2a
--- /dev/null
+++ b/inst/extdata/metadata/Summary_Use_SUT_2010_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Summary_Use_SUT_2010"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2010],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Summary_Use_SUT_2011_metadata.json b/inst/extdata/metadata/Summary_Use_SUT_2011_metadata.json
new file mode 100644
index 00000000..28f8a5d6
--- /dev/null
+++ b/inst/extdata/metadata/Summary_Use_SUT_2011_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Summary_Use_SUT_2011"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2011],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Summary_Use_SUT_2012_metadata.json b/inst/extdata/metadata/Summary_Use_SUT_2012_metadata.json
new file mode 100644
index 00000000..916810c9
--- /dev/null
+++ b/inst/extdata/metadata/Summary_Use_SUT_2012_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Summary_Use_SUT_2012"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2012],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Summary_Use_SUT_2013_metadata.json b/inst/extdata/metadata/Summary_Use_SUT_2013_metadata.json
new file mode 100644
index 00000000..22cf7bce
--- /dev/null
+++ b/inst/extdata/metadata/Summary_Use_SUT_2013_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Summary_Use_SUT_2013"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2013],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Summary_Use_SUT_2014_metadata.json b/inst/extdata/metadata/Summary_Use_SUT_2014_metadata.json
new file mode 100644
index 00000000..0298aacb
--- /dev/null
+++ b/inst/extdata/metadata/Summary_Use_SUT_2014_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Summary_Use_SUT_2014"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2014],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Summary_Use_SUT_2015_metadata.json b/inst/extdata/metadata/Summary_Use_SUT_2015_metadata.json
new file mode 100644
index 00000000..d8a97a08
--- /dev/null
+++ b/inst/extdata/metadata/Summary_Use_SUT_2015_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Summary_Use_SUT_2015"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2015],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Summary_Use_SUT_2016_metadata.json b/inst/extdata/metadata/Summary_Use_SUT_2016_metadata.json
new file mode 100644
index 00000000..de70c09e
--- /dev/null
+++ b/inst/extdata/metadata/Summary_Use_SUT_2016_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Summary_Use_SUT_2016"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2016],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Summary_Use_SUT_2017_metadata.json b/inst/extdata/metadata/Summary_Use_SUT_2017_metadata.json
new file mode 100644
index 00000000..6485e429
--- /dev/null
+++ b/inst/extdata/metadata/Summary_Use_SUT_2017_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Summary_Use_SUT_2017"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2017],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Summary_Use_SUT_2018_metadata.json b/inst/extdata/metadata/Summary_Use_SUT_2018_metadata.json
new file mode 100644
index 00000000..e946b283
--- /dev/null
+++ b/inst/extdata/metadata/Summary_Use_SUT_2018_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Summary_Use_SUT_2018"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2018],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Summary_Use_SUT_2019_metadata.json b/inst/extdata/metadata/Summary_Use_SUT_2019_metadata.json
new file mode 100644
index 00000000..4a38c853
--- /dev/null
+++ b/inst/extdata/metadata/Summary_Use_SUT_2019_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Summary_Use_SUT_2019"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2019],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/inst/extdata/metadata/Summary_Use_SUT_2020_metadata.json b/inst/extdata/metadata/Summary_Use_SUT_2020_metadata.json
new file mode 100644
index 00000000..e825330a
--- /dev/null
+++ b/inst/extdata/metadata/Summary_Use_SUT_2020_metadata.json
@@ -0,0 +1,14 @@
+{
+ "tool": ["useeior"],
+ "name_data": ["Summary_Use_SUT_2020"],
+ "tool_version": ["1.1.1"],
+ "ext": ["json"],
+ "date_created": ["2022-08-23"],
+ "data_meta": {
+ "data_year": [2020],
+ "author": ["US Bureau of Economic Analysis"],
+ "source_url": ["https://apps.bea.gov/industry/iTables%20Static%20Files/AllTablesSUP.zip"],
+ "date_last_modified": ["2022-02-08"],
+ "date_accessed": ["2022-08-23"]
+ }
+}
diff --git a/man/Detail_Supply_2012.Rd b/man/Detail_Supply_2012.Rd
new file mode 100644
index 00000000..2dfff259
--- /dev/null
+++ b/man/Detail_Supply_2012.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Detail_Supply_2012}
+\alias{Detail_Supply_2012}
+\title{Detail 2012 Supply (2012 schema)}
+\format{
+A dataframe with 406 obs. and 417 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Detail_Supply_2012
+}
+\description{
+Detail 2012 Supply (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Detail_Use_SUT_2012.Rd b/man/Detail_Use_SUT_2012.Rd
new file mode 100644
index 00000000..9cebdcc4
--- /dev/null
+++ b/man/Detail_Use_SUT_2012.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Detail_Use_SUT_2012}
+\alias{Detail_Use_SUT_2012}
+\title{Detail 2012 Use (under the Supply-Use framework, 2012 schema)}
+\format{
+A dataframe with 414 obs. and 426 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Detail_Use_SUT_2012
+}
+\description{
+Detail 2012 Use (under the Supply-Use framework, 2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Sector_Supply_2010.Rd b/man/Sector_Supply_2010.Rd
new file mode 100644
index 00000000..d75eb06e
--- /dev/null
+++ b/man/Sector_Supply_2010.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Sector_Supply_2010}
+\alias{Sector_Supply_2010}
+\title{Sector 2010 Supply (2012 schema)}
+\format{
+A dataframe with 18 obs. and 27 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Sector_Supply_2010
+}
+\description{
+Sector 2010 Supply (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Sector_Supply_2011.Rd b/man/Sector_Supply_2011.Rd
new file mode 100644
index 00000000..1101ca15
--- /dev/null
+++ b/man/Sector_Supply_2011.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Sector_Supply_2011}
+\alias{Sector_Supply_2011}
+\title{Sector 2011 Supply (2012 schema)}
+\format{
+A dataframe with 18 obs. and 27 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Sector_Supply_2011
+}
+\description{
+Sector 2011 Supply (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Sector_Supply_2012.Rd b/man/Sector_Supply_2012.Rd
new file mode 100644
index 00000000..ce127132
--- /dev/null
+++ b/man/Sector_Supply_2012.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Sector_Supply_2012}
+\alias{Sector_Supply_2012}
+\title{Sector 2012 Supply (2012 schema)}
+\format{
+A dataframe with 18 obs. and 27 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Sector_Supply_2012
+}
+\description{
+Sector 2012 Supply (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Sector_Supply_2013.Rd b/man/Sector_Supply_2013.Rd
new file mode 100644
index 00000000..e06719f5
--- /dev/null
+++ b/man/Sector_Supply_2013.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Sector_Supply_2013}
+\alias{Sector_Supply_2013}
+\title{Sector 2013 Supply (2012 schema)}
+\format{
+A dataframe with 18 obs. and 27 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Sector_Supply_2013
+}
+\description{
+Sector 2013 Supply (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Sector_Supply_2014.Rd b/man/Sector_Supply_2014.Rd
new file mode 100644
index 00000000..b7cf0555
--- /dev/null
+++ b/man/Sector_Supply_2014.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Sector_Supply_2014}
+\alias{Sector_Supply_2014}
+\title{Sector 2014 Supply (2012 schema)}
+\format{
+A dataframe with 18 obs. and 27 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Sector_Supply_2014
+}
+\description{
+Sector 2014 Supply (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Sector_Supply_2015.Rd b/man/Sector_Supply_2015.Rd
new file mode 100644
index 00000000..d5a998ec
--- /dev/null
+++ b/man/Sector_Supply_2015.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Sector_Supply_2015}
+\alias{Sector_Supply_2015}
+\title{Sector 2015 Supply (2012 schema)}
+\format{
+A dataframe with 18 obs. and 27 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Sector_Supply_2015
+}
+\description{
+Sector 2015 Supply (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Sector_Supply_2016.Rd b/man/Sector_Supply_2016.Rd
new file mode 100644
index 00000000..bd3a1a2d
--- /dev/null
+++ b/man/Sector_Supply_2016.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Sector_Supply_2016}
+\alias{Sector_Supply_2016}
+\title{Sector 2016 Supply (2012 schema)}
+\format{
+A dataframe with 18 obs. and 27 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Sector_Supply_2016
+}
+\description{
+Sector 2016 Supply (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Sector_Supply_2017.Rd b/man/Sector_Supply_2017.Rd
new file mode 100644
index 00000000..12cf0d8d
--- /dev/null
+++ b/man/Sector_Supply_2017.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Sector_Supply_2017}
+\alias{Sector_Supply_2017}
+\title{Sector 2017 Supply (2012 schema)}
+\format{
+A dataframe with 18 obs. and 27 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Sector_Supply_2017
+}
+\description{
+Sector 2017 Supply (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Sector_Supply_2018.Rd b/man/Sector_Supply_2018.Rd
new file mode 100644
index 00000000..6e07087e
--- /dev/null
+++ b/man/Sector_Supply_2018.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Sector_Supply_2018}
+\alias{Sector_Supply_2018}
+\title{Sector 2018 Supply (2012 schema)}
+\format{
+A dataframe with 18 obs. and 27 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Sector_Supply_2018
+}
+\description{
+Sector 2018 Supply (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Sector_Supply_2019.Rd b/man/Sector_Supply_2019.Rd
new file mode 100644
index 00000000..7307fce2
--- /dev/null
+++ b/man/Sector_Supply_2019.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Sector_Supply_2019}
+\alias{Sector_Supply_2019}
+\title{Sector 2019 Supply (2012 schema)}
+\format{
+A dataframe with 18 obs. and 27 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Sector_Supply_2019
+}
+\description{
+Sector 2019 Supply (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Sector_Supply_2020.Rd b/man/Sector_Supply_2020.Rd
new file mode 100644
index 00000000..700342d9
--- /dev/null
+++ b/man/Sector_Supply_2020.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Sector_Supply_2020}
+\alias{Sector_Supply_2020}
+\title{Sector 2020 Supply (2012 schema)}
+\format{
+A dataframe with 18 obs. and 27 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Sector_Supply_2020
+}
+\description{
+Sector 2020 Supply (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Sector_Use_SUT_2010.Rd b/man/Sector_Use_SUT_2010.Rd
new file mode 100644
index 00000000..ac0b975c
--- /dev/null
+++ b/man/Sector_Use_SUT_2010.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Sector_Use_SUT_2010}
+\alias{Sector_Use_SUT_2010}
+\title{Sector 2010 Use (2012 schema)}
+\format{
+A dataframe with 26 obs. and 22 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Sector_Use_SUT_2010
+}
+\description{
+Sector 2010 Use (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Sector_Use_SUT_2011.Rd b/man/Sector_Use_SUT_2011.Rd
new file mode 100644
index 00000000..c37f515a
--- /dev/null
+++ b/man/Sector_Use_SUT_2011.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Sector_Use_SUT_2011}
+\alias{Sector_Use_SUT_2011}
+\title{Sector 2011 Use (2012 schema)}
+\format{
+A dataframe with 26 obs. and 22 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Sector_Use_SUT_2011
+}
+\description{
+Sector 2011 Use (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Sector_Use_SUT_2012.Rd b/man/Sector_Use_SUT_2012.Rd
new file mode 100644
index 00000000..4807a0a7
--- /dev/null
+++ b/man/Sector_Use_SUT_2012.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Sector_Use_SUT_2012}
+\alias{Sector_Use_SUT_2012}
+\title{Sector 2012 Use (2012 schema)}
+\format{
+A dataframe with 26 obs. and 22 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Sector_Use_SUT_2012
+}
+\description{
+Sector 2012 Use (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Sector_Use_SUT_2013.Rd b/man/Sector_Use_SUT_2013.Rd
new file mode 100644
index 00000000..9880d5fb
--- /dev/null
+++ b/man/Sector_Use_SUT_2013.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Sector_Use_SUT_2013}
+\alias{Sector_Use_SUT_2013}
+\title{Sector 2013 Use (2012 schema)}
+\format{
+A dataframe with 26 obs. and 22 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Sector_Use_SUT_2013
+}
+\description{
+Sector 2013 Use (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Sector_Use_SUT_2014.Rd b/man/Sector_Use_SUT_2014.Rd
new file mode 100644
index 00000000..6ec40738
--- /dev/null
+++ b/man/Sector_Use_SUT_2014.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Sector_Use_SUT_2014}
+\alias{Sector_Use_SUT_2014}
+\title{Sector 2014 Use (2012 schema)}
+\format{
+A dataframe with 26 obs. and 22 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Sector_Use_SUT_2014
+}
+\description{
+Sector 2014 Use (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Sector_Use_SUT_2015.Rd b/man/Sector_Use_SUT_2015.Rd
new file mode 100644
index 00000000..98cec639
--- /dev/null
+++ b/man/Sector_Use_SUT_2015.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Sector_Use_SUT_2015}
+\alias{Sector_Use_SUT_2015}
+\title{Sector 2015 Use (2012 schema)}
+\format{
+A dataframe with 26 obs. and 22 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Sector_Use_SUT_2015
+}
+\description{
+Sector 2015 Use (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Sector_Use_SUT_2016.Rd b/man/Sector_Use_SUT_2016.Rd
new file mode 100644
index 00000000..43d1f97f
--- /dev/null
+++ b/man/Sector_Use_SUT_2016.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Sector_Use_SUT_2016}
+\alias{Sector_Use_SUT_2016}
+\title{Sector 2016 Use (2012 schema)}
+\format{
+A dataframe with 26 obs. and 22 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Sector_Use_SUT_2016
+}
+\description{
+Sector 2016 Use (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Sector_Use_SUT_2017.Rd b/man/Sector_Use_SUT_2017.Rd
new file mode 100644
index 00000000..938ada5e
--- /dev/null
+++ b/man/Sector_Use_SUT_2017.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Sector_Use_SUT_2017}
+\alias{Sector_Use_SUT_2017}
+\title{Sector 2017 Use (2012 schema)}
+\format{
+A dataframe with 26 obs. and 22 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Sector_Use_SUT_2017
+}
+\description{
+Sector 2017 Use (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Sector_Use_SUT_2018.Rd b/man/Sector_Use_SUT_2018.Rd
new file mode 100644
index 00000000..f7571c35
--- /dev/null
+++ b/man/Sector_Use_SUT_2018.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Sector_Use_SUT_2018}
+\alias{Sector_Use_SUT_2018}
+\title{Sector 2018 Use (2012 schema)}
+\format{
+A dataframe with 26 obs. and 22 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Sector_Use_SUT_2018
+}
+\description{
+Sector 2018 Use (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Sector_Use_SUT_2019.Rd b/man/Sector_Use_SUT_2019.Rd
new file mode 100644
index 00000000..a5d56153
--- /dev/null
+++ b/man/Sector_Use_SUT_2019.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Sector_Use_SUT_2019}
+\alias{Sector_Use_SUT_2019}
+\title{Sector 2019 Use (2012 schema)}
+\format{
+A dataframe with 26 obs. and 22 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Sector_Use_SUT_2019
+}
+\description{
+Sector 2019 Use (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Sector_Use_SUT_2020.Rd b/man/Sector_Use_SUT_2020.Rd
new file mode 100644
index 00000000..083447a8
--- /dev/null
+++ b/man/Sector_Use_SUT_2020.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Sector_Use_SUT_2020}
+\alias{Sector_Use_SUT_2020}
+\title{Sector 2020 Use (2012 schema)}
+\format{
+A dataframe with 26 obs. and 22 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Sector_Use_SUT_2020
+}
+\description{
+Sector 2020 Use (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Summary_Supply_2010.Rd b/man/Summary_Supply_2010.Rd
new file mode 100644
index 00000000..2bcfc4ea
--- /dev/null
+++ b/man/Summary_Supply_2010.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Summary_Supply_2010}
+\alias{Summary_Supply_2010}
+\title{Summary 2010 Supply (2012 schema)}
+\format{
+A dataframe with 74 obs. and 83 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Summary_Supply_2010
+}
+\description{
+Summary 2010 Supply (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Summary_Supply_2011.Rd b/man/Summary_Supply_2011.Rd
new file mode 100644
index 00000000..80f9dce6
--- /dev/null
+++ b/man/Summary_Supply_2011.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Summary_Supply_2011}
+\alias{Summary_Supply_2011}
+\title{Summary 2011 Supply (2012 schema)}
+\format{
+A dataframe with 74 obs. and 83 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Summary_Supply_2011
+}
+\description{
+Summary 2011 Supply (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Summary_Supply_2012.Rd b/man/Summary_Supply_2012.Rd
new file mode 100644
index 00000000..01ad672b
--- /dev/null
+++ b/man/Summary_Supply_2012.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Summary_Supply_2012}
+\alias{Summary_Supply_2012}
+\title{Summary 2012 Supply (2012 schema)}
+\format{
+A dataframe with 74 obs. and 83 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Summary_Supply_2012
+}
+\description{
+Summary 2012 Supply (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Summary_Supply_2013.Rd b/man/Summary_Supply_2013.Rd
new file mode 100644
index 00000000..61bf9adc
--- /dev/null
+++ b/man/Summary_Supply_2013.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Summary_Supply_2013}
+\alias{Summary_Supply_2013}
+\title{Summary 2013 Supply (2012 schema)}
+\format{
+A dataframe with 74 obs. and 83 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Summary_Supply_2013
+}
+\description{
+Summary 2013 Supply (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Summary_Supply_2014.Rd b/man/Summary_Supply_2014.Rd
new file mode 100644
index 00000000..c8a485a5
--- /dev/null
+++ b/man/Summary_Supply_2014.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Summary_Supply_2014}
+\alias{Summary_Supply_2014}
+\title{Summary 2014 Supply (2012 schema)}
+\format{
+A dataframe with 74 obs. and 83 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Summary_Supply_2014
+}
+\description{
+Summary 2014 Supply (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Summary_Supply_2015.Rd b/man/Summary_Supply_2015.Rd
new file mode 100644
index 00000000..e7c87953
--- /dev/null
+++ b/man/Summary_Supply_2015.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Summary_Supply_2015}
+\alias{Summary_Supply_2015}
+\title{Summary 2015 Supply (2012 schema)}
+\format{
+A dataframe with 74 obs. and 83 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Summary_Supply_2015
+}
+\description{
+Summary 2015 Supply (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Summary_Supply_2016.Rd b/man/Summary_Supply_2016.Rd
new file mode 100644
index 00000000..3df8b496
--- /dev/null
+++ b/man/Summary_Supply_2016.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Summary_Supply_2016}
+\alias{Summary_Supply_2016}
+\title{Summary 2016 Supply (2012 schema)}
+\format{
+A dataframe with 74 obs. and 83 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Summary_Supply_2016
+}
+\description{
+Summary 2016 Supply (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Summary_Supply_2017.Rd b/man/Summary_Supply_2017.Rd
new file mode 100644
index 00000000..6cfa292b
--- /dev/null
+++ b/man/Summary_Supply_2017.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Summary_Supply_2017}
+\alias{Summary_Supply_2017}
+\title{Summary 2017 Supply (2012 schema)}
+\format{
+A dataframe with 74 obs. and 83 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Summary_Supply_2017
+}
+\description{
+Summary 2017 Supply (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Summary_Supply_2018.Rd b/man/Summary_Supply_2018.Rd
new file mode 100644
index 00000000..2d9cccb9
--- /dev/null
+++ b/man/Summary_Supply_2018.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Summary_Supply_2018}
+\alias{Summary_Supply_2018}
+\title{Summary 2018 Supply (2012 schema)}
+\format{
+A dataframe with 74 obs. and 83 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Summary_Supply_2018
+}
+\description{
+Summary 2018 Supply (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Summary_Supply_2019.Rd b/man/Summary_Supply_2019.Rd
new file mode 100644
index 00000000..dcb3b062
--- /dev/null
+++ b/man/Summary_Supply_2019.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Summary_Supply_2019}
+\alias{Summary_Supply_2019}
+\title{Summary 2019 Supply (2012 schema)}
+\format{
+A dataframe with 74 obs. and 83 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Summary_Supply_2019
+}
+\description{
+Summary 2019 Supply (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Summary_Supply_2020.Rd b/man/Summary_Supply_2020.Rd
new file mode 100644
index 00000000..0b1a5062
--- /dev/null
+++ b/man/Summary_Supply_2020.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Summary_Supply_2020}
+\alias{Summary_Supply_2020}
+\title{Summary 2020 Supply (2012 schema)}
+\format{
+A dataframe with 74 obs. and 83 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Summary_Supply_2020
+}
+\description{
+Summary 2020 Supply (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Summary_Use_SUT_2010.Rd b/man/Summary_Use_SUT_2010.Rd
new file mode 100644
index 00000000..0aaaf82d
--- /dev/null
+++ b/man/Summary_Use_SUT_2010.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Summary_Use_SUT_2010}
+\alias{Summary_Use_SUT_2010}
+\title{Summary 2010 Use (2012 schema)}
+\format{
+A dataframe with 82 obs. and 92 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Summary_Use_SUT_2010
+}
+\description{
+Summary 2010 Use (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Summary_Use_SUT_2011.Rd b/man/Summary_Use_SUT_2011.Rd
new file mode 100644
index 00000000..d3395120
--- /dev/null
+++ b/man/Summary_Use_SUT_2011.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Summary_Use_SUT_2011}
+\alias{Summary_Use_SUT_2011}
+\title{Summary 2011 Use (2012 schema)}
+\format{
+A dataframe with 82 obs. and 92 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Summary_Use_SUT_2011
+}
+\description{
+Summary 2011 Use (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Summary_Use_SUT_2012.Rd b/man/Summary_Use_SUT_2012.Rd
new file mode 100644
index 00000000..632b44f4
--- /dev/null
+++ b/man/Summary_Use_SUT_2012.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Summary_Use_SUT_2012}
+\alias{Summary_Use_SUT_2012}
+\title{Summary 2012 Use (2012 schema)}
+\format{
+A dataframe with 82 obs. and 92 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Summary_Use_SUT_2012
+}
+\description{
+Summary 2012 Use (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Summary_Use_SUT_2013.Rd b/man/Summary_Use_SUT_2013.Rd
new file mode 100644
index 00000000..bfdee85c
--- /dev/null
+++ b/man/Summary_Use_SUT_2013.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Summary_Use_SUT_2013}
+\alias{Summary_Use_SUT_2013}
+\title{Summary 2013 Use (2012 schema)}
+\format{
+A dataframe with 82 obs. and 92 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Summary_Use_SUT_2013
+}
+\description{
+Summary 2013 Use (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Summary_Use_SUT_2014.Rd b/man/Summary_Use_SUT_2014.Rd
new file mode 100644
index 00000000..86e97e69
--- /dev/null
+++ b/man/Summary_Use_SUT_2014.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Summary_Use_SUT_2014}
+\alias{Summary_Use_SUT_2014}
+\title{Summary 2014 Use (2012 schema)}
+\format{
+A dataframe with 82 obs. and 92 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Summary_Use_SUT_2014
+}
+\description{
+Summary 2014 Use (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Summary_Use_SUT_2015.Rd b/man/Summary_Use_SUT_2015.Rd
new file mode 100644
index 00000000..c0196723
--- /dev/null
+++ b/man/Summary_Use_SUT_2015.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Summary_Use_SUT_2015}
+\alias{Summary_Use_SUT_2015}
+\title{Summary 2015 Use (2012 schema)}
+\format{
+A dataframe with 82 obs. and 92 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Summary_Use_SUT_2015
+}
+\description{
+Summary 2015 Use (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Summary_Use_SUT_2016.Rd b/man/Summary_Use_SUT_2016.Rd
new file mode 100644
index 00000000..e6788523
--- /dev/null
+++ b/man/Summary_Use_SUT_2016.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Summary_Use_SUT_2016}
+\alias{Summary_Use_SUT_2016}
+\title{Summary 2016 Use (2012 schema)}
+\format{
+A dataframe with 82 obs. and 92 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Summary_Use_SUT_2016
+}
+\description{
+Summary 2016 Use (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Summary_Use_SUT_2017.Rd b/man/Summary_Use_SUT_2017.Rd
new file mode 100644
index 00000000..f4ae9ad7
--- /dev/null
+++ b/man/Summary_Use_SUT_2017.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Summary_Use_SUT_2017}
+\alias{Summary_Use_SUT_2017}
+\title{Summary 2017 Use (2012 schema)}
+\format{
+A dataframe with 82 obs. and 92 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Summary_Use_SUT_2017
+}
+\description{
+Summary 2017 Use (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Summary_Use_SUT_2018.Rd b/man/Summary_Use_SUT_2018.Rd
new file mode 100644
index 00000000..4b9aedbe
--- /dev/null
+++ b/man/Summary_Use_SUT_2018.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Summary_Use_SUT_2018}
+\alias{Summary_Use_SUT_2018}
+\title{Summary 2018 Use (2012 schema)}
+\format{
+A dataframe with 82 obs. and 92 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Summary_Use_SUT_2018
+}
+\description{
+Summary 2018 Use (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Summary_Use_SUT_2019.Rd b/man/Summary_Use_SUT_2019.Rd
new file mode 100644
index 00000000..34ae960c
--- /dev/null
+++ b/man/Summary_Use_SUT_2019.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Summary_Use_SUT_2019}
+\alias{Summary_Use_SUT_2019}
+\title{Summary 2019 Use (2012 schema)}
+\format{
+A dataframe with 82 obs. and 92 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Summary_Use_SUT_2019
+}
+\description{
+Summary 2019 Use (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/Summary_Use_SUT_2020.Rd b/man/Summary_Use_SUT_2020.Rd
new file mode 100644
index 00000000..ba86687d
--- /dev/null
+++ b/man/Summary_Use_SUT_2020.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DataDocumentation.R
+\docType{data}
+\name{Summary_Use_SUT_2020}
+\alias{Summary_Use_SUT_2020}
+\title{Summary 2020 Use (2012 schema)}
+\format{
+A dataframe with 82 obs. and 92 variables
+}
+\source{
+\url{https://apps.bea.gov/industry/iTables\%20Static\%20Files/AllTablesSUP.zip}
+}
+\usage{
+Summary_Use_SUT_2020
+}
+\description{
+Summary 2020 Use (2012 schema)
+}
+\keyword{datasets}
diff --git a/man/buildEIOModel.Rd b/man/buildEIOModel.Rd
new file mode 100644
index 00000000..49abb9b0
--- /dev/null
+++ b/man/buildEIOModel.Rd
@@ -0,0 +1,20 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/BuildModel.R
+\name{buildEIOModel}
+\alias{buildEIOModel}
+\title{Build an EIO model with economic components only.}
+\usage{
+buildEIOModel(modelname, configpaths = NULL)
+}
+\arguments{
+\item{modelname}{Name of the model from a config file.}
+
+\item{configpaths}{str vector, paths (including file name) of model configuration file
+and optional agg/disagg configuration file(s). If NULL, built-in config files are used.}
+}
+\value{
+A list of EIO model with only economic components
+}
+\description{
+Build an EIO model with economic components only.
+}
diff --git a/man/calculateBasicbyProducerPriceRatio.Rd b/man/calculateBasicbyProducerPriceRatio.Rd
new file mode 100644
index 00000000..7e438521
--- /dev/null
+++ b/man/calculateBasicbyProducerPriceRatio.Rd
@@ -0,0 +1,17 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/AdjustPrice.R
+\name{calculateBasicbyProducerPriceRatio}
+\alias{calculateBasicbyProducerPriceRatio}
+\title{Calculate basic to producer price ratio.}
+\usage{
+calculateBasicbyProducerPriceRatio(model)
+}
+\arguments{
+\item{model}{A complete EEIO model: a list with USEEIO model components and attributes.}
+}
+\value{
+A dataframe of basic to producer price ratio.
+}
+\description{
+Calculate basic to producer price ratio.
+}
diff --git a/man/compareOutputfromMakeandUse.Rd b/man/compareOutputfromMakeandUse.Rd
new file mode 100644
index 00000000..6696e326
--- /dev/null
+++ b/man/compareOutputfromMakeandUse.Rd
@@ -0,0 +1,20 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/ValidateModel.R
+\name{compareOutputfromMakeandUse}
+\alias{compareOutputfromMakeandUse}
+\title{Compare commodity or industry output calculated from Make and Use tables.}
+\usage{
+compareOutputfromMakeandUse(model, output_type = "Commodity")
+}
+\arguments{
+\item{model}{A model list object with model specs and IO tables listed}
+
+\item{output_type}{A string indicating commodity or industry output.}
+}
+\value{
+A vector of relative difference between commodity or industry output
+calculated from Supply and Use tables.
+}
+\description{
+Compare commodity or industry output calculated from Make and Use tables.
+}
diff --git a/man/convertUsefromPURtoBAS.Rd b/man/convertUsefromPURtoBAS.Rd
new file mode 100644
index 00000000..111d163f
--- /dev/null
+++ b/man/convertUsefromPURtoBAS.Rd
@@ -0,0 +1,23 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/IOFunctions.R
+\name{convertUsefromPURtoBAS}
+\alias{convertUsefromPURtoBAS}
+\title{Convert Use table in the Supply-Use framework from purchasers' price (PUR)
+to basic price (BAS)}
+\usage{
+convertUsefromPURtoBAS(UseSUT_PUR, specs, io_codes)
+}
+\arguments{
+\item{UseSUT_PUR, }{a Use table (from the Supply-Use framework) in purchasers' price (PUR)}
+
+\item{specs, }{model specifications.}
+
+\item{io_codes, }{a list of BEA IO codes.}
+}
+\value{
+A Use table in basic price (BAS)
+}
+\description{
+Convert Use table in the Supply-Use framework from purchasers' price (PUR)
+to basic price (BAS)
+}
diff --git a/man/disaggregateTaxLessSubsidies.Rd b/man/disaggregateTaxLessSubsidies.Rd
new file mode 100644
index 00000000..437cf218
--- /dev/null
+++ b/man/disaggregateTaxLessSubsidies.Rd
@@ -0,0 +1,19 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/DisaggregateFunctions.R
+\name{disaggregateTaxLessSubsidies}
+\alias{disaggregateTaxLessSubsidies}
+\title{Disaggregate TaxLessSubsidies dataframe in the main model object}
+\usage{
+disaggregateTaxLessSubsidies(model, disagg)
+}
+\arguments{
+\item{model}{A complete EEIO model: a list with USEEIO model components and attributes.}
+
+\item{disagg}{Specifications for disaggregating the current Table}
+}
+\value{
+newTLS A dataframe which contain the TaxLessSubsidies including the disaggregated sectors
+}
+\description{
+Disaggregate TaxLessSubsidies dataframe in the main model object
+}
diff --git a/man/generateTaxLessSubsidiesTable.Rd b/man/generateTaxLessSubsidiesTable.Rd
new file mode 100644
index 00000000..e3cc3686
--- /dev/null
+++ b/man/generateTaxLessSubsidiesTable.Rd
@@ -0,0 +1,20 @@
+% Generated by roxygen2: do not edit by hand
+% Please edit documentation in R/IOFunctions.R
+\name{generateTaxLessSubsidiesTable}
+\alias{generateTaxLessSubsidiesTable}
+\title{Generate tax less subsidies table using BEA Supply table which include
+total product supply in basic price and tax less subsidies for all commodities}
+\usage{
+generateTaxLessSubsidiesTable(model)
+}
+\arguments{
+\item{model}{An EEIO model object with model specs and IO tables loaded}
+}
+\value{
+A data.frame containing CommodityCode, basic price, tax less subsidies,
+and producer price of total product supply
+}
+\description{
+Generate tax less subsidies table using BEA Supply table which include
+total product supply in basic price and tax less subsidies for all commodities
+}
diff --git a/man/matrices.Rd b/man/matrices.Rd
index ce07a6e6..41bdba70 100644
--- a/man/matrices.Rd
+++ b/man/matrices.Rd
@@ -5,7 +5,7 @@
\alias{matrices}
\title{The vector of matrices to write out}
\format{
-An object of class \code{character} of length 16.
+An object of class \code{character} of length 17.
}
\usage{
matrices