diff --git a/.buildlibrary b/.buildlibrary index 46f93da8..598524a0 100644 --- a/.buildlibrary +++ b/.buildlibrary @@ -1,4 +1,4 @@ -ValidationKey: '37105140' +ValidationKey: '37153004' AcceptedWarnings: - 'Warning: package ''.*'' was built under R version' - 'Warning: namespace ''.*'' is not available and has been replaced' diff --git a/CITATION.cff b/CITATION.cff index 24e8b48f..7e4ac7d4 100644 --- a/CITATION.cff +++ b/CITATION.cff @@ -2,8 +2,8 @@ cff-version: 1.2.0 message: If you use this software, please cite it using the metadata from this file. type: software title: 'mrremind: MadRat REMIND Input Data Package' -version: 0.186.0 -date-released: '2024-08-14' +version: 0.186.1 +date-released: '2024-08-29' abstract: The mrremind packages contains data preprocessing for the REMIND model. authors: - family-names: Baumstark diff --git a/DESCRIPTION b/DESCRIPTION index 31b97cae..95133cb6 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -1,8 +1,8 @@ Type: Package Package: mrremind Title: MadRat REMIND Input Data Package -Version: 0.186.0 -Date: 2024-08-14 +Version: 0.186.1 +Date: 2024-08-29 Authors@R: c( person("Lavinia", "Baumstark", , "lavinia@pik-potsdam.de", role = c("aut", "cre")), person("Renato", "Rodrigues", role = "aut"), diff --git a/R/calcFeDemandIndustry.R b/R/calcFeDemandIndustry.R index 1670bb05..0db37a5f 100644 --- a/R/calcFeDemandIndustry.R +++ b/R/calcFeDemandIndustry.R @@ -950,53 +950,8 @@ calcFeDemandIndustry <- function(use_ODYM_RECC = FALSE) { industry_subsectors_en <- industry_subsectors_en %>% mutate(pf = sub("^feelwlth_", "feel_", .data$pf)) - ### extend to 2020 using WEO 2021 data ---- - IEA_WEO_2021_ref_year <- 2020L - last_industry_subsectors_en_year <- max(industry_subsectors_en$year) - if (IEA_WEO_2021_ref_year > last_industry_subsectors_en_year) { - industry_subsectors_en <- bind_rows( - industry_subsectors_en, - inner_join( - industry_subsectors_en %>% - filter(2010 == .data$year), - - readSource(type = "IEA_WorldEnergyOutlook", subtype = "2021-region", - convert = TRUE) %>% - magclass_to_tibble(c("iso3c", "year", "scenario", "variable", "industry.FE")) %>% - filter(.data$year %in% c(2010, IEA_WEO_2021_ref_year), - "Stated Policies Scenario" == .data$scenario, - "Energy-Total-Industry (EJ)" == .data$variable) %>% - left_join(region_mapping_21, "iso3c") %>% - group_by(!!!syms(c("region", "year"))) %>% - summarise(industry.FE = sum(.data$industry.FE, na.rm = TRUE), - .groups = "drop_last") %>% - summarise(change = last(.data$industry.FE, order_by = .data$year) - / first(.data$industry.FE, order_by = .data$year), - .groups = "drop"), - - "region" - ) %>% - mutate(value = .data$value * .data$change, - year = IEA_WEO_2021_ref_year) %>% - select(-"change") - ) %>% - pivot_wider(names_from = "year") %>% - mutate(`2015` = (!!sym("2010") - + !!sym("2015") - + !!sym(as.character(IEA_WEO_2021_ref_year)) - ) - / 3) %>% - pivot_longer(matches("^[0-9]*$"), names_to = "year", - names_transform = list(year = as.integer)) %>% - interpolate_missing_periods_(periods = list(year = seq_range(range(.$year)))) %>% - assert(not_na, everything()) %>% - verify(is.finite(.data$value)) - - FE_alpha_mod <- 0.9 # found by fiddling around - } else { - FE_alpha_mod <- 1 - } + FE_alpha_mod <- 1 ### calculate 1993-2020 industry subsector FE shares ---- industry_subsectors_en_shares <- industry_subsectors_en %>% diff --git a/R/calcIEA_WorldEnergyOutlook.R b/R/calcIEA_WorldEnergyOutlook.R index 532a37ba..927955c6 100644 --- a/R/calcIEA_WorldEnergyOutlook.R +++ b/R/calcIEA_WorldEnergyOutlook.R @@ -1,61 +1,46 @@ #' Calculate REMIND variables from IEA World Energy Outlook data. #' -#' @param version of the WEO data, either 'default' (full paid version) or -#' 'latest' (free, restricted, up-to-date dataset) #' @author Falk Benke #' @export -calcIEA_WorldEnergyOutlook <- function(version = "latest") { # nolint +calcIEA_WorldEnergyOutlook <- function() { # nolint - if (!(version %in% c("default", "latest"))) { - stop("Invalid parameter `version`. Must be either 'default' or 'latest'") - } - - refYear <- if (version == "default") 2021 else 2023 - - dataGlo <- readSource("IEA_WorldEnergyOutlook", subtype = paste0(refYear, "-global")) - dataReg <- readSource("IEA_WorldEnergyOutlook", subtype = paste0(refYear, "-region")) + dataGlo <- readSource("IEA_WorldEnergyOutlook", convert = FALSE)["World", , ] + magclass::getItems(dataGlo, dim = 1) <- "GLO" + dataReg <- readSource("IEA_WorldEnergyOutlook", convert = TRUE) .mapToRemind <- function(data) { - if (refYear == 2021) { - # copy over Stated Policies Scenario for 2010 - 2020 to other scenarios - for (s in getNames(data, dim = 1)) { - data[, c("y2010", "y2019", "y2020"), s] <- - data[, c("y2010", "y2019", "y2020"), "Stated Policies Scenario"][, , getNames(data[, , s], dim = 2)] - } + + # copy over Stated Policies Scenario for 2010 - 2022 to other scenarios + for (s in magclass::getNames(data, dim = 1)) { + data[, c("y2010", "y2015", "y2021", "y2022"), s] <- + data[, c("y2010", "y2015", "y2021", "y2022"), "Stated Policies Scenario"][, , magclass::getNames(data[, , s], dim = 2)] } + # rename scenarios scens <- c( "Stated Policies Scenario" = "SPS", "Announced pledges scenario" = "APS", "Announced Pledges Scenario" = "APS", - "Sustainable Development Scenario" = "SDS", "Net Zero Emissions by 2050 Scenario" = "Net2050" ) - getNames(data, dim = 1) <- paste0("IEA WEO ", refYear, " ", scens[getNames(data, dim = 1)]) - getSets(data)[3] <- "model" + magclass::getNames(data, dim = 1) <- paste0("IEA WEO 2023 ", scens[magclass::getNames(data, dim = 1)]) + magclass::getSets(data)[3] <- "model" - map <- toolGetMapping( - "Mapping_IEA_WEO_2021_complete.csv", - type = "reportingVariables", where = "mrremind" - ) %>% + map <- toolGetMapping("Mapping_IEA_WEO_complete.csv", type = "reportingVariables", where = "mrremind") %>% dplyr::filter(!is.na(.data$REMIND), .data$REMIND != "") %>% - dplyr::mutate( - "from" = paste0(trimws(.data$WEO), " (", .data$Unit_WEO, ")"), - "to" = paste0(trimws(.data$REMIND), " (", .data$Unit_REMIND, ")"), - "conversion" = as.numeric(.data$Conversion) - ) %>% - dplyr::select("from", "to", "conversion") + dplyr::mutate("conversion" = as.numeric(.data$Conversion)) %>% + dplyr::select("from" = "Variable", "to" = "REMIND", "conversion") for (var in intersect(getNames(data, dim = 2), unique(map$from))) { conv <- map[map$from == var, "conversion"] # if there is more than one conversion factor, it means that one source variable - # is converted two more than one target variable using a different conversion + # is converted two more than one target variable using a different conversion factor if (length(unique(conv)) > 1) { - # create unique "from" variables for each mapping entry + # create unique "from" variables for each mapping entry by appending numbers map[map$from == var, "from"] <- paste0(map[map$from == var, "from"], " ", seq(1, nrow(map[map$from == var, ]))) # duplicate "from" data with for each mapping entry @@ -81,67 +66,62 @@ calcIEA_WorldEnergyOutlook <- function(version = "latest") { # nolint dataGlo <- .mapToRemind(dataGlo) dataReg <- .mapToRemind(dataReg) - # do additional calculations on full dataset for 2021 (won't work for incomplete 2023 data) - if (refYear == 2021) { - .calcAdditionalVars <- function(x) { - # correct PE|Nuclear and PE - # PE Nuclear is usually reported in direct equivalents, values from IEA are - # roughly 3 times higher than the REMIND ones - x[, , "PE (EJ/yr)"] <- x[, , "PE (EJ/yr)"] - x[, , "PE|Nuclear (EJ/yr)"] - x[, , "PE|Nuclear (EJ/yr)"] <- x[, , "PE|Nuclear (EJ/yr)"] / 3 - x[, , "PE (EJ/yr)"] <- x[, , "PE (EJ/yr)"] + x[, , "PE|Nuclear (EJ/yr)"] + .calcAdditionalVars <- function(x) { + # correct PE|Nuclear and PE + # PE Nuclear is usually reported in direct equivalents, values from IEA are + # roughly 3 times higher than the REMIND ones + x[, , "PE (EJ/yr)"] <- x[, , "PE (EJ/yr)"] - x[, , "PE|Nuclear (EJ/yr)"] + x[, , "PE|Nuclear (EJ/yr)"] <- x[, , "PE|Nuclear (EJ/yr)"] / 3 + x[, , "PE (EJ/yr)"] <- x[, , "PE (EJ/yr)"] + x[, , "PE|Nuclear (EJ/yr)"] - return(x) - } + return(x) + } - dataGlo <- .calcAdditionalVars(dataGlo) - dataReg <- .calcAdditionalVars(dataReg) + dataGlo <- .calcAdditionalVars(dataGlo) + dataReg <- .calcAdditionalVars(dataReg) - dataGlo <- add_columns(dataGlo, "Cap|Electricity|Biomass|w/o CC (GW)", dim = 3.2) - dataGlo[, , "Cap|Electricity|Biomass|w/o CC (GW)"] <- - dataGlo[, , "Cap|Electricity|Biomass (GW)"] - dataGlo[, , "Cap|Electricity|Biomass|w/ CC (GW)"] + dataGlo <- magclass::add_columns(dataGlo, "Cap|Electricity|Biomass|w/o CC (GW)", dim = 3.2) + dataGlo[, , "Cap|Electricity|Biomass|w/o CC (GW)"] <- + dataGlo[, , "Cap|Electricity|Biomass (GW)"] - dataGlo[, , "Cap|Electricity|Biomass|w/ CC (GW)"] - dataGlo <- add_columns(dataGlo, "Cap|Electricity|Coal (GW)", dim = 3.2) - dataGlo[, , "Cap|Electricity|Coal (GW)"] <- - dataGlo[, , "Cap|Electricity|Coal|w/o CC (GW)"] + dataGlo[, , "Cap|Electricity|Coal|w/ CC (GW)"] + dataGlo <- magclass::add_columns(dataGlo, "Cap|Electricity|Coal (GW)", dim = 3.2) + dataGlo[, , "Cap|Electricity|Coal (GW)"] <- + dataGlo[, , "Cap|Electricity|Coal|w/o CC (GW)"] + dataGlo[, , "Cap|Electricity|Coal|w/ CC (GW)"] - dataGlo <- add_columns(dataGlo, "Cap|Electricity|Solar (GW)", dim = 3.2) - dataGlo[, , "Cap|Electricity|Solar (GW)"] <- - dataGlo[, , "Cap|Electricity|Solar|CSP (GW)"] + dataGlo[, , "Cap|Electricity|Solar|PV (GW)"] + dataGlo <- magclass::add_columns(dataGlo, "Cap|Electricity|Solar (GW)", dim = 3.2) + dataGlo[, , "Cap|Electricity|Solar (GW)"] <- + dataGlo[, , "Cap|Electricity|Solar|CSP (GW)"] + dataGlo[, , "Cap|Electricity|Solar|PV (GW)"] - dataGlo <- add_columns(dataGlo, "Cap|Electricity|Fossil (GW)", dim = 3.2) - dataGlo[, , "Cap|Electricity|Fossil (GW)"] <- - dataGlo[, , "Cap|Electricity|Fossil|w/o CC (GW)"] + dataGlo[, , "Cap|Electricity|Fossil|w/ CC (GW)"] + dataGlo <- magclass::add_columns(dataGlo, "Cap|Electricity|Fossil (GW)", dim = 3.2) + dataGlo[, , "Cap|Electricity|Fossil (GW)"] <- + dataGlo[, , "Cap|Electricity|Fossil|w/o CC (GW)"] + dataGlo[, , "Cap|Electricity|Fossil|w/ CC (GW)"] - dataGlo <- add_columns(dataGlo, "Cap|Electricity|Gas (GW)", dim = 3.2) - dataGlo[, , "Cap|Electricity|Gas (GW)"] <- - dataGlo[, , "Cap|Electricity|Gas|w/o CC (GW)"] + dataGlo[, , "Cap|Electricity|Gas|w/ CC (GW)"] + dataGlo <- magclass::add_columns(dataGlo, "Cap|Electricity|Gas (GW)", dim = 3.2) + dataGlo[, , "Cap|Electricity|Gas (GW)"] <- + dataGlo[, , "Cap|Electricity|Gas|w/o CC (GW)"] + dataGlo[, , "Cap|Electricity|Gas|w/ CC (GW)"] - dataGlo <- add_columns(dataGlo, "SE|Electricity|Solar (EJ/yr)", dim = 3.2) - dataGlo[, , "SE|Electricity|Solar (EJ/yr)"] <- - dataGlo[, , "SE|Electricity|Solar|PV (EJ/yr)"] + dataGlo[, , "SE|Electricity|Solar|CSP (EJ/yr)"] - } + dataGlo <- magclass::add_columns(dataGlo, "SE|Electricity|Solar (EJ/yr)", dim = 3.2) + dataGlo[, , "SE|Electricity|Solar (EJ/yr)"] <- + dataGlo[, , "SE|Electricity|Solar|PV (EJ/yr)"] + dataGlo[, , "SE|Electricity|Solar|CSP (EJ/yr)"] # includes values from the original source for global region instead of calculating # it as the sum of all countries (as countries are incomplete) .customAggregate <- function(x, rel, to = NULL, glo) { x <- toolAggregate(x, rel = rel, to = to) - if ("GLO" %in% getItems(x, dim = 1)) { + if ("GLO" %in% magclass::getItems(x, dim = 1)) { x <- x["GLO", , , invert = TRUE] - glo <- dimSums(glo, dim = 1, na.rm = FALSE) - - out <- new.magpie( - cells_and_regions = union(getItems(x, dim = 1), "GLO"), - years = union(getYears(x), getYears(glo)), - names = union(getNames(x), getNames(glo)), + out <- magclass::new.magpie( + cells_and_regions = union(magclass::getItems(x, dim = 1), "GLO"), + years = union(magclass::getYears(x), magclass::getYears(glo)), + names = union(magclass::getNames(x), magclass::getNames(glo)), fill = NA, sets = names(dimnames(x)) ) - out[getItems(x, dim = 1), getYears(x), getNames(x)] <- x - out["GLO", getYears(glo), getNames(glo)] <- glo + out[magclass::getItems(x, dim = 1), magclass::getYears(x), magclass::getNames(x)] <- x + out["GLO", magclass::getYears(glo), magclass::getNames(glo)] <- glo return(out) } else { @@ -155,6 +135,6 @@ calcIEA_WorldEnergyOutlook <- function(version = "latest") { # nolint unit = c("GW", "EJ/yr", "Mt CO2/yr"), aggregationFunction = .customAggregate, aggregationArguments = list(glo = dataGlo), - description = "IEA World Energy Outlook values as REMIND variables" + description = "IEA World Energy Outlook 2023 values as REMIND variables" )) } diff --git a/R/convertIEA_WorldEnergyOutlook.R b/R/convertIEA_WorldEnergyOutlook.R index a75edcc0..d06ae163 100644 --- a/R/convertIEA_WorldEnergyOutlook.R +++ b/R/convertIEA_WorldEnergyOutlook.R @@ -1,144 +1,115 @@ -#' Convert IEA WEO 2021 Data +#' Convert IEA World Energy Outlook Data from 2023 #' #' @param x magclass object to be converted -#' @param subtype "2021-global", "2021-region", "2023-global", or "2023-region". -#' - For 2021 we have complete paid data. For 2023 we have only the free dataset. -#' - On global level, the source offers more variables than on regional level, -#' but the data should not be used on sub-global level due to its coarse disaggregation. #' @author Falk Benke #' -convertIEA_WorldEnergyOutlook <- function(x, subtype = "2021-global") { # nolint +convertIEA_WorldEnergyOutlook <- function(x) { # nolint - pe <- calcOutput("PE", aggregate = FALSE) - - if (grepl("-global$", subtype)) { - - # for now, we only have complete data on global level - xWorld <- x["World", , ] - - # remove all-NA variables - remove <- magpply(xWorld, function(y) all(is.na(y)), MARGIN = 3) - xWorld <- xWorld[, , !remove] - - # to integrate the data in historical.mif, we need to disaggregate to country level - # the disaggregation is very unprecise and therefore values below global granularity - # are not reliable + .removeNaRegions <- function(x) { + remove <- magpply(x, function(y) all(is.na(y)), MARGIN = 1) + return(x[!remove, , ]) + } - mappingWorld <- tibble( - regions = "World", - country = getISOlist() - ) + mappingFull <- toolGetMapping("regionmapping_IEAWorldEnergyOutlook.csv", + type = "regional", where = "mrremind" + ) - weight <- pe[, 2014, "PE (EJ/yr)"] - xWorld <- toolAggregate(xWorld, rel = mappingWorld, weight = weight) + pe <- calcOutput("PE", aggregate = FALSE) - return(xWorld) + .disaggregateRegions <- function(xIn, regionsIn) { + x <- .removeNaRegions(xIn) - } else if (grepl("-region$", subtype)) { + regions <- intersect(regionsIn, getItems(x, dim = 1)) - .removeNaRegions <- function(x) { - remove <- magpply(x, function(y) all(is.na(y)), MARGIN = 1) - return(x[!remove, , ]) + if (length(regions) == 0) { + return(toolCountryFill(x, fill = NA, verbosity = 2)) } - mappingFull <- toolGetMapping("regionmapping_IEA_WEO_2021.csv", - type = "regional", where = "mappingfolder") - - .disaggregateRegions <- function(xIn, regionsIn) { - x <- .removeNaRegions(xIn) - - regions <- intersect(regionsIn, getItems(x, dim = 1)) - - if (length(regions) == 0) { - return(toolCountryFill(x, fill = NA, verbosity = 2)) - } - - # ISO countries in x and the corresponding mapping - ctry <- setdiff(getItems(x, dim = 1), regions) - mappingCtry <- mappingFull[mappingFull$ISO3.code %in% ctry & - mappingFull$Region_name %in% regions, ] + # ISO countries in x and the corresponding mapping + ctry <- setdiff(getItems(x, dim = 1), regions) + mappingCtry <- mappingFull[mappingFull$ISO3.code %in% ctry & + mappingFull$Region_name %in% regions, ] - # subtract country values in x from region values - # e.g. USA from North America, if both are in data - xSub <- x[mappingCtry$ISO3.code, , ] - getItems(xSub, dim = 1) <- mappingCtry$Region_name - x[unique(mappingCtry$Region_name), , ] <- x[unique(mappingCtry$Region_name), , ] - dimSums(xSub, dim = 3) + # subtract country values in x from region values + # e.g. USA from North America, if both are in data + xSub <- x[mappingCtry$ISO3.code, , ] + getItems(xSub, dim = 1) <- mappingCtry$Region_name + x[unique(mappingCtry$Region_name), , ] <- x[unique(mappingCtry$Region_name), , ] - dimSums(xSub, dim = 3) - # mapping of regions to ISO countries other than in ctry (i.e. other regions) - mappingRegions <- mappingFull[mappingFull$Region_name %in% regions & - !mappingFull$ISO3.code %in% ctry & mappingFull$ISO3.code != "SUN", ] + # mapping of regions to ISO countries other than in ctry (i.e. other regions) + mappingRegions <- mappingFull[mappingFull$Region_name %in% regions & + !mappingFull$ISO3.code %in% ctry & mappingFull$ISO3.code != "SUN", ] - # regions fully covered by country values can be removed - coveredRegions <- setdiff(regions, unique(mappingRegions$Region_name)) + # regions fully covered by country values can be removed + coveredRegions <- setdiff(regions, unique(mappingRegions$Region_name)) - if (length(coveredRegions) > 0) { - x <- x[coveredRegions, , invert = TRUE] - regions <- setdiff(regions, coveredRegions) - } - - weight <- pe[mappingRegions$ISO3.code, 2014, "PE (EJ/yr)"] - - # disaggregation of other regions to ISO countries - x2 <- toolAggregate(x[regions, , ], rel = mappingRegions, weight = weight) - - # ISO countries in x that do not need to be disaggregated - x1 <- x[regions, , invert = TRUE] - - if (length(getItems(x1, dim = 1)) == 0) { - return(toolCountryFill(x2, fill = NA, verbosity = 2)) - } - - # combine the two objects - x <- mbind(x1, x2) - x <- toolCountryFill(x, fill = NA, verbosity = 2) - - return(x) + if (length(coveredRegions) > 0) { + x <- x[coveredRegions, , invert = TRUE] + regions <- setdiff(regions, coveredRegions) } - # exclude all regions we don't want to disaggregate due to redundancies, - # low relevance, or lack of accuracy - xReg <- x[c( - "Atlantic Basin", "East of Suez", "NonOPEC", "OPEC", "Japan and Korea", - "Southeast Asia", "Other", "European Union", "World", - "Advanced economies", "Emerging market and developing economies", - "International Energy Agency", "OECD", "Non-OECD", - "North Africa", "Sub-Saharan Africa", "Rest of world", - "Other Asia Pacific", "Other Europe", "Non-OPEC" - ), , , invert = TRUE] - - # remove all-NA variables - remove <- magpply(xReg, function(y) all(is.na(y)), MARGIN = 3) - xReg <- xReg[, , !remove] - - # regions we disaggregate - regions <- c( - "Africa", "Asia Pacific", "Central and South America", "Europe", - "Eurasia", "Middle East", "North America" - ) - x1 <- xReg[regions, , ] - - # convert country names to ISO - x2 <- xReg[regions, , , invert = TRUE] - getItems(x2, dim = 1) <- toolCountry2isocode(getItems(x2, dim = 1), warn = TRUE) + weight <- pe[mappingRegions$ISO3.code, 2014, "PE (EJ/yr)"] - xReg <- mbind(x1, x2) + # disaggregation of other regions to ISO countries + x2 <- toolAggregate(x[regions, , ], rel = mappingRegions, weight = weight) - xRegional <- NULL + # ISO countries in x that do not need to be disaggregated + x1 <- x[regions, , invert = TRUE] - # disaggregate regions per variable - for (v in getItems(xReg, dim = 3)) { - xRegional <- mbind( - xRegional, - .disaggregateRegions(xIn = xReg[, , v], regionsIn = regions) - ) + if (length(getItems(x1, dim = 1)) == 0) { + return(toolCountryFill(x2, fill = NA, verbosity = 2)) } - xRegional <- toolFillEU34Countries(xRegional) + # combine the two objects + x <- mbind(x1, x2) + x <- toolCountryFill(x, fill = NA, verbosity = 2) - return(xRegional) + return(x) + } - } else { - stop("Not a valid subtype! Must be one of: '2021-region', '2021-global', '2023-region', '2023-global'") + # exclude all regions we don't want to disaggregate due to redundancies, + # low relevance, or lack of accuracy + xReg <- x[c( + "Atlantic Basin", "East of Suez", "NonOPEC", "OPEC", "Japan and Korea", + "Southeast Asia", "Other", "European Union", "World", + "Advanced economies", "Emerging market and developing economies", + "International Energy Agency", "OECD", "Non-OECD", + "North Africa", "Sub-Saharan Africa", "Rest of world", + "Other Asia Pacific", "Other Europe", "Non-OPEC" + ), , , invert = TRUE] + + # remove all-NA variables + remove <- magpply(xReg, function(y) all(is.na(y)), MARGIN = 3) + xReg <- xReg[, , !remove] + + # regions we disaggregate + regions <- c( + "Africa", "Asia Pacific", "Central and South America", "Europe", + "Eurasia", "Middle East", "North America" + ) + x1 <- xReg[regions, , ] + + # convert country names to ISO + x2 <- xReg[regions, , , invert = TRUE] + + # remove International bunkers, as it is unclear how to assign them + x2 <- x2["International bunkers", , , invert = TRUE] + getItems(x2, dim = 1) <- toolCountry2isocode(getItems(x2, dim = 1), warn = TRUE) + + xReg <- mbind(x1, x2) + + xRegional <- NULL + + # disaggregate regions per variable + for (v in getItems(xReg, dim = 3)) { + xRegional <- mbind( + xRegional, + .disaggregateRegions(xIn = xReg[, , v], regionsIn = regions) + ) } + + xRegional <- toolFillEU34Countries(xRegional) + + return(xRegional) } diff --git a/R/fullVALIDATIONREMIND.R b/R/fullVALIDATIONREMIND.R index d4412b4a..c0974067 100644 --- a/R/fullVALIDATIONREMIND.R +++ b/R/fullVALIDATIONREMIND.R @@ -178,13 +178,7 @@ fullVALIDATIONREMIND <- function(rev = 0) { # IEA World Energy Outlook ---- calcOutput( - type = "IEA_WorldEnergyOutlook", version = "default", file = valfile, - aggregate = columnsForAggregation, append = TRUE, warnNA = FALSE, - try = FALSE, years = years, writeArgs = list(scenario = "historical") - ) - - calcOutput( - type = "IEA_WorldEnergyOutlook", version = "latest", file = valfile, + type = "IEA_WorldEnergyOutlook", file = valfile, aggregate = columnsForAggregation, append = TRUE, warnNA = FALSE, try = FALSE, years = years, writeArgs = list(scenario = "historical") ) diff --git a/R/readIEA_WorldEnergyOutlook.R b/R/readIEA_WorldEnergyOutlook.R index 4610cab6..7f4c623b 100644 --- a/R/readIEA_WorldEnergyOutlook.R +++ b/R/readIEA_WorldEnergyOutlook.R @@ -1,100 +1,66 @@ -#' Read in IEA World Energy Outlook Data from 2021 or 2023 +#' Read in IEA World Energy Outlook Data from 2023 #' -#' @param subtype "2021-global", "2021-region", "2023-global", or "2023-region". -#' - For 2021 we have complete paid data. For 2023 we have only the free dataset. -#' - On global level, the source offers more variables than on regional level, -#' but the data should not be used on sub-global level due to its coarse disaggregation. #' @author Falk Benke #' @importFrom dplyr filter distinct group_by ungroup rename_all #' -readIEA_WorldEnergyOutlook <- function(subtype = "2021-region") { # nolint +readIEA_WorldEnergyOutlook <- function() { # nolint - if (grepl("2021-", subtype)) { - - data <- rbind( - read.csv2( - file = "2021/complete/WEO2021_Extended_Data_Regions.csv", - sep = "," - ) %>% rename_all(tolower), - read.csv2( - file = "2021/complete/WEO2021_Extended_Data_Supply_Refining_Trade_Prices.csv", - sep = "," - ) %>% rename_all(tolower), - read.csv( - file = "2021/complete/WEO2021_Extended_Data_World.csv", - sep = "," - ) %>% rename_all(tolower), - read.csv( - file = "2021/complete/WEO2021_Extended_Data_Investment.csv", - sep = "," - ) %>% rename_all(tolower) + data <- rbind( + read.csv2( + file = "2023/complete/WEO2023_Extended_Data_Regions.csv", + sep = "," + ) %>% rename_all(tolower), + read.csv2( + file = "2023/complete/WEO2023_Extended_Data_Supply_Refining_H2_Trade_Prices.csv", + sep = "," + ) %>% rename_all(tolower), + read.csv( + file = "2023/complete/WEO2023_Extended_Data_World.csv", + sep = "," + ) %>% rename_all(tolower), + read.csv( + file = "2023/complete/WEO2023_Extended_Data_Investment.csv", + sep = "," + ) %>% rename_all(tolower) + ) %>% + mutate( + "value" = ifelse(.data$unit == "PJ", as.numeric(.data$value) / 1000, as.numeric(.data$value)), + "unit" = ifelse(.data$unit == "PJ", "EJ", .data$unit), + "variable" = paste0(.data$category, "-", .data$product, "-", .data$flow, " (", .data$unit, ")") ) %>% - mutate( - "value" = ifelse(.data$unit == "PJ", as.numeric(.data$value) / 1000, as.numeric(.data$value)), - "unit" = ifelse(.data$unit == "PJ", "EJ", .data$unit), - "variable" = paste0(.data$category, "-", .data$product, "-", .data$flow, " (", .data$unit, ")") - ) %>% - select("region", "year", "scenario", "variable", "value") %>% - group_by(.data$region, .data$year, .data$scenario, .data$variable) %>% - distinct() %>% - ungroup() - - # investment data uses yearly ranges and needs special treatment - # we currently don't read in cumulative investment spending, only annual average spending - rangeData <- filter( - data, is.na(suppressWarnings(as.numeric(.data$year))), - grepl("Investment spending, annual average", .data$variable) - ) - - # remove non-annual data - data <- filter(data, !is.na(suppressWarnings(as.numeric(.data$year)))) - - years <- as.numeric(unique(data$year)) + select("region", "year", "scenario", "variable", "value") %>% + group_by(.data$region, .data$year, .data$scenario, .data$variable) %>% + distinct() %>% + ungroup() - splitData <- data.frame() + # investment data uses yearly ranges and needs special treatment + # we currently don't read in cumulative investment spending, only annual average spending + rangeData <- data %>% filter( + is.na(suppressWarnings(as.numeric(.data$year))), + grepl("Investment spending, annual average", .data$variable) + ) - for (i in seq(1, nrow(rangeData))) { - d <- rangeData[i, ] - minY <- as.numeric(sub("-[0-9]{4}", "", d[, "year"])) - maxY <- as.numeric(sub("[0-9]{4}-", "", d[, "year"])) - y <- data.frame(year = seq(minY, maxY, 1), variable = d[, "variable"]) %>% - filter(.data$year %in% years) - splitData <- rbind(splitData, left_join(y, select(d, -2), by = "variable")) - } + # remove non-annual data + data <- data %>% + filter(!is.na(suppressWarnings(as.numeric(.data$year)))) - data <- rbind(data, splitData) + years <- as.numeric(unique(data$year)) - as.magpie(data, temporal = 2, spatial = 1, datacol = 5) %>% - magpiesort() %>% - return() + splitData <- data.frame() - } else if (grepl("2023-", subtype)) { + for (i in seq(1, nrow(rangeData))) { + d <- rangeData[i, ] + minY <- as.numeric(sub("-[0-9]{4}", "", d[, "year"])) + maxY <- as.numeric(sub("[0-9]{4}-", "", d[, "year"])) + y <- data.frame(year = seq(minY, maxY, 1), variable = d[, "variable"]) %>% + filter(.data$year %in% years) + splitData <- rbind(splitData, left_join(y, select(d, -2), by = "variable")) + } - data <- rbind( - read.csv2( - file = "2023/free/WEO2023_AnnexA_Free_Dataset_Regions.csv", - sep = "," - ) %>% rename_all(tolower), - read.csv2( - file = "2023/free/WEO2023_AnnexA_Free_Dataset_World.csv", - sep = "," - ) %>% rename_all(tolower) - ) %>% - mutate( - "value" = ifelse(.data$unit == "PJ", as.numeric(.data$value) / 1000, as.numeric(.data$value)), - "unit" = ifelse(.data$unit == "PJ", "EJ", .data$unit), - "variable" = paste0(.data$category, "-", .data$product, "-", .data$flow, " (", .data$unit, ")") - ) %>% - select("region", "year", "scenario", "variable", "value") %>% - group_by(.data$region, .data$year, .data$scenario, .data$variable) %>% - distinct() %>% - ungroup() + data <- rbind(data, splitData) - as.magpie(data, temporal = 2, spatial = 1, datacol = 5) %>% - magpiesort() %>% - return() + as.magpie(data, temporal = 2, spatial = 1, datacol = 5) %>% + magpiesort() %>% + return() - } else { - stop("Not a valid subtype! Must be one of: '2021-region', '2021-global', '2023-region', '2023-global'") - } } diff --git a/README.md b/README.md index 86802723..7f3b7d07 100644 --- a/README.md +++ b/README.md @@ -1,6 +1,6 @@ # MadRat REMIND Input Data Package -R package **mrremind**, version **0.186.0** +R package **mrremind**, version **0.186.1** [![CRAN status](https://www.r-pkg.org/badges/version/mrremind)](https://cran.r-project.org/package=mrremind) [![R build status](https://github.com/pik-piam/mrremind/workflows/check/badge.svg)](https://github.com/pik-piam/mrremind/actions) [![codecov](https://codecov.io/gh/pik-piam/mrremind/branch/master/graph/badge.svg)](https://app.codecov.io/gh/pik-piam/mrremind) [![r-universe](https://pik-piam.r-universe.dev/badges/mrremind)](https://pik-piam.r-universe.dev/builds) @@ -39,7 +39,7 @@ In case of questions / problems please contact Lavinia Baumstark . +Baumstark L, Rodrigues R, Levesque A, Oeser J, Bertram C, Mouratiadou I, Malik A, Schreyer F, Soergel B, Rottoli M, Mishra A, Dirnaichner A, Pehl M, Giannousakis A, Klein D, Strefler J, Feldhaus L, Brecha R, Rauner S, Dietrich J, Bi S, Benke F, Weigmann P, Richters O, Hasse R, Fuchs S, Mandaroux R, Koch J (2024). _mrremind: MadRat REMIND Input Data Package_. R package version 0.186.1, . A BibTeX entry for LaTeX users is @@ -48,7 +48,7 @@ A BibTeX entry for LaTeX users is title = {mrremind: MadRat REMIND Input Data Package}, author = {Lavinia Baumstark and Renato Rodrigues and Antoine Levesque and Julian Oeser and Christoph Bertram and Ioanna Mouratiadou and Aman Malik and Felix Schreyer and Bjoern Soergel and Marianna Rottoli and Abhijeet Mishra and Alois Dirnaichner and Michaja Pehl and Anastasis Giannousakis and David Klein and Jessica Strefler and Lukas Feldhaus and Regina Brecha and Sebastian Rauner and Jan Philipp Dietrich and Stephen Bi and Falk Benke and Pascal Weigmann and Oliver Richters and Robin Hasse and Sophie Fuchs and Rahel Mandaroux and Johannes Koch}, year = {2024}, - note = {R package version 0.186.0}, + note = {R package version 0.186.1}, url = {https://github.com/pik-piam/mrremind}, } ``` diff --git a/inst/extdata/regional/regionmapping_IEAWorldEnergyOutlook.csv b/inst/extdata/regional/regionmapping_IEAWorldEnergyOutlook.csv new file mode 100755 index 00000000..eae9f656 --- /dev/null +++ b/inst/extdata/regional/regionmapping_IEAWorldEnergyOutlook.csv @@ -0,0 +1,212 @@ +"Region_name";"ISO3.code" +"Central and South America";"ABW" +"Asia Pacific";"AFG" +"Africa";"AGO" +"Europe";"ALB" +"Middle East";"ARE" +"Central and South America";"ARG" +"Asia Pacific";"ATA" +"Central and South America";"ATG" +"Asia Pacific";"AUS" +"Europe";"AUT" +"Africa";"BDI" +"Europe";"BEL" +"Africa";"BEN" +"Africa";"BFA" +"Asia Pacific";"BGD" +"Europe";"BGR" +"Middle East";"BHR" +"Central and South America";"BHS" +"Europe";"BIH" +"Central and South America";"BLM" +"Central and South America";"BLZ" +"Central and South America";"BOL" +"Central and South America";"BRA" +"Central and South America";"BRB" +"Asia Pacific";"BRN" +"Asia Pacific";"BTN" +"Africa";"BWA" +"Africa";"CAF" +"Asia Pacific";"CCK" +"Europe";"CHE" +"Central and South America";"CHL" +"Asia Pacific";"CHN" +"Africa";"CIV" +"Africa";"CMR" +"Africa";"COD" +"Africa";"COG" +"Asia Pacific";"COK" +"Central and South America";"COL" +"Africa";"COM" +"Africa";"CPV" +"Central and South America";"CRI" +"Central and South America";"CUB" +"Asia Pacific";"CXR" +"Central and South America";"CYM" +"Europe";"CYP" +"Europe";"CZE" +"Europe";"DEU" +"Africa";"DJI" +"Central and South America";"DMA" +"Europe";"DNK" +"Central and South America";"DOM" +"Africa";"DZA" +"Central and South America";"ECU" +"Africa";"EGY" +"Africa";"ERI" +"Europe";"ESP" +"Europe";"EST" +"Africa";"ETH" +"Europe";"FIN" +"Asia Pacific";"FJI" +"Europe";"FRA" +"Asia Pacific";"FSM" +"Africa";"GAB" +"Europe";"GBR" +"Europe";"GEO" +"Africa";"GHA" +"Europe";"GIB" +"Africa";"GIN" +"Central and South America";"GLP" +"Africa";"GMB" +"Africa";"GNB" +"Africa";"GNQ" +"Europe";"GRC" +"Central and South America";"GRD" +"Central and South America";"GTM" +"Central and South America";"GUF" +"Central and South America";"GUY" +"Asia Pacific";"HKG" +"Asia Pacific";"HMD" +"Central and South America";"HND" +"Europe";"HRV" +"Central and South America";"HTI" +"Europe";"HUN" +"Asia Pacific";"IDN" +"Asia Pacific";"IND" +"Europe";"IRL" +"Middle East";"IRN" +"Middle East";"IRQ" +"Europe";"ISL" +"Middle East";"ISR" +"Europe";"ITA" +"Central and South America";"JAM" +"Middle East";"JOR" +"Asia Pacific";"JPN" +"Africa";"KEN" +"Asia Pacific";"KHM" +"Asia Pacific";"KIR" +"Central and South America";"KNA" +"Asia Pacific";"KOR" +"Middle East";"KWT" +"Asia Pacific";"LAO" +"Middle East";"LBN" +"Africa";"LBR" +"Africa";"LBY" +"Central and South America";"LCA" +"Asia Pacific";"LKA" +"Africa";"LSO" +"Europe";"LTU" +"Europe";"LUX" +"Europe";"LVA" +"Asia Pacific";"MAC" +"Africa";"MAR" +"Africa";"MDG" +"Asia Pacific";"MDV" +"Asia Pacific";"MHL" +"Europe";"MKD" +"Africa";"MLI" +"Europe";"MLT" +"Asia Pacific";"MMR" +"Europe";"MNE" +"Asia Pacific";"MNG" +"Africa";"MOZ" +"Africa";"MRT" +"Central and South America";"MTQ" +"Africa";"MUS" +"Africa";"MWI" +"Asia Pacific";"MYS" +"Africa";"NAM" +"Africa";"NER" +"Asia Pacific";"NFK" +"Africa";"NGA" +"Central and South America";"NIC" +"Asia Pacific";"NIU" +"Europe";"NLD" +"Europe";"NOR" +"Asia Pacific";"NPL" +"Asia Pacific";"NRU" +"Asia Pacific";"NZL" +"Middle East";"OMN" +"Asia Pacific";"PAK" +"Central and South America";"PAN" +"Central and South America";"PER" +"Asia Pacific";"PHL" +"Asia Pacific";"PLW" +"Asia Pacific";"PNG" +"Europe";"POL" +"Central and South America";"PRI" +"Asia Pacific";"PRK" +"Europe";"PRT" +"Central and South America";"PRY" +"Asia Pacific";"PSE" +"Middle East";"QAT" +"Europe";"ROU" +"Africa";"RWA" +"Middle East";"SAU" +"Africa";"SDN" +"Africa";"SEN" +"Asia Pacific";"SGP" +"Asia Pacific";"SLB" +"Africa";"SLE" +"Central and South America";"SLV" +"Africa";"SOM" +"Europe";"SRB" +"Africa";"STP" +"Europe";"SUN" +"Central and South America";"SUR" +"Europe";"SVK" +"Europe";"SVN" +"Europe";"SWE" +"Africa";"SWZ" +"Africa";"SYC" +"Middle East";"SYR" +"Central and South America";"TCA" +"Africa";"TCD" +"Africa";"TGO" +"Asia Pacific";"THA" +"Asia Pacific";"TKL" +"Asia Pacific";"TLS" +"Asia Pacific";"TON" +"Central and South America";"TTO" +"Africa";"TUN" +"Europe";"TUR" +"Asia Pacific";"TUV" +"Asia Pacific";"TWN" +"Africa";"TZA" +"Africa";"UGA" +"Central and South America";"URY" +"Central and South America";"VCT" +"Central and South America";"VEN" +"Central and South America";"VGB" +"Asia Pacific";"VNM" +"Asia Pacific";"VUT" +"Asia Pacific";"WSM" +"Asia Pacific";"YEM" +"Africa";"ZAF" +"Africa";"ZMB" +"Africa";"ZWE" +"North America";"USA" +"North America";"CAN" +"North America";"MEX" +"Eurasia";"RUS" +"Eurasia";"ARM" +"Eurasia";"MDA" +"Eurasia";"AZE" +"Eurasia";"TJK" +"Eurasia";"BLR" +"Eurasia";"KAZ" +"Eurasia";"TKM" +"Eurasia";"UKR" +"Eurasia";"KGZ" +"Eurasia";"UZB" diff --git a/inst/extdata/reportingVariables/Mapping_IEA_WEO_2021_complete.csv b/inst/extdata/reportingVariables/Mapping_IEA_WEO_2021_complete.csv deleted file mode 100644 index 0b0d97ba..00000000 --- a/inst/extdata/reportingVariables/Mapping_IEA_WEO_2021_complete.csv +++ /dev/null @@ -1,241 +0,0 @@ -WEO;Unit_WEO;REMIND;Conversion;Unit_REMIND -Capacity-Battery storage total-Installed total power capacity;GW;Cap|Electricity|Storage|Battery;1;GW -Capacity-Bioenergy and waste-Installed total power capacity;GW;Cap|Electricity|Biomass;1;GW -Capacity-Bioenergy with CCUS-Installed total power capacity;GW;Cap|Electricity|Biomass|w/ CC;1;GW -Capacity-Coal unabated-Installed total power capacity;GW;Cap|Electricity|Coal|w/o CC;1;GW -Capacity-Coal with CCUS-Installed total power capacity;GW;Cap|Electricity|Coal|w/ CC;1;GW -Capacity-Concentrating solar power-Installed total power capacity;GW;Cap|Electricity|Solar|CSP;1;GW -Capacity-Fossil fuels unabated-Installed total power capacity;GW;Cap|Electricity|Fossil|w/o CC;1;GW -Capacity-Fossil fuels with CCUS-Installed total power capacity;GW;Cap|Electricity|Fossil|w/ CC;1;GW -Capacity-Gas with CCUS-Installed total power capacity;GW;Cap|Electricity|Gas|w/ CC;1;GW -Capacity-Geothermal-Installed total power capacity;GW;Cap|Electricity|Geothermal;1;GW -Capacity-Hydro-Installed total power capacity;GW;Cap|Electricity|Hydro;1;GW -Capacity-Hydrogen based fuels-Installed total power capacity;GW;Cap|Electricity|Hydrogen;1;GW -Capacity-Natural gas unabated-Installed total power capacity;GW;Cap|Electricity|Gas|w/o CC;1;GW -Capacity-Nuclear-Installed total power capacity;GW;Cap|Electricity|Nuclear;1;GW -Capacity-Oil products-Installed total power capacity;GW;Cap|Electricity|Oil;1;GW -Capacity-Renewables-Installed total power capacity;GW;;; -Capacity-Solar PV-Installed total power capacity;GW;Cap|Electricity|Solar|PV;1;GW -Capacity-Tide and wave-Installed total power capacity;GW;;; -Capacity-Total-Installed total power capacity;GW;Cap|Electricity;1;GW -Capacity-Wind-Installed total power capacity;GW;Cap|Electricity|Wind;1;GW -CO2 atmospheric removal-Total-Direct air capture;Mt CO2;Emi|CO2|CDR|DACCS;-1;Mt CO2/yr -CO2 atmospheric removal-Total-Direct air capture;Mt CO2;Emi|CO2|CDR|BECCS;1;Mt CO2/yr -CO2 combustion and processes emissions-Total-Cement;Mt CO2;;; -CO2 combustion and processes emissions-Total-Chemical and petrochemical;Mt CO2;;; -CO2 combustion and processes emissions-Total-Industry;Mt CO2;;; -CO2 combustion and processes emissions-Total-Iron and steel;Mt CO2;;; -CO2 combustion and processes emissions-Total-Other energy sector;Mt CO2;;; -CO2 combustion and processes emissions-Total-Total final consumption;Mt CO2;;; -CO2 combustion-Bioenergy and waste-Power sector inputs;Mt CO2;;; -CO2 combustion-Bioenergy and waste-Total final consumption;Mt CO2;;; -CO2 combustion-Bioenergy and waste-Total primary energy demand;Mt CO2;;; -CO2 combustion-Coal-Power sector inputs;Mt CO2;;; -CO2 combustion-Coal-Total final consumption;Mt CO2;;; -CO2 combustion-Coal-Total primary energy demand;Mt CO2;;; -CO2 combustion-Natural gas-Power sector inputs;Mt CO2;;; -CO2 combustion-Natural gas-Total final consumption;Mt CO2;;; -CO2 combustion-Natural gas-Total primary energy demand;Mt CO2;;; -CO2 combustion-Oil products-Power sector inputs;Mt CO2;;; -CO2 combustion-Oil products-Total final consumption;Mt CO2;;; -CO2 combustion-Oil products-Total primary energy demand;Mt CO2;;; -CO2 combustion-Total-Buildings;Mt CO2;Emi|CO2|Energy|Demand|Buildings;1;Mt CO2/yr -CO2 combustion-Total-Power sector inputs;Mt CO2;Emi|CO2|Energy|Supply|Electricity w/ couple prod;1;Mt CO2/yr -CO2 combustion-Total-Residential;Mt CO2;;; -CO2 combustion-Total-Road;Mt CO2;Emi|CO2|Transport|Road|Demand;1;Mt CO2/yr -CO2 combustion-Total-Road heavy-duty trucks;Mt CO2;;; -CO2 combustion-Total-Road passenger light duty vehicle;Mt CO2;Emi|CO2|Transport|Pass|Road|LDV|Demand;1;Mt CO2/yr -CO2 combustion-Total-Services;Mt CO2;;; -CO2 combustion-Total-Total aviation (domestic and bunkers);Mt CO2;;; -CO2 combustion-Total-Total navigation (domestic and bunkers);Mt CO2;;; -CO2 combustion-Total-Total primary energy demand;Mt CO2;Emi|CO2|Energy;1;Mt CO2/yr -CO2 combustion-Total-Transport;Mt CO2;Emi|CO2|Energy|Demand|Transport;1;Mt CO2/yr -CO2 combustion, processes, removal-Total-Total all sectors;Mt CO2;;; -CO2 emissions intensity-Electricity-Electricity generation;gCO2 per kWh;;; -CO2 industrial processes captured and stored-Total-Biofuels production;Mt CO2;;; -CO2 industrial processes captured and used-Total-Total all sectors;Mt CO2;Carbon Management|Storage;1;Mt CO2/yr -CO2 removal-Total-Industry;Mt CO2;;; -CO2 removal-Total-Total all sectors;Mt CO2;Emi|CO2|CDR|BECCS;-1;Mt CO2/yr -Energy-Ammonia (total)-Power sector inputs;EJ;;; -Energy-Ammonia (total)-Total final consumption;EJ;;; -Energy-Bioenergy and waste-Electricity generation;TWh;SE|Electricity|Biomass;0.0036;EJ/yr -Energy-Bioenergy and waste-Power sector inputs;EJ;PE|Biomass|Electricity;1;EJ/yr -Energy-Bioenergy with CCUS-Electricity generation;TWh;SE|Electricity|Biomass|w/ CC;0.0036;EJ/yr -Energy-Biofuels-Biofuels production;EJ;SE|Liquids|Biomass;1;EJ/yr -Energy-Biofuels-Demand;Million barrels per day;;; -Energy-Biofuels-Transport;EJ;;; -Energy-Biomethane (total)-Buildings;EJ;;; -Energy-Biomethane (total)-Industry;EJ;;; -Energy-Biomethane (total)-Total final consumption;EJ;;; -Energy-Biomethane (total)-Transport;EJ;;; -Energy-Coal unabated-Electricity generation;TWh;SE|Electricity|Coal|w/o CC;0.0036;EJ/yr -Energy-Coal unabated-Industry;EJ;;; -Energy-Coal unabated-Power sector inputs;EJ;PE|Coal|Electricity;1;EJ/yr -Energy-Coal unabated-Total primary energy demand;EJ;PE|Coal;1;EJ/yr -Energy-Coal with CCUS-Electricity generation;TWh;SE|Electricity|Coal|w/ CC;0.0036;EJ/yr -Energy-Coal with CCUS-Industry;EJ;;; -Energy-Coal with CCUS-Power sector inputs;EJ;PE|Coal|Electricity|w/ CC;1;EJ/yr -Energy-Coal with CCUS-Total primary energy demand;EJ;PE|Coal;1;EJ/yr -Energy-Coal-Buildings;EJ;FE|Buildings|Solids|Fossil;1;EJ/yr -Energy-Coal-Net exports;Million tonnes of coal equivalent;;; -Energy-Coal-Net imports;Million tonnes of coal equivalent;;; -Energy-Coal-Net trade;Million tonnes of coal equivalent;;; -Energy-Coal-Power sector inputs;EJ;;; -Energy-Coal-Production;Million tonnes of coal equivalent;;; -Energy-Coal-Total final consumption;EJ;;; -Energy-Coal-Total primary energy demand;EJ;;; -Energy-Coal-Total primary energy demand;MTCE;;; -Energy-Coalbed methane-Production;Billion cubic metres;;; -Energy-Coking coal-Net trade;Million tonnes of coal equivalent;;; -Energy-Coking coal-Production;Million tonnes of coal equivalent;;; -Energy-Concentrating solar power-Electricity generation;TWh;SE|Electricity|Solar|CSP;0.0036;EJ/yr -Energy-Conventional gas-Production;Billion cubic metres;;; -Energy-Crude oil-Production;Million barrels per day;;; -Energy-CTL, GTL and additives-Demand;Million barrels per day;;; -Energy-Direct use of crude oil-Demand;Million barrels per day;;; -Energy-District heat-Buildings;EJ;FE|Buildings|Heat;1;EJ/yr -Energy-District heat-Industry;EJ;FE|Industry|Heat;1;EJ/yr -Energy-District heat-Total final consumption;EJ;FE|Heat;1;EJ/yr -Energy-Electricity-Buildings;EJ;FE|Buildings|Electricity;1;EJ/yr -Energy-Electricity-Industry;EJ;FE|Industry|Electricity;1;EJ/yr -Energy-Electricity-Total final consumption;EJ;FE|Electricity;1;EJ/yr -Energy-Electricity-Transport;EJ;FE|Transport|Electricity;1;EJ/yr -Energy-Extra-heavy oil and bitumen-Production;Million barrels per day;;; -Energy-Fossil fuels unabated-Electricity generation;TWh;SE|Electricity|Fossil|w/o CC;0.0036;EJ/yr -Energy-Fossil fuels with CCUS-Electricity generation;TWh;SE|Electricity|Fossil|w/ CC;0.0036;EJ/yr -Energy-Gas with CCUS-Electricity generation;TWh;SE|Electricity|Gas|w/ CC;0.0036;EJ/yr -Energy-Gas with CCUS-Industry;EJ;;; -Energy-Gas with CCUS-Power sector inputs;EJ;PE|Gas|Electricity|w/ CC;1;EJ/yr -Energy-Gas with CCUS-Total primary energy demand;EJ;PE|Gas;1;EJ/yr -Energy-Geothermal-Electricity generation;TWh;SE|Electricity|Geothermal;0.0036;EJ/yr -Energy-Hydro-Electricity generation;TWh;SE|Electricity|Hydro;0.0036;EJ/yr -Energy-Hydro-Power sector inputs;EJ;;; -Energy-Hydro-Total primary energy demand;EJ;PE|Hydro;1;EJ/yr -Energy-Hydrogen (low-emissions)-Supply;EJ;SE|Hydrogen|Electricity;1;EJ/yr -Energy-Hydrogen (total)-Buildings;EJ;FE|Buildings|Hydrogen;1;EJ/yr -Energy-Hydrogen (total)-Industry;EJ;FE|Industry|Hydrogen;1;EJ/yr -Energy-Hydrogen (total)-Power sector inputs;EJ;SE|Input|Hydrogen|Electricity;1;EJ/yr -Energy-Hydrogen (total)-Total final consumption;EJ;FE|Hydrogen;1;EJ/yr -Energy-Hydrogen (total)-Transport;EJ;FE|Transport|Hydrogen;1;EJ/yr -Energy-Hydrogen based fuels-Electricity generation;TWh;SE|Electricity|Hydrogen;0.0036;EJ/yr -Energy-Hydrogen based gaseous fuels-Total final consumption;EJ;;; -Energy-Hydrogen based liquid fuels-Total final consumption;EJ;;; -Energy-Lignite and peat-Production;Million tonnes of coal equivalent;;; -Energy-Liquids-Demand;Million barrels per day;;; -Energy-LNG-Net trade;Billion cubic metres;;; -Energy-Modern biomass gas-Total primary energy demand;EJ;FE|Gases|Biomass;1;EJ/yr -Energy-Modern biomass gas-Total primary energy demand;EJ;PE|Biomass;1;EJ/yr -Energy-Modern biomass liquid-Buildings;EJ;FE|Buildings|Liquids|Biomass;1;EJ/yr -Energy-Modern biomass liquid-Total final consumption;EJ;FE|Liquids|Biomass;1;EJ/yr -Energy-Modern biomass liquid-Total primary energy demand;EJ;PE|Biomass;1;EJ/yr -Energy-Modern biomass solid-Buildings;EJ;FE|Buildings|Solids|Biomass|Modern;1;EJ/yr -Energy-Modern biomass solid-Industry;EJ;;; -Energy-Modern biomass solid-Total primary energy demand;EJ;FE|Solids|Biomass|Modern;1;EJ/yr -Energy-Modern biomass solid-Total primary energy demand;EJ;PE|Biomass;1;EJ/yr -Energy-Modern biomass-Total primary energy demand;EJ;;; -Energy-Natural gas liquids-Production;Million barrels per day;;; -Energy-Natural gas unabated-Electricity generation;TWh;SE|Electricity|Gas|w/o CC;0.0036;EJ/yr -Energy-Natural gas unabated-Industry;EJ;;; -Energy-Natural gas unabated-Power sector inputs;EJ;PE|Gas|Electricity;1;EJ/yr -Energy-Natural gas unabated-Total primary energy demand;EJ;PE|Gas;1;EJ/yr -Energy-Natural gas-Buildings;EJ;;; -Energy-Natural gas-International bunkers;BCM;;; -Energy-Natural gas-Net exports;Billion cubic metres;;; -Energy-Natural gas-Net imports;Billion cubic metres;;; -Energy-Natural gas-Net trade;Billion cubic metres;;; -Energy-Natural gas-Power sector inputs;EJ;;; -Energy-Natural gas-Price;US dollars per million British thermal units;;; -Energy-Natural gas-Production;Billion cubic metres;;; -Energy-Natural gas-Total final consumption;EJ;;; -Energy-Natural gas-Total primary energy demand;EJ;;; -Energy-Natural gas-Total primary energy demand;BCM;;; -Energy-Natural gas-Transport;EJ;;; -Energy-Nuclear-Electricity generation;TWh;SE|Electricity|Nuclear;0.0036;EJ/yr -Energy-Nuclear-Power sector inputs;EJ;;; -Energy-Nuclear-Total primary energy demand;EJ;PE|Nuclear;1;EJ/yr -Energy-Oil products-Buildings;EJ;FE|Buildings|Liquids|Fossil|Oil;1;EJ/yr -Energy-Oil products-Demand;Million barrels per day;;; -Energy-Oil products-Electricity generation;TWh;;; -Energy-Oil products-Industry;EJ;;; -Energy-Oil products-International bunkers;MBD;;; -Energy-Oil products-Non-energy use;EJ;;; -Energy-Oil products-Power sector inputs;EJ;;; -Energy-Oil products-Total final consumption;EJ;FE|Liquids|Fossil|Oil;1;EJ/yr -Energy-Oil products-Total primary energy demand;EJ;PE|Oil;1;EJ/yr -Energy-Oil products-Total primary energy demand;MBD;;; -Energy-Oil products-Transport;EJ;FE|Transport|Liquids|Fossil|Oil;1;EJ/yr -Energy-Oil-Capacity at risk;Million barrels per day;;; -Energy-Oil-Demand;Million barrels per day;;; -Energy-Oil-Net exports;Million barrels per day;;; -Energy-Oil-Net imports;Million barrels per day;;; -Energy-Oil-Processing gains;Million barrels per day;;; -Energy-Oil-Production;Million barrels per day;;; -Energy-Oil-Refinery runs;Million barrels per day;;; -Energy-Oil-Refining capacity;Million barrels per day;;; -Energy-Oil-Supply;Million barrels per day;;; -Energy-Other-Production;Million barrels per day;;; -Energy-Other-Production;Billion cubic metres;;; -Energy-Pipeline-Net trade;Billion cubic metres;;; -Energy-Renewables-Electricity generation;TWh;;; -Energy-Renewables-Power sector inputs;EJ;;; -Energy-Renewables-Total primary energy demand;EJ;;; -Energy-Shale gas-Production;Billion cubic metres;;; -Energy-Solar PV-Electricity generation;TWh;SE|Electricity|Solar|PV;0.0036;EJ/yr -Energy-Solar PV-Power sector inputs;EJ;;; -Energy-Solar-Total primary energy demand;EJ;PE|Solar;1;EJ/yr -Energy-Solid biomass incl_ TUOB-Total final consumption;EJ;;; -Energy-Steam coal-Net trade;Million tonnes of coal equivalent;;; -Energy-Steam coal-Price;US dollars per tonne;;; -Energy-Steam coal-Production;Million tonnes of coal equivalent;;; -Energy-Synthetic methane (total)-Total final consumption;EJ;;; -Energy-Synthetic oil products (total)-Total final consumption;EJ;;; -Energy-Tide and wave-Electricity generation;TWh;;; -Energy-Tight gas-Production;Billion cubic metres;;; -Energy-Tight oil-Production;Million barrels per day;;; -Energy-Total gases-Buildings;EJ;FE|Buildings|Gases;1;EJ/yr -Energy-Total gases-Industry;EJ;FE|Industry|Gases;1;EJ/yr -Energy-Total gases-Total final consumption;EJ;FE|Gases;1;EJ/yr -Energy-Total gases-Transport;EJ;FE|Transport|Gases;1;EJ/yr -Energy-Total liquids-Buildings;EJ;FE|Buildings|Liquids;1;EJ/yr -Energy-Total liquids-Industry;EJ;FE|Industry|Liquids;1;EJ/yr -Energy-Total liquids-Total final consumption;EJ;FE|Liquids;1;EJ/yr -Energy-Total liquids-Transport;EJ;FE|Transport|Liquids;1;EJ/yr -Energy-Total solid fuels-Buildings;EJ;FE|Buildings|Solids;1;EJ/yr -Energy-Total solid fuels-Industry;EJ;FE|Industry|Solids;1;EJ/yr -Energy-Total solid fuels-Total final consumption;EJ;FE|Solids;1;EJ/yr -Energy-Total-Buildings;EJ;FE|Buildings;1;EJ/yr -Energy-Total-Cement;EJ;;; -Energy-Total-Chemical and petrochemical;EJ;;; -Energy-Total-Electricity generation;TWh;SE|Electricity;0.0036;EJ/yr -Energy-Total-Industry;EJ;FE|Industry;1;EJ/yr -Energy-Total-Iron and steel;EJ;FE|Industry|Steel;1;EJ/yr -Energy-Total-Other energy sector;EJ;;; -Energy-Total-Power sector inputs;EJ;;; -Energy-Total-Residential;EJ;;; -Energy-Total-Road;EJ;FE|Transport|Road;1;EJ/yr -Energy-Total-Road heavy-duty trucks;EJ;;; -Energy-Total-Road passenger light duty vehicle;EJ;FE|Transport|Pass|Road|LDV;1;EJ/yr -Energy-Total-Services;EJ;;; -Energy-Total-Total aviation (domestic and bunkers);EJ;;; -Energy-Total-Total final consumption;EJ;FE;1;EJ/yr -Energy-Total-Total navigation (domestic and bunkers);EJ;FE|Transport|Freight|International Shipping;1;EJ/yr -Energy-Total-Total primary energy demand;EJ;PE;1;EJ/yr -Energy-Total-Transport;EJ;FE|Transport;1;EJ/yr -Energy-Traditional use of biomass-Residential;EJ;FE|Buildings|Solids|Biomass|Traditional;1;EJ/yr -Energy-Traditional use of biomass-Total primary energy demand;EJ;PE|Biomass;1;EJ/yr -Energy-Traditional use of biomass-Total primary energy demand;EJ;PE|Biomass|Traditional;1;EJ/yr -Energy-Wind-Electricity generation;TWh;SE|Electricity|Wind;0.0036;EJ/yr -Energy-Wind-Power sector inputs;EJ;;; -Energy-Wind-Total primary energy demand;EJ;PE|Wind;1;EJ/yr -Share of demand-Coal-Net imports;Percentage;;; -Share of demand-Natural gas-Net imports;Percentage;;; -Share of demand-Oil-Net imports;Percentage;;; -Share of production-Coal-Net exports;Percentage;;; -Share of production-Coal-Net trade;Percentage;;; -Share of production-Coking coal-Net trade;Percentage;;; -Share of production-LNG-Net trade;Percentage;;; -Share of production-Natural gas-Net exports;Percentage;;; -Share of production-Natural gas-Net trade;Percentage;;; -Share of production-Oil-Net exports;Percentage;;; -Share of production-Pipeline-Net trade;Percentage;;; -Share of production-Steam coal-Net trade;Percentage;;; diff --git a/inst/extdata/reportingVariables/Mapping_IEA_WEO_complete.csv b/inst/extdata/reportingVariables/Mapping_IEA_WEO_complete.csv new file mode 100644 index 00000000..67a2459d --- /dev/null +++ b/inst/extdata/reportingVariables/Mapping_IEA_WEO_complete.csv @@ -0,0 +1,311 @@ +Variable;REMIND;Conversion +Activity of stock-Total-International marine bunkers (Billion tonne-km);; +Activity of stock-Total-Road freight trucks (Billion tonne-km);; +Activity of stock-Total-Road heavy-duty trucks (Billion tonne-km);; +Activity of stock-Total-Road passenger light duty vehicle (Billion passenger-km);; +Activity of stock-Total-Total aviation (domestic and bunkers) (Billion passenger-km);; +Capacity: installed-Battery storage-Electrical capacity (GW);Cap|Electricity|Storage|Battery (GW);1 +Capacity: installed-Bioenergy: with CCUS-Electrical capacity (GW);Cap|Electricity|Biomass|w/ CC (GW);1 +Capacity: installed-Coal: unabated-Electrical capacity (GW);Cap|Electricity|Coal|w/o CC (GW);1 +Capacity: installed-Coal: with CCUS-Electrical capacity (GW);Cap|Electricity|Coal|w/ CC (GW);1 +Capacity: installed-Concentrating solar power-Electrical capacity (GW);Cap|Electricity|Solar|CSP (GW);1 +Capacity: installed-Fossil fuels: unabated-Electrical capacity (GW);Cap|Electricity|Fossil|w/o CC (GW);1 +Capacity: installed-Fossil fuels: with CCUS-Electrical capacity (GW);Cap|Electricity|Fossil|w/ CC (GW);1 +Capacity: installed-Geothermal-Electrical capacity (GW);Cap|Electricity|Geothermal (GW);1 +Capacity: installed-Hydro-Electrical capacity (GW);Cap|Electricity|Hydro (GW);1 +Capacity: installed-Hydrogen and H2-based fuels-Electrical capacity (GW);Cap|Electricity|Hydrogen (GW);1 +Capacity: installed-Marine-Electrical capacity (GW);; +Capacity: installed-Modern bioenergy and renewable waste-Electrical capacity (GW);Cap|Electricity|Biomass (GW);1 +Capacity: installed-Natural gas: unabated-Electrical capacity (GW);Cap|Electricity|Gas|w/o CC (GW);1 +Capacity: installed-Natural gas: with CCUS-Electrical capacity (GW);Cap|Electricity|Gas|w/ CC (GW);1 +Capacity: installed-Nuclear-Electrical capacity (GW);Cap|Electricity|Nuclear (GW);1 +Capacity: installed-Oil-Electrical capacity (GW);Cap|Electricity|Oil (GW);1 +Capacity: installed-Renewables-Electrical capacity (GW);; +Capacity: installed-Solar PV-Electrical capacity (GW);Cap|Electricity|Solar|PV (GW);1 +Capacity: installed-Total-Electrical capacity (GW);Cap|Electricity (GW);1 +Capacity: installed-Wind-Electrical capacity (GW);Cap|Electricity|Wind (GW);1 +CO2 combustion and process-Total-Chemicals (Mt CO2);; +CO2 combustion and process-Total-Industry (Mt CO2);; +CO2 combustion and process-Total-Iron and steel (Mt CO2);; +CO2 combustion and process-Total-Non-ferrous metals: aluminium (Mt CO2);; +CO2 combustion and process-Total-Non-metallic minerals: cement (Mt CO2);; +CO2 combustion and process-Total-Other energy sector (Mt CO2);; +CO2 combustion and process-Total-Total final consumption (Mt CO2);; +CO2 combustion-Bioenergy and waste-Power sector inputs (Mt CO2);; +CO2 combustion-Bioenergy and waste-Total energy supply (Mt CO2);; +CO2 combustion-Bioenergy and waste-Total final consumption (Mt CO2);; +CO2 combustion-Coal-Power sector inputs (Mt CO2);; +CO2 combustion-Coal-Total energy supply (Mt CO2);; +CO2 combustion-Coal-Total final consumption (Mt CO2);; +CO2 combustion-Natural gas-Power sector inputs (Mt CO2);; +CO2 combustion-Natural gas-Total energy supply (Mt CO2);; +CO2 combustion-Natural gas-Total final consumption (Mt CO2);; +CO2 combustion-Oil-Power sector inputs (Mt CO2);; +CO2 combustion-Oil-Total energy supply (Mt CO2);; +CO2 combustion-Oil-Total final consumption (Mt CO2);; +CO2 combustion-Total-Buildings (Mt CO2);Emi|CO2|Energy|Demand|Buildings (Mt CO2/yr);1 +CO2 combustion-Total-Power sector inputs (Mt CO2);Emi|CO2|Energy|Supply|Electricity w/ couple prod (Mt CO2/yr);1 +CO2 combustion-Total-Residential (Mt CO2);; +CO2 combustion-Total-Road (Mt CO2);Emi|CO2|Transport|Road|Demand (Mt CO2/yr);1 +CO2 combustion-Total-Road heavy-duty trucks (Mt CO2);; +CO2 combustion-Total-Road passenger light duty vehicle (Mt CO2);Emi|CO2|Transport|Pass|Road|LDV|Demand (Mt CO2/yr);1 +CO2 combustion-Total-Services (Mt CO2);; +CO2 combustion-Total-Total aviation (domestic and bunkers) (Mt CO2);; +CO2 combustion-Total-Total energy supply (Mt CO2);Emi|CO2|Energy (Mt CO2/yr);1 +CO2 combustion-Total-Total navigation (domestic and bunkers) (Mt CO2);; +CO2 combustion-Total-Transport (Mt CO2);Emi|CO2|Energy|Demand|Transport (Mt CO2/yr);1 +CO2 DAC stored-Total-Direct air capture: offsite (Mt CO2);; +CO2 process stored-Modern bioenergy: liquid-Biofuels production (Mt CO2);; +CO2 total captured-Total-Total energy supply (Mt CO2);; +CO2 total intensity-Electricity-Electricity generation (gCO2 per kWh);; +CO2 total removed-Total-Biofuels production and direct air capture (Mt CO2);; +CO2 total removed-Total-Total energy supply (Mt CO2);; +CO2 total-Total-Total energy supply (Mt CO2);; +Economic indicators-Floorspace-Services (Million square meters);; +Economic indicators-Total-GDP per capita (USD per capita (2022, PPP));; +Economic indicators-Total-Gross domestic product (Billion USD (2022, PPP));; +Economic indicators-Total-Household (Million units);; +Energy intensity-Total-TES per GDP (GJ per thousand USD (2022, PPP));; +Energy intensity-Total-Total final consumption per GDP (GJ per thousand USD (2022, PPP));; +Energy-Ammonia-Power sector inputs (EJ);; +Energy-Ammonia-Total final consumption (EJ);; +Energy-Bioenergy: with CCUS-Electricity generation (TWh);SE|Electricity|Biomass|w/ CC (EJ/yr);0.0036 +Energy-Biomethane-Buildings (EJ);; +Energy-Biomethane-Industry (EJ);; +Energy-Biomethane-Total final consumption (EJ);; +Energy-Biomethane-Transport (EJ);; +Energy-Coal-Buildings (EJ);FE|Buildings|Solids|Fossil (EJ/yr);1 +Energy-Coal-Net exports (Million tonnes of coal equivalent);; +Energy-Coal-Net imports (Million tonnes of coal equivalent);; +Energy-Coal-Net trade (Million tonnes of coal equivalent);; +Energy-Coal-Power sector inputs (EJ);; +Energy-Coal-Production (Million tonnes of coal equivalent);; +Energy-Coal-Total energy supply (EJ);; +Energy-Coal-Total energy supply (Million tonnes of coal equivalent);; +Energy-Coal-Total final consumption (EJ);; +Energy-Coal: unabated-Electricity generation (TWh);SE|Electricity|Coal|w/o CC (EJ/yr);0.0036 +Energy-Coal: unabated-Industry (EJ);; +Energy-Coal: unabated-Power sector inputs (EJ);PE|Coal|Electricity (EJ/yr);1 +Energy-Coal: unabated-Total energy supply (EJ);PE|Coal (EJ/yr);1 +Energy-Coal: with CCUS-Electricity generation (TWh);SE|Electricity|Coal|w/ CC (EJ/yr);0.0036 +Energy-Coal: with CCUS-Industry (EJ);; +Energy-Coal: with CCUS-Power sector inputs (EJ);PE|Coal|Electricity|w/ CC (EJ/yr);1 +Energy-Coal: with CCUS-Total energy supply (EJ);PE|Coal (EJ/yr);1 +Energy-Coalbed methane-Production (Billion cubic metres);; +Energy-Coking coal-Net trade (Million tonnes of coal equivalent);; +Energy-Coking coal-Production (Million tonnes of coal equivalent);; +Energy-Concentrating solar power-Electricity generation (TWh);SE|Electricity|Solar|CSP (EJ/yr);0.0036 +Energy-Conventional crude oil-Production (Million barrels per day);; +Energy-Conventional gas-Production (Billion cubic metres);; +Energy-CTL, GTL and additives-Demand (Million barrels per day);; +Energy-Diesel-Demand (Million barrels per day);; +Energy-Direct use of crude oil-Demand (Million barrels per day);; +Energy-District heat-Buildings (EJ);FE|Buildings|Heat (EJ/yr);1 +Energy-District heat-Industry (EJ);FE|Industry|Heat (EJ/yr);1 +Energy-District heat-Total final consumption (EJ);FE|Heat (EJ/yr);1 +Energy-Electricity-Buildings (EJ);FE|Buildings|Electricity (EJ/yr);1 +Energy-Electricity-Industry (EJ);FE|Industry|Electricity (EJ/yr);1 +Energy-Electricity-Total final consumption (EJ);FE|Electricity (EJ/yr);1 +Energy-Electricity-Transport (EJ);FE|Transport|Electricity (EJ/yr);1 +Energy-Extra-heavy oil and bitumen-Production (Million barrels per day);; +Energy-Fossil fuels: unabated-Electricity generation (TWh);SE|Electricity|Fossil|w/o CC (EJ/yr);0.0036 +Energy-Fossil fuels: with CCUS-Electricity generation (TWh);SE|Electricity|Fossil|w/ CC (EJ/yr);0.0036 +Energy-Fuel oil-Demand (Million barrels per day);; +Energy-Gasoline-Demand (Million barrels per day);; +Energy-Geothermal-Electricity generation (TWh);SE|Electricity|Geothermal (EJ/yr);0.0036 +Energy-Hydro-Electricity generation (TWh);SE|Electricity|Hydro (EJ/yr);0.0036 +Energy-Hydro-Power sector inputs (EJ);; +Energy-Hydro-Total energy supply (EJ);PE|Hydro (EJ/yr);1 +Energy-Hydrogen and H2-based fuels-Electricity generation (TWh);SE|Electricity|Hydrogen (EJ/yr);0.0036 +Energy-Hydrogen based fuels-Demand (Million barrels per day);; +Energy-Hydrogen-based fuels: liquid-Total final consumption (EJ);; +Energy-Hydrogen-Bioenergy and other (Million tonnes);; +Energy-Hydrogen-Buildings (EJ);FE|Buildings|Hydrogen (EJ/yr);1 +Energy-Hydrogen-Final demand (EJ);FE|Industry|Hydrogen (EJ/yr);1 +Energy-Hydrogen-Fossil fuels with CCUS (Million tonnes);; +Energy-Hydrogen-Hydrogen demand for end-use sectors (Million tonnes);; +Energy-Hydrogen-In oil refining (Million tonnes);; +Energy-Hydrogen-Industry (EJ);; +Energy-Hydrogen-International bunkers (EJ);; +Energy-Hydrogen-Low-emissions hydrogen production (Million tonnes);; +Energy-Hydrogen-Low-emissions hydrogen-based fuels (Million tonnes);; +Energy-Hydrogen-Power generation (Million tonnes);; +Energy-Hydrogen-Power sector inputs (EJ);SE|Input|Hydrogen|Electricity (EJ/yr);1 +Energy-Hydrogen-To biofuels (Million tonnes);; +Energy-Hydrogen-To hydrogen-based fuels (Million tonnes);; +Energy-Hydrogen-To power generation (Million tonnes);; +Energy-Hydrogen-Total final consumption (EJ);FE|Hydrogen (EJ/yr);1 +Energy-Hydrogen-Total final consumption (Million tonnes);; +Energy-Hydrogen-Trade (Million tonnes);; +Energy-Hydrogen-Trade as share of demand (Million tonnes);; +Energy-Hydrogen-Transformation of hydrogen (Million tonnes);; +Energy-Hydrogen-Transport (EJ);FE|Transport|Hydrogen (EJ/yr);1 +Energy-Hydrogen-Water electrolysis (Million tonnes);; +Energy-Hydrogen: low emissions-Hydrogen production inputs: offsite (EJ);; +Energy-Hydrogen: low emissions-Hydrogen production: offsite (EJ);; +Energy-Hydrogen: low emissions-Hydrogen-based fuels production inputs (EJ);SE|Hydrogen|Electricity (EJ/yr);1 +Energy-Kerosene-Demand (Million barrels per day);; +Energy-Lignite and peat-Production (Million tonnes of coal equivalent);; +Energy-Liquids-Demand (Million barrels per day);; +Energy-LNG-Net trade (Billion cubic metres);; +Energy-LPG and ethane-Demand (Million barrels per day);; +Energy-Marine-Electricity generation (TWh);; +Energy-Modern bioenergy and renewable waste-Electricity generation (TWh);SE|Electricity|Biomass (EJ/yr);0.0036 +Energy-Modern bioenergy and renewable waste-Power sector inputs (EJ);PE|Biomass|Electricity (EJ/yr);1 +Energy-Modern bioenergy-Total energy supply (EJ);PE|Biomass (EJ/yr);1 +Energy-Modern bioenergy: gas-Total energy supply (EJ);FE|Gases|Biomass (EJ/yr);1 +Energy-Modern bioenergy: gas-Total energy supply (EJ);PE|Biomass (EJ/yr);1 +Energy-Modern bioenergy: liquid-Buildings (EJ);FE|Buildings|Liquids|Biomass (EJ/yr);1 +Energy-Modern bioenergy: liquid-Total energy supply (EJ);; +Energy-Modern bioenergy: liquid-Total final consumption (EJ);FE|Liquids|Biomass (EJ/yr);1 +Energy-Modern bioenergy: liquid-Transport (EJ);; +Energy-Modern bioenergy: solid-Buildings (EJ);FE|Buildings|Solids|Biomass|Modern (EJ/yr);1 +Energy-Modern bioenergy: solid-Industry (EJ);; +Energy-Modern bioenergy: solid-Total energy supply (EJ);FE|Solids|Biomass|Modern (EJ/yr);1 +Energy-Modern bioenergy: solid-Total energy supply (EJ);PE|Biomass (EJ/yr);1 +Energy-Naphtha-Demand (Million barrels per day);; +Energy-Natural gas liquids-Production (Million barrels per day);; +Energy-Natural gas-Buildings (EJ);; +Energy-Natural gas-Net exports (Billion cubic metres);; +Energy-Natural gas-Net imports (Billion cubic metres);; +Energy-Natural gas-Net trade (Billion cubic metres);; +Energy-Natural gas-Power sector inputs (EJ);; +Energy-Natural gas-Price (US dollars per million British thermal units);; +Energy-Natural gas-Production (Billion cubic metres);; +Energy-Natural gas-Total energy supply (Billion cubic metres);; +Energy-Natural gas-Total energy supply (EJ);; +Energy-Natural gas-Total final consumption (EJ);; +Energy-Natural gas-Transport (EJ);; +Energy-Natural gas: unabated-Electricity generation (TWh);SE|Electricity|Gas|w/o CC (EJ/yr);0.0036 +Energy-Natural gas: unabated-Industry (EJ);; +Energy-Natural gas: unabated-Power sector inputs (EJ);PE|Gas|Electricity (EJ/yr);1 +Energy-Natural gas: unabated-Total energy supply (EJ);PE|Gas (EJ/yr);1 +Energy-Natural gas: with CCUS-Electricity generation (TWh);SE|Electricity|Gas|w/ CC (EJ/yr);0.0036 +Energy-Natural gas: with CCUS-Industry (EJ);; +Energy-Natural gas: with CCUS-Power sector inputs (EJ);PE|Gas|Electricity|w/ CC (EJ/yr);1 +Energy-Natural gas: with CCUS-Total energy supply (EJ);PE|Gas (EJ/yr);1 +Energy-Nuclear-Electricity generation (TWh);SE|Electricity|Nuclear (EJ/yr);0.0036 +Energy-Nuclear-Power sector inputs (EJ);; +Energy-Nuclear-Total energy supply (EJ);PE|Nuclear (EJ/yr);1 +Energy-Oil products-Demand (Million barrels per day);; +Energy-Oil-Buildings (EJ);FE|Buildings|Liquids|Fossil|Oil (EJ/yr);1 +Energy-Oil-Demand (Million barrels per day);; +Energy-Oil-Electricity generation (TWh);; +Energy-Oil-Industry (EJ);; +Energy-Oil-Net exports (Million barrels per day);; +Energy-Oil-Net imports (Million barrels per day);; +Energy-Oil-Non-energy use (EJ);; +Energy-Oil-Power sector inputs (EJ);; +Energy-Oil-Price (US dollars per barrel);; +Energy-Oil-Processing gains (Million barrels per day);; +Energy-Oil-Production (Million barrels per day);; +Energy-Oil-Supply (Million barrels per day);; +Energy-Oil-Total energy supply (EJ);PE|Oil (EJ/yr);1 +Energy-Oil-Total energy supply (Million barrels per day);; +Energy-Oil-Total final consumption (EJ);FE|Liquids|Fossil|Oil (EJ/yr);1 +Energy-Oil-Transport (EJ);FE|Transport|Liquids|Fossil|Oil (EJ/yr);1 +Energy-Other products-Demand (Million barrels per day);; +Energy-Other-Production (Billion cubic metres);; +Energy-Other-Production (Million barrels per day);; +Energy-Pipeline-Net trade (Billion cubic metres);; +Energy-Products from NGLs-Demand (Million barrels per day);; +Energy-Refinery market share-Demand (Percentage);; +Energy-Refinery products-Demand (Million barrels per day);; +Energy-Renewables-Electricity generation (TWh);; +Energy-Renewables-Power sector inputs (EJ);; +Energy-Renewables-Total energy supply (EJ);; +Energy-Shale gas-Production (Billion cubic metres);; +Energy-Solar PV-Electricity generation (TWh);SE|Electricity|Solar|PV (EJ/yr);0.0036 +Energy-Solar PV-Power sector inputs (EJ);; +Energy-Solar-Total energy supply (EJ);PE|Solar (EJ/yr);1 +Energy-Solid bioenergy incl_ TUOB-Total final consumption (EJ);; +Energy-Steam coal-Net trade (Million tonnes of coal equivalent);; +Energy-Steam coal-Price (US dollars per tonne);; +Energy-Steam coal-Production (Million tonnes of coal equivalent);; +Energy-Synthetic methane-Total final consumption (EJ);; +Energy-Synthetic oil products-Total final consumption (EJ);; +Energy-Tight gas-Production (Billion cubic metres);; +Energy-Tight oil-Production (Million barrels per day);; +Energy-Total gases-Buildings (EJ);FE|Buildings|Gases (EJ/yr);1 +Energy-Total gases-Industry (EJ);FE|Industry|Gases (EJ/yr);1 +Energy-Total gases-Total final consumption (EJ);FE|Gases (EJ/yr);1 +Energy-Total gases-Transport (EJ);FE|Transport|Gases (EJ/yr);1 +Energy-Total liquids-Buildings (EJ);FE|Buildings|Liquids (EJ/yr);1 +Energy-Total liquids-Industry (EJ);FE|Industry|Liquids (EJ/yr);1 +Energy-Total liquids-Total final consumption (EJ);FE|Liquids (EJ/yr);1 +Energy-Total liquids-Transport (EJ);FE|Transport|Liquids (EJ/yr);1 +Energy-Total solid fuels-Buildings (EJ);FE|Buildings|Solids (EJ/yr);1 +Energy-Total solid fuels-Industry (EJ);FE|Industry|Solids (EJ/yr);1 +Energy-Total solid fuels-Total final consumption (EJ);FE|Solids (EJ/yr);1 +Energy-Total-Biofuels production: own use (EJ);SE|Liquids|Biomass (EJ/yr);1 +Energy-Total-Buildings (EJ);FE|Buildings (EJ/yr);1 +Energy-Total-Chemicals (EJ);; +Energy-Total-Electricity generation (TWh);SE|Electricity (EJ/yr);0.0036 +Energy-Total-Industry (EJ);FE|Industry (EJ/yr);1 +Energy-Total-Iron and steel (EJ);FE|Industry|Steel (EJ/yr);1 +Energy-Total-Non-ferrous metals: aluminium (EJ);; +Energy-Total-Non-metallic minerals: cement (EJ);; +Energy-Total-Other energy sector (EJ);; +Energy-Total-Power sector inputs (EJ);; +Energy-Total-Refinery runs (Million barrels per day);; +Energy-Total-Refining capacity (Million barrels per day);; +Energy-Total-Refining capacity: capacity at risk (Million barrels per day);; +Energy-Total-Residential (EJ);; +Energy-Total-Road (EJ);FE|Transport|Road (EJ/yr);1 +Energy-Total-Road heavy-duty trucks (EJ);; +Energy-Total-Road passenger light duty vehicle (EJ);FE|Transport|Pass|Road|LDV (EJ/yr);1 +Energy-Total-Services (EJ);; +Energy-Total-Total aviation (domestic and bunkers) (EJ);; +Energy-Total-Total energy supply (EJ);PE (EJ/yr);1 +Energy-Total-Total final consumption (EJ);FE (EJ/yr);1 +Energy-Total-Total navigation (domestic and bunkers) (EJ);FE|Transport|Freight|International Shipping (EJ/yr);1 +Energy-Total-Transport (EJ);FE|Transport (EJ/yr);1 +Energy-Traditional use of biomass-Residential (EJ);FE|Buildings|Solids|Biomass|Traditional (EJ/yr);1 +Energy-Traditional use of biomass-Total energy supply (EJ);PE|Biomass (EJ/yr);1 +Energy-Traditional use of biomass-Total energy supply (EJ);PE|Biomass|Traditional (EJ/yr);1 +Energy-Wind-Electricity generation (TWh);SE|Electricity|Wind (EJ/yr);0.0036 +Energy-Wind-Power sector inputs (EJ);; +Energy-Wind-Total energy supply (EJ);PE|Wind (EJ/yr);1 +Industrial material production-Aluminium-Non-ferrous metals: aluminium (excl internal scrap) (Million tonnes);; +Industrial material production-Cement-Non-metallic minerals: cement (Million tonnes);; +Industrial material production-Crude steel-Iron and steel (Million tonnes);; +Industrial material production-Primary chemicals-Chemicals (Million tonnes);; +Investment spending, annual average-Battery storage-Generation (Billion US dollars);; +Investment spending, annual average-Coal-Generation (Billion US dollars);; +Investment spending, annual average-Coal-Supply (Billion US dollars);; +Investment spending, annual average-Electricity-Transmission and distribution (Billion US dollars);; +Investment spending, annual average-Fossil fuels with CCUS-Generation (Billion US dollars);; +Investment spending, annual average-Fuels-Supply (Billion US dollars);; +Investment spending, annual average-Gas-Generation (Billion US dollars);; +Investment spending, annual average-Hydro-Generation (Billion US dollars);; +Investment spending, annual average-Hydrogen and Hydrogen-based fuels-Supply (Billion US dollars);; +Investment spending, annual average-Liquid biofuels and biogases-Supply (Billion US dollars);; +Investment spending, annual average-Nuclear-Generation (Billion US dollars);; +Investment spending, annual average-Oil and gas-Supply (Billion US dollars);; +Investment spending, annual average-Other-Generation (Billion US dollars);; +Investment spending, annual average-Renewables and other-Supply, power and end-use (Billion US dollars);; +Investment spending, annual average-Renewables-Generation (Billion US dollars);; +Investment spending, annual average-Solar PV-Generation (Billion US dollars);; +Investment spending, annual average-Total-Direct air capture (Billion US dollars);; +Investment spending, annual average-Total-End-use (Billion US dollars);; +Investment spending, annual average-Total-Energy efficiency (Billion US dollars);; +Investment spending, annual average-Total-Fuels and Power (Billion US dollars);; +Investment spending, annual average-Total-Generation (Billion US dollars);; +Investment spending, annual average-Total-Power (Billion US dollars);; +Investment spending, annual average-Total-Supply, power and end-use (Billion US dollars);; +Investment spending, annual average-Unabated fossil fuels-Generation (Billion US dollars);; +Investment spending, annual average-Wind-Generation (Billion US dollars);; +Population indicators-Total-Population (Million people);; +Share of demand-Coal-Net imports (Percentage);; +Share of demand-Natural gas-Net imports (Percentage);; +Share of demand-Oil-Net imports (Percentage);; +Share of production-Coal-Net exports (Percentage);; +Share of production-Coal-Net trade (Percentage);; +Share of production-Coking coal-Net trade (Percentage);; +Share of production-LNG-Net trade (Percentage);; +Share of production-Natural gas-Net exports (Percentage);; +Share of production-Natural gas-Net trade (Percentage);; +Share of production-Oil-Net exports (Percentage);; +Share of production-Pipeline-Net trade (Percentage);; +Share of production-Steam coal-Net trade (Percentage);; +Stock-Floorspace-Residential (Million square meters);; diff --git a/man/calcIEA_WorldEnergyOutlook.Rd b/man/calcIEA_WorldEnergyOutlook.Rd index 66c9d047..86616bb6 100644 --- a/man/calcIEA_WorldEnergyOutlook.Rd +++ b/man/calcIEA_WorldEnergyOutlook.Rd @@ -4,11 +4,7 @@ \alias{calcIEA_WorldEnergyOutlook} \title{Calculate REMIND variables from IEA World Energy Outlook data.} \usage{ -calcIEA_WorldEnergyOutlook(version = "latest") -} -\arguments{ -\item{version}{of the WEO data, either 'default' (full paid version) or -'latest' (free, restricted, up-to-date dataset)} +calcIEA_WorldEnergyOutlook() } \description{ Calculate REMIND variables from IEA World Energy Outlook data. diff --git a/man/convertIEA_WorldEnergyOutlook.Rd b/man/convertIEA_WorldEnergyOutlook.Rd index c665a620..4e4f8cc7 100644 --- a/man/convertIEA_WorldEnergyOutlook.Rd +++ b/man/convertIEA_WorldEnergyOutlook.Rd @@ -2,20 +2,15 @@ % Please edit documentation in R/convertIEA_WorldEnergyOutlook.R \name{convertIEA_WorldEnergyOutlook} \alias{convertIEA_WorldEnergyOutlook} -\title{Convert IEA WEO 2021 Data} +\title{Convert IEA World Energy Outlook Data from 2023} \usage{ -convertIEA_WorldEnergyOutlook(x, subtype = "2021-global") +convertIEA_WorldEnergyOutlook(x) } \arguments{ \item{x}{magclass object to be converted} - -\item{subtype}{"2021-global", "2021-region", "2023-global", or "2023-region". -- For 2021 we have complete paid data. For 2023 we have only the free dataset. -- On global level, the source offers more variables than on regional level, -but the data should not be used on sub-global level due to its coarse disaggregation.} } \description{ -Convert IEA WEO 2021 Data +Convert IEA World Energy Outlook Data from 2023 } \author{ Falk Benke diff --git a/man/readIEA_WorldEnergyOutlook.Rd b/man/readIEA_WorldEnergyOutlook.Rd index 85c7ff47..b657748d 100644 --- a/man/readIEA_WorldEnergyOutlook.Rd +++ b/man/readIEA_WorldEnergyOutlook.Rd @@ -2,18 +2,12 @@ % Please edit documentation in R/readIEA_WorldEnergyOutlook.R \name{readIEA_WorldEnergyOutlook} \alias{readIEA_WorldEnergyOutlook} -\title{Read in IEA World Energy Outlook Data from 2021 or 2023} +\title{Read in IEA World Energy Outlook Data from 2023} \usage{ -readIEA_WorldEnergyOutlook(subtype = "2021-region") -} -\arguments{ -\item{subtype}{"2021-global", "2021-region", "2023-global", or "2023-region". -- For 2021 we have complete paid data. For 2023 we have only the free dataset. -- On global level, the source offers more variables than on regional level, -but the data should not be used on sub-global level due to its coarse disaggregation.} +readIEA_WorldEnergyOutlook() } \description{ -Read in IEA World Energy Outlook Data from 2021 or 2023 +Read in IEA World Energy Outlook Data from 2023 } \author{ Falk Benke