Skip to content

Commit

Permalink
Merge pull request #14 from JGCRI/GCAM_BYU2021
Browse files Browse the repository at this point in the history
GCAM BYU 2021
  • Loading branch information
realxinzhao authored May 23, 2024
2 parents 6f61d83 + 57dea21 commit 1870dac
Show file tree
Hide file tree
Showing 65 changed files with 8,081 additions and 2,145 deletions.
1 change: 1 addition & 0 deletions NAMESPACE
Original file line number Diff line number Diff line change
Expand Up @@ -46,6 +46,7 @@ importFrom(XML,xmlParse)
importFrom(XML,xmlToDataFrame)
importFrom(assertthat,assert_that)
importFrom(data.table,data.table)
importFrom(dplyr,add_row)
importFrom(dplyr,all_of)
importFrom(dplyr,any_of)
importFrom(dplyr,any_vars)
Expand Down
28 changes: 23 additions & 5 deletions R/constants.R
Original file line number Diff line number Diff line change
Expand Up @@ -21,13 +21,13 @@ dir.create(DIR_OUTPUT_CSV, recursive = T, showWarnings = FALSE)

# Historical years of focus ----
#*******************************************
FAOSTAT_Hist_Year <- seq(1970, 2020)
FAOSTAT_Hist_Year <- seq(1970, 2021)
#Bilateral trade year starts from 1986 but higher quality after 1992
#FAOSTAT_Hist_Year_Bilateral <- seq(1992, 2020)
FAOSTAT_Hist_Year_TMBilateral <- seq(2010, 2020)
FAOSTAT_Hist_Year_TCL <- seq(1973, 2019)
FAOSTAT_Hist_Year_TMBilateral <- seq(2010, 2021)
FAOSTAT_Hist_Year_TCL <- seq(1973, 2021)
FAOSTAT_Hist_Year_FBSH <- seq(1973, 2013)
FAOSTAT_Hist_Year_FBS <- seq(2010, 2019) # New FBS years
FAOSTAT_Hist_Year_FBS <- seq(2010, 2021) # New FBS years
MIN_HIST_PP_YEAR = 2010 # first producer price year


Expand Down Expand Up @@ -63,10 +63,28 @@ scaleFUN <- function(x) sprintf("%.0f", x)

xml.XML_SUFFIX <- NULL

#*******************************************

# Detailed forest CMP constants

aglu.FOREST_commodities <- c("sawnwood","woodpulp")
aglu.FOREST_demand_sectors <- c("NonFoodDemand_sawnwood","NonFoodDemand_woodpulp")
aglu.FOREST_supply_sector <- "Forest"
#Below is a default amount of roundwood required to produce sawnwood.The model will calculate the IO using data. This will get used if and only if
# the IO calculated by the model is an NA. This is taken as an everage across countries from a UNECE report on forest products. Available here- https://unece.org/fileadmin/DAM/timber/publications/DP-49.pdf
aglu.FOREST_sawtimber_conversion <- 2.17

#90% of pulp processing is chemical which has an IO of 5.44 and 10% is mechanical which is 2.55. Taking weighted average of the two,
# we get 5.15. These are calculated as averages across countries.
#Source- https://unece.org/fileadmin/DAM/timber/publications/DP-49.pdf
aglu.FOREST_pulp_conversion <- 5.15

aglu.FOREST_max_price <- 165

#*******************************************
#*******************************************





# ***Default constants in gcamdata ----
Expand Down
14 changes: 12 additions & 2 deletions R/driver.R
Original file line number Diff line number Diff line change
Expand Up @@ -650,7 +650,10 @@ driver_drake <- function(
chunks_to_run <- c(unfound_inputs$input, chunklist$name)
}

dir.create(xmldir, showWarnings = FALSE, recursive = TRUE)
if (write_xml == TRUE) {
dir.create(xmldir, showWarnings = FALSE, recursive = TRUE)
}


