Skip to content

Commit

Permalink
Merge pull request JGCRI#181 in JGCRI/gcam-core from gpk/bugfix/ddgs-…
Browse files Browse the repository at this point in the history
…prices-shareweights to master

* commit '78822386206e5ace5e4778135505699b70fe930b':
  Update GCAM_DATA_MAP
  update to documentation, sysdata.rda, address package check issues
  apply an interpolation rule to DDGS and feedcakes share-weights (s-curve from final cal year to 1 in 2150) * required adding capability to specify interpolation "to-value" for A_an_input_subsector
  * implement region-specific DDGS and feedcakes prices in the historical years (wasn't being properly computed or applied before) * prices are calculated from weighted average FeedCrops prices in each region
  re-assign biodiesel feedstocks from OilCrop to PalmFruit in regions with (a) sugar cane ethanol and (b) zero biodiesel production in the final calibration year
  • Loading branch information
pralitp committed Nov 5, 2020
2 parents ca25a91 + 7882238 commit 7ac3011
Show file tree
Hide file tree
Showing 9 changed files with 108 additions and 58 deletions.
47 changes: 42 additions & 5 deletions input/gcamdata/R/zchunk_L202.an_input.R
Original file line number Diff line number Diff line change
Expand Up @@ -56,6 +56,7 @@ module_aglu_L202.an_input <- function(command, ...) {
"L202.UnlimitedRenewRsrcPrice",
"L202.Supplysector_in",
"L202.SubsectorAll_in",
"L202.SubsectorInterpTo_in",
"L202.StubTech_in",
"L202.StubTechInterp_in",
"L202.GlobalTechCoef_in",
Expand All @@ -67,7 +68,8 @@ module_aglu_L202.an_input <- function(command, ...) {
"L202.StubTechInterp_an",
"L202.StubTechProd_an",
"L202.StubTechCoef_an",
"L202.StubTechCost_an"
"L202.StubTechCost_an",
"L202.ag_consP_R_C_75USDkg"
))
} else if(command == driver.MAKE) {

Expand All @@ -81,7 +83,7 @@ module_aglu_L202.an_input <- function(command, ...) {
FeedCost_USDkg <- nonFeedCost <- NetExp_Mt <- share.weight.year <- fixedOutput <- ethanol <-
biomassOil_tech <- biodiesel <- resource <- subresource <- default_price <- revenue <-
weight <- SalesRevenue_bilUSD <- tradedP <- Exp_wtd_price <- ImpShare <- PrP <- GrossExp_Mt <-
GrossImp_Mt <- Supply_Mt <- ChinaCommodityPrice_USDkg <- DefaultCommodityPrice_USDkg <- NULL # silence package check notes
Supply_Mt <- GrossImp_Mt <- ChinaCommodityPrice_USDkg <- to.value <- DefaultCommodityPrice_USDkg <- NULL # silence package check notes

# Load required inputs
GCAM_region_names <- get_data(all_data, "common/GCAM_region_names")
Expand All @@ -100,7 +102,7 @@ module_aglu_L202.an_input <- function(command, ...) {
L132.ag_an_For_Prices <- get_data(all_data, "L132.ag_an_For_Prices")
L109.ag_ALL_Mt_R_C_Y <- get_data(all_data, "L109.ag_ALL_Mt_R_C_Y")
L1091.GrossTrade_Mt_R_C_Y <- get_data(all_data, "L1091.GrossTrade_Mt_R_C_Y")
L1321.ag_prP_R_C_75USDkg <- get_data(all_data, "L1321.ag_prP_R_C_75USDkg")
L1321.ag_prP_R_C_75USDkg <- get_data(all_data, "L1321.ag_prP_R_C_75USDkg", strip_attributes = TRUE)
L1321.an_prP_R_C_75USDkg <- get_data(all_data, "L1321.an_prP_R_C_75USDkg")

# 2. Build tables
Expand Down Expand Up @@ -198,6 +200,14 @@ module_aglu_L202.an_input <- function(command, ...) {
write_to_all_regions(c(LEVEL2_DATA_NAMES[["SubsectorAll"]], LOGIT_TYPE_COLNAME), GCAM_region_names) ->
L202.SubsectorAll_in

# If any subsectors have a to-value provided, generate another table: L202.SubsectorInterpTo_in
if(any(!is.na(A_an_input_subsector$to.value))) {
A_an_input_subsector %>%
filter(!is.na(to.value)) %>%
write_to_all_regions(LEVEL2_DATA_NAMES[["SubsectorInterpTo"]], GCAM_region_names = GCAM_region_names) ->
L202.SubsectorInterpTo_in
}

# L202.StubTech_in: identification of stub technologies for inputs to animal production (124-140)
A_an_input_technology %>%
write_to_all_regions(LEVEL2_DATA_NAMES[["Tech"]], GCAM_region_names) %>%
Expand Down Expand Up @@ -479,6 +489,12 @@ module_aglu_L202.an_input <- function(command, ...) {
filter(!region %in% aglu.NO_AGLU_REGIONS) %>%
anti_join(L202.no_ddgs_regions_subs, by = c("region", "supplysector", "subsector")) ->
L202.SubsectorAll_in
if(exists("L202.SubsectorInterpTo_in")){
L202.SubsectorInterpTo_in %>%
filter(!region %in% aglu.NO_AGLU_REGIONS) %>%
anti_join(L202.no_ddgs_regions_subs, by = c("region", "supplysector", "subsector")) ->
L202.SubsectorInterpTo_in
}
L202.StubTech_in %>%
filter(!region %in% aglu.NO_AGLU_REGIONS) %>%
anti_join(L202.no_ddgs_regions_subs, by = c("region", "supplysector", "subsector", "stub.technology" = "technology")) ->
Expand Down Expand Up @@ -571,6 +587,19 @@ module_aglu_L202.an_input <- function(command, ...) {
add_precursors("aglu/A_an_input_subsector", "energy/A_regions", "common/GCAM_region_names") ->
L202.SubsectorAll_in

if(exists("L202.SubsectorInterpTo_in")) {
L202.SubsectorInterpTo_in %>%
add_title("Subsector interpolation rules with to-value specified") %>%
add_units("NA") %>%
add_comments("From A_an_input_subsector, written to all regions if used") %>%
same_precursors_as(L202.SubsectorAll_in) ->
L202.SubsectorInterpTo_in
} else {
missing_data() %>%
add_comments("Empty data table") ->
L202.SubsectorInterpTo_in
}

L202.StubTech_in %>%
add_title("Identification of stub technologies for inputs to animal production") %>%
add_units("NA") %>%
Expand Down Expand Up @@ -672,14 +701,22 @@ module_aglu_L202.an_input <- function(command, ...) {
"L107.an_Feed_Mt_R_C_Sys_Fd_Y", "L1091.GrossTrade_Mt_R_C_Y", "L109.ag_ALL_Mt_R_C_Y") ->
L202.StubTechCost_an

# Return also the consumer prices, to be made available elsewhere
L202.ag_consP_R_C_75USDkg %>%
add_title("Consumer costs of crops") %>%
add_units("1975$/kg") %>%
add_comments("Computed from weighted average of domestically sourced crops (which use producer prices) and imports") %>%
add_comments("Imported crop prices are computed from weighted average of producer prices of exporting countries") %>%
add_precursors("L1321.ag_prP_R_C_75USDkg", "L109.ag_ALL_Mt_R_C_Y", "L1091.GrossTrade_Mt_R_C_Y") ->
L202.ag_consP_R_C_75USDkg


return_data(L202.RenewRsrc, L202.RenewRsrcPrice, L202.maxSubResource, L202.RenewRsrcCurves, L202.ResTechShrwt,
L202.UnlimitedRenewRsrcCurves, L202.UnlimitedRenewRsrcPrice, L202.Supplysector_in,
L202.SubsectorAll_in, L202.StubTech_in, L202.StubTechInterp_in, L202.GlobalTechCoef_in,
L202.SubsectorAll_in, L202.SubsectorInterpTo_in, L202.StubTech_in, L202.StubTechInterp_in, L202.GlobalTechCoef_in,
L202.GlobalTechShrwt_in, L202.StubTechProd_in, L202.Supplysector_an, L202.SubsectorAll_an,
L202.GlobalTechShrwt_an, L202.StubTechInterp_an, L202.StubTechProd_an, L202.StubTechCoef_an,
L202.StubTechCost_an)
L202.StubTechCost_an, L202.ag_consP_R_C_75USDkg)
} else {
stop("Unknown command")
}
Expand Down
43 changes: 16 additions & 27 deletions input/gcamdata/R/zchunk_L221.en_supply.R
Original file line number Diff line number Diff line change
Expand Up @@ -43,7 +43,7 @@ module_energy_L221.en_supply <- function(command, ...) {
"L122.in_Mt_R_C_Yh",
FILE = "aglu/A_an_input_subsector",
"L108.ag_Feed_Mt_R_C_Y",
"L132.ag_an_For_Prices"))
"L202.ag_consP_R_C_75USDkg"))
} else if(command == driver.DECLARE_OUTPUTS) {
return(c("L221.Supplysector_en",
"L221.SectorUseTrialMarket_en",
Expand Down Expand Up @@ -82,7 +82,7 @@ module_energy_L221.en_supply <- function(command, ...) {
object <- output.ratio <- output.unit <- price <- price.unit <- primary.consumption <-
region <- sector <- sector.name <- share.weight <- stub.technology <- subsector <-
subsector.name <- subsector.share.weight <- supplysector <- technology <-
to.value <- tradbio_region <- traded <- unit <- value <- value_2010 <- variable <- year <-
to.value <- tradbio_region <- traded <- unit <- value <- value_fby <- variable <- year <-
year.fillout <- year.share.weight <- GCAM_commodity <- GCAM_region_ID <-
GCAM_region_ID.x <- GCAM_region_ID.y <- P0 <- calibrated.value <- tech.share.weight <-
market.name <- passthru_tech_input <- SecOutRatio <- IOcoef <- NULL
Expand Down Expand Up @@ -113,7 +113,7 @@ module_energy_L221.en_supply <- function(command, ...) {
L122.in_Mt_R_C_Yh <- get_data(all_data, "L122.in_Mt_R_C_Yh", strip_attributes = TRUE)
A_an_input_subsector <- get_data(all_data, "aglu/A_an_input_subsector")
L108.ag_Feed_Mt_R_C_Y <- get_data(all_data, "L108.ag_Feed_Mt_R_C_Y")
L132.ag_an_For_Prices <- get_data(all_data, "L132.ag_an_For_Prices")
L202.ag_consP_R_C_75USDkg <- get_data(all_data, "L202.ag_consP_R_C_75USDkg")

# ===================================================

Expand Down Expand Up @@ -312,22 +312,21 @@ module_energy_L221.en_supply <- function(command, ...) {
# Subset (filter) only the feed items that have tracked prices (i.e., don't include DDGS and feedcakes in this calc)
L108.ag_Feed_Mt_R_C_Y %>%
filter(GCAM_commodity %in% A_an_input_subsector$subsector,
GCAM_commodity %in% L132.ag_an_For_Prices$GCAM_commodity) -> L221.ag_Feed_Mt_R_C_Y
GCAM_commodity %in% L202.ag_consP_R_C_75USDkg$GCAM_commodity) -> L221.ag_Feed_Mt_R_C_Y

L221.ag_Feed_Mt_R_C_Y %>%
filter(year == max(HISTORICAL_YEARS)) %>%
group_by(GCAM_region_ID) %>%
summarise(value_2010 = sum(value)) %>%
summarise(value_fby = sum(value)) %>%
ungroup() -> L221.ag_Feed_Mt_R_Yf

L221.ag_Feed_Mt_R_C_Y %>%
filter(year == max(HISTORICAL_YEARS)) %>%
left_join(L221.ag_Feed_Mt_R_Yf, by = c("GCAM_region_ID")) %>%
mutate(value = value / value_2010) %>%
mutate(value = value / value_fby) %>%
select(GCAM_region_ID, GCAM_commodity, year, value) %>%
left_join(L132.ag_an_For_Prices %>%
select(-unit), by = c("GCAM_commodity")) %>%
rename(price = calPrice) %>%
left_join(rename(L202.ag_consP_R_C_75USDkg, price = value),
by = c("GCAM_region_ID", "GCAM_commodity")) %>%
mutate(feed_price = price * value) -> L221.ag_FeedShares_R_C_Yf

L221.ag_FeedShares_R_C_Yf %>%
Expand Down Expand Up @@ -365,20 +364,10 @@ module_energy_L221.en_supply <- function(command, ...) {
select(region, resource, output.unit = "output-unit", price.unit = "price-unit", market) %>%
mutate(market = region) -> L221.Rsrc_en

A21.rsrc_info %>%
select(resource, market, output.unit = "output-unit", price.unit = "price-unit") %>%
repeat_add_columns(tibble(year = c(HISTORICAL_YEARS))) %>%
left_join(A21.rsrc_info %>%
gather(year, value, -resource, -market, -"output-unit", -"price-unit") %>%
rename(output.unit = "output-unit", price.unit = "price-unit") %>%
mutate(year = as.numeric(year)), by = c("year", "resource", "market", "output.unit", "price.unit")) %>%
group_by(resource, market, output.unit, price.unit) %>%
mutate(price = round(approx_fun(year, value, rule = 1), digits = energy.DIGITS_COST)) %>%
ungroup() %>%
filter(year %in% MODEL_YEARS) %>%
select(-value) %>%
repeat_add_columns(L221.ddgs_regions) %>%
select(region, resource, year, price) -> L221.RsrcPrice_en
# Resource prices are copied from the fractional secondary output calPrice
L221.StubTechFractCalPrice_en %>%
select(region, resource = fractional.secondary.output, year, price = calPrice) ->
L221.RsrcPrice_en

# Coefficients of traded technologies
A21.tradedtech_coef %>%
Expand Down Expand Up @@ -709,16 +698,16 @@ module_energy_L221.en_supply <- function(command, ...) {
L221.StubTechFractProd_en %>%
add_title("Price and production fraction for secondary feed outputs") %>%
add_units("1975$, fraction") %>%
add_comments("Prices, production of feed output from L108.ag_Feed_Mt_R_C_Y and L132.ag_an_For_Prices") %>%
add_comments("Prices, production of feed output from L108.ag_Feed_Mt_R_C_Y and L202.ag_consP_R_C_75USDkg") %>%
add_legacy_name("L221.StubTechFractProd_en") %>%
add_precursors("L108.ag_Feed_Mt_R_C_Y", "L132.ag_an_For_Prices", "aglu/A_an_input_subsector") ->
add_precursors("L108.ag_Feed_Mt_R_C_Y", "L202.ag_consP_R_C_75USDkg", "aglu/A_an_input_subsector") ->
L221.StubTechFractProd_en

L221.StubTechFractCalPrice_en %>%
add_title("Calibrated prices of secondary outputs of feed from energy technologies (DDGS and feedcakes)") %>%
add_units("1975$/kg") %>%
add_comments("Value only relevant for share-weight calculation") %>%
add_precursors("L108.ag_Feed_Mt_R_C_Y", "L132.ag_an_For_Prices", "aglu/A_an_input_subsector") ->
add_precursors("L108.ag_Feed_Mt_R_C_Y", "L202.ag_consP_R_C_75USDkg", "aglu/A_an_input_subsector") ->
L221.StubTechFractCalPrice_en

L221.Rsrc_en %>%
Expand All @@ -734,7 +723,7 @@ module_energy_L221.en_supply <- function(command, ...) {
add_units("1975$") %>%
add_comments("A21.rsrc_info interpolated to all historical model time periods") %>%
add_legacy_name("L221.RsrcPrice_en") %>%
add_precursors("energy/A21.rsrc_info") ->
same_precursors_as(L221.StubTechFractCalPrice_en) ->
L221.RsrcPrice_en

L221.TechCoef_en_Traded %>%
Expand Down
4 changes: 4 additions & 0 deletions input/gcamdata/R/zchunk_batch_an_input_xml.R
Original file line number Diff line number Diff line change
Expand Up @@ -21,6 +21,7 @@ module_aglu_batch_an_input_xml <- function(command, ...) {
"L202.UnlimitedRenewRsrcPrice",
"L202.Supplysector_in",
"L202.SubsectorAll_in",
"L202.SubsectorInterpTo_in",
"L202.StubTech_in",
"L202.StubTechInterp_in",
"L202.GlobalTechCoef_in",
Expand Down Expand Up @@ -50,6 +51,7 @@ module_aglu_batch_an_input_xml <- function(command, ...) {
L202.UnlimitedRenewRsrcPrice <- get_data(all_data, "L202.UnlimitedRenewRsrcPrice")
L202.Supplysector_in <- get_data(all_data, "L202.Supplysector_in")
L202.SubsectorAll_in <- get_data(all_data, "L202.SubsectorAll_in")
L202.SubsectorInterpTo_in <- get_data(all_data, "L202.SubsectorInterpTo_in")
L202.StubTech_in <- get_data(all_data, "L202.StubTech_in")
L202.StubTechInterp_in <- get_data(all_data, "L202.StubTechInterp_in")
L202.GlobalTechCoef_in <- get_data(all_data, "L202.GlobalTechCoef_in")
Expand Down Expand Up @@ -79,6 +81,7 @@ module_aglu_batch_an_input_xml <- function(command, ...) {
add_xml_data(L202.UnlimitedRenewRsrcPrice, "UnlimitRsrcPrice") %>%
add_logit_tables_xml(L202.Supplysector_in, "Supplysector") %>%
add_logit_tables_xml(L202.SubsectorAll_in, "SubsectorAll", "SubsectorLogit") %>%
add_xml_data(L202.SubsectorInterpTo_in, "SubsectorInterpTo") %>%
add_xml_data(L202.StubTech_in, "StubTech") %>%
add_xml_data(L202.StubTechInterp_in, "StubTechInterp") %>%
add_xml_data(L202.GlobalTechCoef_in, "GlobalTechCoef") %>%
Expand All @@ -100,6 +103,7 @@ module_aglu_batch_an_input_xml <- function(command, ...) {
"L202.UnlimitedRenewRsrcPrice",
"L202.Supplysector_in",
"L202.SubsectorAll_in",
"L202.SubsectorInterpTo_in",
"L202.StubTech_in",
"L202.StubTechInterp_in",
"L202.GlobalTechCoef_in",
Expand Down
Binary file modified input/gcamdata/data/GCAM_DATA_MAP.rda
Binary file not shown.
36 changes: 18 additions & 18 deletions input/gcamdata/inst/extdata/aglu/A_an_input_subsector.csv
Original file line number Diff line number Diff line change
Expand Up @@ -2,22 +2,22 @@
# Title: Subsectors of inputs to animal production
# Units: Various
# Source: NA
# Column types: cciciccccc
# Column types: ccicicccccc
# ----------
supplysector,subsector,logit.exponent,year.fillout,share.weight,apply.to,from.year,to.year,interpolation.function,logit.type
FodderHerb_Residue,FodderHerb,-6,start-year,1,share-weight,final-calibration-year,end-year,fixed,
FodderHerb_Residue,Residue,-6,start-year,1,share-weight,final-calibration-year,end-year,fixed,
Pasture_FodderGrass,Pasture,-6,start-year,1,share-weight,final-calibration-year,end-year,fixed,
Pasture_FodderGrass,FodderGrass,-6,start-year,1,share-weight,final-calibration-year,end-year,fixed,
FeedCrops,Corn,-6,start-year,1,share-weight,final-calibration-year,end-year,fixed,
FeedCrops,FiberCrop,-6,start-year,1,share-weight,final-calibration-year,end-year,fixed,
FeedCrops,MiscCrop,-6,start-year,1,share-weight,final-calibration-year,end-year,fixed,
FeedCrops,OilCrop,-6,start-year,1,share-weight,final-calibration-year,end-year,fixed,
FeedCrops,OtherGrain,-6,start-year,1,share-weight,final-calibration-year,end-year,fixed,
FeedCrops,PalmFruit,-6,start-year,1,share-weight,final-calibration-year,end-year,fixed,
FeedCrops,Rice,-6,start-year,1,share-weight,final-calibration-year,end-year,fixed,
FeedCrops,RootTuber,-6,start-year,1,share-weight,final-calibration-year,end-year,fixed,
FeedCrops,SugarCrop,-6,start-year,1,share-weight,final-calibration-year,end-year,fixed,
FeedCrops,Wheat,-6,start-year,1,share-weight,final-calibration-year,end-year,fixed,
FeedCrops,DDGS and feedcakes,-6,initial-future-year,1,share-weight,initial-future-year,end-year,fixed,
Scavenging_Other,Scavenging_Other,-6,start-year,1,share-weight,final-calibration-year,end-year,fixed,
supplysector,subsector,logit.exponent,year.fillout,share.weight,apply.to,from.year,to.year,to.value,interpolation.function,logit.type
FodderHerb_Residue,FodderHerb,-6,start-year,1,share-weight,final-calibration-year,end-year,,fixed,
FodderHerb_Residue,Residue,-6,start-year,1,share-weight,final-calibration-year,end-year,,fixed,
Pasture_FodderGrass,Pasture,-6,start-year,1,share-weight,final-calibration-year,end-year,,fixed,
Pasture_FodderGrass,FodderGrass,-6,start-year,1,share-weight,final-calibration-year,end-year,,fixed,
FeedCrops,Corn,-6,start-year,1,share-weight,final-calibration-year,end-year,,fixed,
FeedCrops,FiberCrop,-6,start-year,1,share-weight,final-calibration-year,end-year,,fixed,
FeedCrops,MiscCrop,-6,start-year,1,share-weight,final-calibration-year,end-year,,fixed,
FeedCrops,OilCrop,-6,start-year,1,share-weight,final-calibration-year,end-year,,fixed,
FeedCrops,OtherGrain,-6,start-year,1,share-weight,final-calibration-year,end-year,,fixed,
FeedCrops,PalmFruit,-6,start-year,1,share-weight,final-calibration-year,end-year,,fixed,
FeedCrops,Rice,-6,start-year,1,share-weight,final-calibration-year,end-year,,fixed,
FeedCrops,RootTuber,-6,start-year,1,share-weight,final-calibration-year,end-year,,fixed,
FeedCrops,SugarCrop,-6,start-year,1,share-weight,final-calibration-year,end-year,,fixed,
FeedCrops,Wheat,-6,start-year,1,share-weight,final-calibration-year,end-year,,fixed,
FeedCrops,DDGS and feedcakes,-6,initial-future-year,1,share-weight,final-calibration-year,2150,1,s-curve,
Scavenging_Other,Scavenging_Other,-6,start-year,1,share-weight,final-calibration-year,end-year,,fixed,
6 changes: 3 additions & 3 deletions input/gcamdata/inst/extdata/energy/A21.rsrc_info.csv
Original file line number Diff line number Diff line change
@@ -1,7 +1,7 @@
# File: A21.rsrc_info.csv
# Title: Name and characteristics of resource for secondary outputs from refining
# Units: 1975$/kg
# Column types: ccccnnn
# Column types: cccc
# ----------
resource,market,output-unit,price-unit,1971,2010,2015
DDGS and feedcakes,regional,Mt,1975$/kg,0.05,0.05,0.05
resource,market,output-unit,price-unit
DDGS and feedcakes,regional,Mt,1975$/kg
6 changes: 3 additions & 3 deletions input/gcamdata/inst/extdata/energy/A_regions.csv
Original file line number Diff line number Diff line change
Expand Up @@ -13,7 +13,7 @@ GCAM_region_ID,region,tradbio_region,ethanol,biodiesel,biomassOil_tech,elect_td_
6,Australia_NZ,0,corn ethanol,biodiesel,OilCrop,0.0001,0,B
7,Brazil,1,sugar cane ethanol,biodiesel,OilCrop,0.00075,0,D
8,Canada,0,corn ethanol,biodiesel,OilCrop,0.0001,0,B
9,Central America and Caribbean,1,sugar cane ethanol,biodiesel,OilCrop,0.00075,0,D
9,Central America and Caribbean,1,sugar cane ethanol,biodiesel,PalmFruit,0.00075,0,D
10,Central Asia,0,corn ethanol,biodiesel,OilCrop,0.0001,0,D
11,China,1,corn ethanol,biodiesel,OilCrop,0.0001,1,D
12,EU-12,0,corn ethanol,biodiesel,OilCrop,0.0001,1,C
Expand All @@ -29,11 +29,11 @@ GCAM_region_ID,region,tradbio_region,ethanol,biodiesel,biomassOil_tech,elect_td_
22,Pakistan,1,corn ethanol,biodiesel,OilCrop,0.00025,0,E
23,Russia,0,corn ethanol,biodiesel,OilCrop,0.0004,1,D
24,South Africa,1,corn ethanol,biodiesel,OilCrop,0.00025,0,E
25,South America_Northern,1,sugar cane ethanol,biodiesel,OilCrop,0.00075,0,D
25,South America_Northern,1,sugar cane ethanol,biodiesel,PalmFruit,0.00075,0,D
26,South America_Southern,1,corn ethanol,biodiesel,OilCrop,0.00075,0,D
27,South Asia,1,corn ethanol,biodiesel,OilCrop,0.00025,0,E
28,South Korea,0,corn ethanol,biodiesel,OilCrop,0.0001,0,D
29,Southeast Asia,1,sugar cane ethanol,biodiesel,PalmFruit,0.00025,0,E
30,Taiwan,0,sugar cane ethanol,biodiesel,OilCrop,0.0001,0,D
30,Taiwan,0,sugar cane ethanol,biodiesel,PalmFruit,0.0001,0,D
31,Argentina,1,corn ethanol,biodiesel,OilCrop,0.00075,0,D
32,Colombia,1,sugar cane ethanol,biodiesel,OilCrop,0.00075,0,D
4 changes: 2 additions & 2 deletions input/gcamdata/man/driver_drake.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

Loading

0 comments on commit 7ac3011

Please sign in to comment.