# Loop over each chunk and add a target for it and the command to build it
# as appropriate for if it is just loading a FILE or running an actual chunk.
Expand All @@ -666,10 +669,16 @@ driver_drake <- function(
# get the file details including if it was optional and the actual file name
unfound_chunk = unfound_inputs[unfound_inputs$input == chunk, ]
optional <- all(unfound_chunk$optional)
faostat <- all(unfound_chunk$faostat)
fqfn <- find_csv_file(chunk, optional, quiet = TRUE)
# add the chunk to the target list
target <- c(target, make.names(chunk))
if(is.null(fqfn)) {

if (faostat == TRUE) {
# Setting to always missing for now
command <- c(command, paste0("list('", chunk, "' = missing_data())"))
}
else if(is.null(fqfn)) {
assert_that(optional)
# In the case of optional missing data just set it to missing with command:
# `target <- list( chunk = missing_data() )`
Expand Down Expand Up @@ -704,6 +713,7 @@ driver_drake <- function(
# different than in driver where we give `all_data`, again this is for drake so it
# can match up target names to commands and develop the dependencies between them.
nsprefix <- if_else(chunk %in% user_modifications, "", paste0(PACKAGE_NAME, ":::"))

command <- c(command, paste0(nsprefix, chunk, "('", driver.MAKE, "', c(", paste(make.names(input_names), collapse = ","), "))"))

# A chunk should in principle generate many output targets however drake assumes
Expand Down
2 changes: 1 addition & 1 deletion R/utils-data.R
Original file line number Diff line number Diff line change
Expand Up @@ -276,7 +276,7 @@ get_data_list <- function(all_data, data_list, strip_attributes = FALSE, environ
curr_var_name <- data_list[i]
# the variable name to assign for FILE is the "basename" of the file
# i.e. `FILE = "common/GCAM_region_names"` will result in `GCAM_region_names` being set
if(!is.null(data_list_names) && data_list_names[i] %in% c("FILE", "OPTIONAL_FILE")) {
if(!is.null(data_list_names) && data_list_names[i] %in% c("FILE", "OPTIONAL_FILE", "FAOSTAT_FILE")) {
# Note: strsplit returns a list (one per each str to be split) of character vector
# (one for each token split out). Given we are split one string at a time
# we will just grab the first element of the list (`[[1]]`)
Expand Down
17 changes: 12 additions & 5 deletions R/utils.R
Original file line number Diff line number Diff line change
Expand Up @@ -255,7 +255,7 @@ find_csv_file <- function(filename, optional, quiet = FALSE) {
assert_that(is.logical(optional))
assert_that(is.logical(quiet))

extensions <- c(".csv", ".csv.gz", "")
extensions <- c(".csv", ".csv.gz", ".zip", "")
for(ex in extensions) {
fqfn <- system.file("extdata", paste0(filename, ex), package = PACKAGE_NAME)
if(fqfn != "") {
Expand Down Expand Up @@ -438,6 +438,7 @@ chunk_inputs <- function(chunks = find_chunks()$name, call_flag = driver.DECLARE
inputs <- character()
from_files <- logical()
optionals <- logical()
faostats <- logical()
for(ch in chunks) {
cl <- call(ch, call_flag)
reqdata <- eval(cl)
Expand All @@ -446,18 +447,21 @@ chunk_inputs <- function(chunks = find_chunks()$name, call_flag = driver.DECLARE
if(is.null(names(reqdata))) {
file_inputs <- rep(FALSE, times = length(reqdata))
optional_file_inputs <- rep(FALSE, times = length(reqdata))
faostat_file_inputs <- rep(FALSE, times = length(reqdata))
} else {
file_inputs <- names(reqdata) %in% c("FILE", "OPTIONAL_FILE")
optional_file_inputs <- names(reqdata) == "OPTIONAL_FILE"
file_inputs <- names(reqdata) %in% c("FILE", "OPTIONAL_FILE", "FAOSTAT_FILE")
optional_file_inputs <- names(reqdata) %in% c("OPTIONAL_FILE", "FAOSTAT_FILE")
faostat_file_inputs <- names(reqdata) == "FAOSTAT_FILE"
}
if(!is.null(reqdata)) {
chunk_names <- c(chunk_names, rep(ch, times = length(reqdata)))
inputs <- c(inputs, as.vector(unlist(reqdata)))
from_files <- c(from_files, file_inputs)
optionals <- c(optionals, optional_file_inputs)
faostats <- c(faostats, faostat_file_inputs)
}
}
tibble(name = chunk_names, input = inputs, from_file = from_files, optional = optionals)
tibble(name = chunk_names, input = inputs, from_file = from_files, optional = optionals, faostat = faostats)
}


Expand Down Expand Up @@ -488,6 +492,7 @@ chunk_outputs <- function(chunks = find_chunks()$name, call_flag = driver.DECLAR
chunk_names <- character()
outputs <- character()
to_xmls <- logical()
to_csvs <- logical()
for(ch in chunks) {
cl <- call(ch, call_flag)
reqdata <- eval(cl)
Expand All @@ -497,14 +502,16 @@ chunk_outputs <- function(chunks = find_chunks()$name, call_flag = driver.DECLAR
fileoutputs <- rep(FALSE, times = length(reqdata))
} else {
fileoutputs <- names(reqdata) == "XML"
fileoutputs <- names(reqdata) == "CSV"
}
if(!is.null(reqdata)) {
chunk_names <- c(chunk_names, rep(ch, times = length(reqdata)))
outputs <- c(outputs, as.vector(unlist(reqdata)))
to_xmls <- c(to_xmls, fileoutputs)
to_csvs <- c(to_csvs, fileoutputs)
}
}
tibble(name = chunk_names, output = outputs, to_xml = to_xmls)
tibble(name = chunk_names, output = outputs, to_xml = to_xmls, to_csv = to_csvs)
}

#' outputs_of
Expand Down
6 changes: 3 additions & 3 deletions R/xfaostat_L101_RawDataPreProc1_QCL.R
Original file line number Diff line number Diff line change
Expand Up @@ -18,7 +18,7 @@
module_xfaostat_L101_RawDataPreProc1_QCL <- function(command, ...) {

MODULE_INPUTS <-
c(OPTIONAL_FILE = "aglu/FAO/FAOSTAT/Trade_CropsLivestock_E_All_Data_(Normalized)_PalceHolder")
c(FAOSTAT_FILE = "aglu/FAO/FAOSTAT/Trade_CropsLivestock_E_All_Data_Normalized")

MODULE_OUTPUTS <-
c("QCL_wide", # Ag production quantity and harvested area
Expand Down Expand Up @@ -92,14 +92,14 @@ module_xfaostat_L101_RawDataPreProc1_QCL <- function(command, ...) {
add_title("FAO primary production country and code") %>%
add_units("NA") %>%
add_comments("FAO Country and code") %>%
add_precursors("aglu/FAO/FAOSTAT/Trade_CropsLivestock_E_All_Data_(Normalized)_PalceHolder") ->
add_precursors("aglu/FAO/FAOSTAT/Trade_CropsLivestock_E_All_Data_Normalized") ->
QCL_area_code_map

QCL_wide %>%
add_title("FAO primary production (QCL)", overwrite = TRUE) %>%
add_units("ha/tonne") %>%
add_comments("Preprocessed FAOSTAT primary production") %>%
add_precursors("aglu/FAO/FAOSTAT/Trade_CropsLivestock_E_All_Data_(Normalized)_PalceHolder") ->
add_precursors("aglu/FAO/FAOSTAT/Trade_CropsLivestock_E_All_Data_Normalized") ->
QCL_wide

verify_identical_prebuilt(QCL_area_code_map)
Expand Down
16 changes: 8 additions & 8 deletions R/xfaostat_L101_RawDataPreProc2_PP_PD_OA.R
Original file line number Diff line number Diff line change
Expand Up @@ -18,9 +18,9 @@
module_xfaostat_L101_RawDataPreProc2_PP_PD_OA <- function(command, ...) {

MODULE_INPUTS <-
c(OPTIONAL_FILE = "aglu/FAO/FAOSTAT/Prices_E_All_Data_(Normalized)_PalceHolder",
OPTIONAL_FILE = "aglu/FAO/FAOSTAT/Deflators_E_All_Data_(Normalized)_PalceHolder",
OPTIONAL_FILE = "aglu/FAO/FAOSTAT/Population_E_All_Data_(Normalized)_PalceHolder",
c(FAOSTAT_FILE = "aglu/FAO/FAOSTAT/Prices_E_All_Data_Normalized",
FAOSTAT_FILE = "aglu/FAO/FAOSTAT/Deflators_E_All_Data_Normalized",
FAOSTAT_FILE = "aglu/FAO/FAOSTAT/Population_E_All_Data_Normalized",
FILE = "aglu/FAO/FAOSTAT/Other_supplementary/GDP_deflator_Taiwan",
"QCL_area_code_map")

Expand Down Expand Up @@ -125,7 +125,7 @@ module_xfaostat_L101_RawDataPreProc2_PP_PD_OA <- function(command, ...) {
add_units("USD/tonne") %>%
add_comments("Preprocessed FAOSTAT producer prices") %>%
add_precursors("QCL_area_code_map",
"aglu/FAO/FAOSTAT/Prices_E_All_Data_(Normalized)_PalceHolder") ->
"aglu/FAO/FAOSTAT/Prices_E_All_Data_Normalized") ->
PP_wide
verify_identical_prebuilt(PP_wide)

Expand All @@ -140,7 +140,7 @@ module_xfaostat_L101_RawDataPreProc2_PP_PD_OA <- function(command, ...) {
PD %>% distinct(item, item_code)

PD %>% filter(
year %in% FAOSTAT_Hist_Year,
year >= min(FAOSTAT_Hist_Year),
area_code < 350,
area_code %in% QCL_area_code,
# only keep regions with production
Expand Down Expand Up @@ -178,7 +178,7 @@ module_xfaostat_L101_RawDataPreProc2_PP_PD_OA <- function(command, ...) {
add_units("Unitless") %>%
add_comments("Preprocessed FAOSTAT regional gdp deflators") %>%
add_precursors("QCL_area_code_map",
"aglu/FAO/FAOSTAT/Deflators_E_All_Data_(Normalized)_PalceHolder",
"aglu/FAO/FAOSTAT/Deflators_E_All_Data_Normalized",
"aglu/FAO/FAOSTAT/Other_supplementary/GDP_deflator_Taiwan") ->
PD

Expand Down Expand Up @@ -211,8 +211,8 @@ module_xfaostat_L101_RawDataPreProc2_PP_PD_OA <- function(command, ...) {
OA1 %>%
add_title("FAO population") %>%
add_units("tonne") %>%
add_comments("Preprocessed FAO OA") %>%
add_precursors("aglu/FAO/FAOSTAT/Population_E_All_Data_(Normalized)_PalceHolder") ->
add_comments("Preprocessed FAO OA") %>%
add_precursors("aglu/FAO/FAOSTAT/Population_E_All_Data_Normalized") ->
OA

verify_identical_prebuilt(OA)
Expand Down
8 changes: 4 additions & 4 deletions R/xfaostat_L101_RawDataPreProc3_SCL_FBS.R
Original file line number Diff line number Diff line change
Expand Up @@ -18,8 +18,8 @@
module_xfaostat_L101_RawDataPreProc3_SCL_FBS <- function(command, ...) {

MODULE_INPUTS <-
c(OPTIONAL_FILE = "aglu/FAO/FAOSTAT/SUA_Crops_Livestock_E_All_Data_(Normalized)_PalceHolder",
OPTIONAL_FILE = "aglu/FAO/FAOSTAT/FoodBalanceSheets_E_All_Data_(Normalized)_PalceHolder",
c(FAOSTAT_FILE = "aglu/FAO/FAOSTAT/SUA_Crops_Livestock_E_All_Data_Normalized",
FAOSTAT_FILE = "aglu/FAO/FAOSTAT/FoodBalanceSheets_E_All_Data_Normalized",
"QCL_area_code_map")

MODULE_OUTPUTS <-
Expand Down Expand Up @@ -108,7 +108,7 @@ module_xfaostat_L101_RawDataPreProc3_SCL_FBS <- function(command, ...) {
add_title("FAO supply utilization account dataset, 2010+, wide") %>%
add_units("tonne") %>%
add_comments("Preprocessed FAOSTAT SCL") %>%
add_precursors("aglu/FAO/FAOSTAT/SUA_Crops_Livestock_E_All_Data_(Normalized)_PalceHolder",
add_precursors("aglu/FAO/FAOSTAT/SUA_Crops_Livestock_E_All_Data_Normalized",
"QCL_area_code_map") ->
SCL_wide

Expand Down Expand Up @@ -147,7 +147,7 @@ module_xfaostat_L101_RawDataPreProc3_SCL_FBS <- function(command, ...) {
add_title("FAO food balance sheet, 2010-") %>%
add_units("1000 tonne") %>%
add_comments("Preprocessed FAOSTAT SCL") %>%
add_precursors("aglu/FAO/FAOSTAT/FoodBalanceSheets_E_All_Data_(Normalized)_PalceHolder",
add_precursors("aglu/FAO/FAOSTAT/FoodBalanceSheets_E_All_Data_Normalized",
"QCL_area_code_map") ->
FBS_wide

Expand Down
10 changes: 6 additions & 4 deletions R/xfaostat_L101_RawDataPreProc4_FBSH_CB.R
Original file line number Diff line number Diff line change
Expand Up @@ -18,8 +18,8 @@
module_xfaostat_L101_RawDataPreProc4_FBSH_CB <- function(command, ...) {

MODULE_INPUTS <-
c(OPTIONAL_FILE = "aglu/FAO/FAOSTAT/FoodBalanceSheetsHistoric_E_All_Data_(Normalized)_PalceHolder",
OPTIONAL_FILE = "aglu/FAO/FAOSTAT/CommodityBalances_(non-food)_E_All_Data_(Normalized)_PalceHolder",
c(FAOSTAT_FILE = "aglu/FAO/FAOSTAT/FoodBalanceSheetsHistoric_E_All_Data_Normalized",
FAOSTAT_FILE = "aglu/FAO/FAOSTAT/CommodityBalances_(non-food)_E_All_Data_Normalized",
"QCL_area_code_map")

MODULE_OUTPUTS <-
Expand Down Expand Up @@ -86,6 +86,8 @@ module_xfaostat_L101_RawDataPreProc4_FBSH_CB <- function(command, ...) {

FAOSTAT_load_raw_data("CB", .Envir = Curr_Envir) # Old FBS-nonfood -2013

assertthat::assert_that(CB %>% pull(year) %>% max <= 2013)

CB %>% distinct(element, element_code, unit)
# Keep population (old)
CB %>% filter(item_code < 2901,
Expand Down Expand Up @@ -181,8 +183,8 @@ module_xfaostat_L101_RawDataPreProc4_FBSH_CB <- function(command, ...) {
add_title("FAO FBSH and CB, food and commodity balance before 2013, wide", overwrite = T) %>%
add_units("1000 tonne") %>%
add_comments("Preprocessed FAO FBSH_CB") %>%
add_precursors("aglu/FAO/FAOSTAT/FoodBalanceSheetsHistoric_E_All_Data_(Normalized)_PalceHolder",
"aglu/FAO/FAOSTAT/CommodityBalances_(non-food)_E_All_Data_(Normalized)_PalceHolder",
add_precursors("aglu/FAO/FAOSTAT/FoodBalanceSheetsHistoric_E_All_Data_Normalized",
"aglu/FAO/FAOSTAT/CommodityBalances_(non-food)_E_All_Data_Normalized",
"QCL_area_code_map") ->
FBSH_CB_wide

Expand Down
4 changes: 2 additions & 2 deletions R/xfaostat_L101_RawDataPreProc5_TCL.R
Original file line number Diff line number Diff line change
Expand Up @@ -18,7 +18,7 @@
module_xfaostat_L101_RawDataPreProc5_TCL <- function(command, ...) {

MODULE_INPUTS <-
c(OPTIONAL_FILE = "aglu/FAO/FAOSTAT/Trade_CropsLivestock_E_All_Data_(Normalized)_PalceHolder",
c(FAOSTAT_FILE = "aglu/FAO/FAOSTAT/Trade_CropsLivestock_E_All_Data_Normalized",
"QCL_area_code_map")

MODULE_OUTPUTS <-
Expand Down Expand Up @@ -75,7 +75,7 @@ module_xfaostat_L101_RawDataPreProc5_TCL <- function(command, ...) {
add_title("FAO TCL") %>%
add_units("tonne") %>%
add_comments("Preprocessed FAO TCL") %>%
add_precursors("aglu/FAO/FAOSTAT/Trade_CropsLivestock_E_All_Data_(Normalized)_PalceHolder",
add_precursors("aglu/FAO/FAOSTAT/Trade_CropsLivestock_E_All_Data_Normalized",
"QCL_area_code_map") ->
TCL_wide

Expand Down
14 changes: 2 additions & 12 deletions R/xfaostat_L101_RawDataPreProc6_TM.R
Original file line number Diff line number Diff line change
Expand Up @@ -18,7 +18,7 @@
module_xfaostat_L101_RawDataPreProc6_TM <- function(command, ...) {

MODULE_INPUTS <-
c(OPTIONAL_FILE = "aglu/FAO/FAOSTAT/Trade_DetailedTradeMatrix_E_All_Data_(Normalized)_PalceHolder",
c(FAOSTAT_FILE = "aglu/FAO/FAOSTAT/Trade_DetailedTradeMatrix_E_All_Data_Normalized",
"QCL_area_code_map")

MODULE_OUTPUTS <-
Expand Down Expand Up @@ -121,7 +121,7 @@ module_xfaostat_L101_RawDataPreProc6_TM <- function(command, ...) {
add_title("FAO bilateral trade (TM)", overwrite = T) %>%
add_units("tonne") %>%
add_comments("Preprocessed FAO TM_wide") %>%
add_precursors("aglu/FAO/FAOSTAT/Trade_DetailedTradeMatrix_E_All_Data_(Normalized)_PalceHolder",
add_precursors("aglu/FAO/FAOSTAT/Trade_DetailedTradeMatrix_E_All_Data_Normalized",
"QCL_area_code_map") ->
TM_bilateral_wide

Expand All @@ -137,14 +137,4 @@ module_xfaostat_L101_RawDataPreProc6_TM <- function(command, ...) {
}
}

# FAOSTAT_RDS <- c("TM_bilateral_wide")
#
# DIR_PREBUILT_FAOSTAT <- "data"
#
# lapply(FAOSTAT_RDS, function(d){
# assertthat::assert_that(file.exists(file.path(DIR_PREBUILT_FAOSTAT, paste0(d, ".rds"))))
# assign(d, readRDS(file.path(DIR_PREBUILT_FAOSTAT, paste0(d, ".rds"))),
# envir = parent.env(environment()))
# })


Loading

0 comments on commit 1870dac

Please sign in to comment.