From 2915d905c66ffd5c95ecf22d644b7ed469c1a262 Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Mon, 15 Jul 2024 15:47:03 +0200 Subject: [PATCH 01/42] update unit conversion to USD 2017 --- R/calcCapital.R | 2 +- R/calcFossilExtraction.R | 4 ++-- R/calcIndustry_EEK.R | 17 +++++++++-------- R/calcMacroInvestments.R | 17 ++++++++--------- R/convertDylanAusGasCost.R | 15 ++++++--------- R/convertINNOPATHS.R | 4 ++-- R/fullREMIND.R | 2 +- 7 files changed, 29 insertions(+), 32 deletions(-) diff --git a/R/calcCapital.R b/R/calcCapital.R index 6f4f7140..112e7eda 100644 --- a/R/calcCapital.R +++ b/R/calcCapital.R @@ -82,6 +82,6 @@ calcCapital <- function() { # tie outputs together ---- list(x = mbind(cap_future, EEK), weight = NULL, - unit = "trillion 2005US$", + unit = "trillion 20017US$", description = "Capital stock, computed using the capital to GDP ratio from PWT, and GDP scenarios from mrdrivers.") } diff --git a/R/calcFossilExtraction.R b/R/calcFossilExtraction.R index 66b24b96..8af92595 100644 --- a/R/calcFossilExtraction.R +++ b/R/calcFossilExtraction.R @@ -52,7 +52,7 @@ calcFossilExtraction <- function(subtype = "FossilExtraction") { rbind(data.frame(Res = 23000, Price = 0.9)) %>% # convert from PJ to TWa mutate(Res = Res * 1e-15 / s_GJ_2_twa) %>% - # convert from 2005USD/GJ to tr 2005USD/Twa + # convert from USD/GJ to tr USD/Twa mutate(Price = Price / s_GJ_2_twa / 1e12) %>% arrange(Price) @@ -104,7 +104,7 @@ calcFossilExtraction <- function(subtype = "FossilExtraction") { return(list( x = output, weight = NULL, - unit = "tr USD2005/TWa", + unit = "tr USD2017/TWa", description = description, aggregationFunction = toolCubicFunctionAggregate, aggregationArguments = list(xUpperBound = upperBoundMaxExtraction, steepCurve = highCostCurve) diff --git a/R/calcIndustry_EEK.R b/R/calcIndustry_EEK.R index 39fbf6d6..389d6359 100644 --- a/R/calcIndustry_EEK.R +++ b/R/calcIndustry_EEK.R @@ -106,13 +106,14 @@ calcIndustry_EEK <- function(kap) { .data$EEK * .data$FE.share)) %>% select('iso3c', 'subsector', 'EEK') - ## deflate 2012 dollars ---- - # Converting from 2012 to 2005 dollars using GDP deflator from - # https://data.worldbank.org/indicator/NY.GDP.DEFL.ZS?locations=US + ## Converting from billion 2012 to trillion 2017 dollars EEK <- EEK %>% - mutate(EEK = .data$EEK * 0.8743, - # $bn/yr * 1e-3 $tn/$bn = $tn/yr - EEK = .data$EEK * 1e-3) + dplyr::rename("value" = "EEK") %>% + GDPuc::convertGDP(unit_in = "constant 2012 Int$PPP", + unit_out = "constant 2017 Int$PPP", + replace_NAs = "with USA") %>% + dplyr::mutate(value = .data$value * 1e-3) %>% + dplyr::rename("EEK" = "value") ## temper EEK share in total capital ---- # Temper industry EEK share in total capital by applying a geometric average @@ -361,6 +362,6 @@ calcIndustry_EEK <- function(kap) { return(list(x = EEK %>% as.magpie(spatial = 1, temporal = 2, data = ncol(.)), weight = NULL, - unit = 'trillion 2005US$', - description = 'industry energy efficiency capital stock')) + unit = 'trillion 2017US$', + description = 'Industry energy efficiency capital stock')) } diff --git a/R/calcMacroInvestments.R b/R/calcMacroInvestments.R index 423c8328..f6024bee 100644 --- a/R/calcMacroInvestments.R +++ b/R/calcMacroInvestments.R @@ -1,17 +1,16 @@ calcMacroInvestments <- function() { - # read in investment share + + # Read in investment share and SSP2 GDP in 2005 shInv <- readSource("PWT")[, 2005, "csh_i"] - # read in gdp - gdp <- calcOutput("GDP", aggregate = FALSE)[, 2005, "gdp_SSP2"] + gdp <- calcOutput("GDP", scenario = "SSP2", years = 2005, aggregate = FALSE) - # BS 01-03-2019: updated to use new toolFillWithRegionAvg function shInv_new <- toolFillWithRegionAvg(shInv, valueToReplace = 0, weight = gdp) - # # calculate macro investments + # Calculate macro investments data <- shInv_new * gdp - # convert unit - data <- data / 1000000 + # Convert from million to trillion + data <- data * 1e-6 getYears(data) <- NULL getNames(data) <- NULL @@ -19,7 +18,7 @@ calcMacroInvestments <- function() { return(list( x = data, weight = NULL, - unit = "trillion 2005US$", - description = "Investments in the macro-economic capital stock at constant 2005 national prices" + unit = "trillion 20017US$", + description = "Investments in the macro-economic capital stock in constant 2017 Int$PPP" )) } diff --git a/R/convertDylanAusGasCost.R b/R/convertDylanAusGasCost.R index e32764f5..9c6547fb 100644 --- a/R/convertDylanAusGasCost.R +++ b/R/convertDylanAusGasCost.R @@ -6,14 +6,11 @@ convertDylanAusGasCost <- function(x) { - all_c <- toolGetMapping("regionmappingH12.csv", where = "mappingfolder", type = "regional") + x %>% + # Converting from constant 2015 Australian dollars to constant 2017 Int$PPP + GDPuc::convertGDP(unit_in = "constant 2015 LCU", unit_out = "constant 2017 Int$PPP") %>% + add_dimension(dim = 3.4, add = "unit", nm = "Natural Gas Extraction Cost [2017USD/GJ]") %>% + toolCountryFill(fill = 0) %>% + return() - # converting to 2005USD, conversion factor from 2015AUSD to 2005USD assumed 0.6 - x_help <- x * 0.6 - x_help <- add_dimension(x_help, dim = 3.4, add = "unit", nm = "Natural Gas Extraction Cost [2005USD/GJ]") - - x <- new.magpie(all_c$CountryCode, getYears(x_help), getNames(x_help), fill = 0) - x["AUS", , ] <- x_help - - return(x) } diff --git a/R/convertINNOPATHS.R b/R/convertINNOPATHS.R index 898d3aad..a60253ae 100644 --- a/R/convertINNOPATHS.R +++ b/R/convertINNOPATHS.R @@ -2,7 +2,7 @@ convertINNOPATHS <- function(x) { regmapping <- toolGetMapping("regionmapping_21_EU11.csv", type = "regional", where = "mappingfolder") - gdpPerCapita <- calcOutput("GDPpc", aggregate = F) + gdpPerCapita <- calcOutput("GDPpc", scenario = "SSP2EU", aggregate = FALSE) # ensure that regions match for disaggregation commonRegions <- intersect(getItems(x, dim = 1), regmapping$RegionCode) @@ -20,6 +20,6 @@ convertINNOPATHS <- function(x) { x <- toolAggregate(x, regmapping, from = "RegionCode", to = "CountryCode", weight = w) x <- toolCountryFill(x, fill = NA, verbosity = 2) - x[Non28EUcountries,,] <- 0 + x[Non28EUcountries, , ] <- 0 return(x) } diff --git a/R/fullREMIND.R b/R/fullREMIND.R index f339c193..5c14dcdc 100644 --- a/R/fullREMIND.R +++ b/R/fullREMIND.R @@ -21,7 +21,7 @@ fullREMIND <- function() { #-------------- macro-economic parameters ----------------------------------------------------------- calcOutput("Population", years = rem_years_hist, round = 8, file = "f_pop.cs3r") - calcOutput("Labour", years = rem_years, round = 8, file = "f_lab.cs3r") + calcOutput("Labour", years = rem_years_hist, round = 8, file = "f_lab.cs3r") calcOutput("GDP", years = rem_years_hist, round = 8, file = "f_gdp.cs3r") calcOutput("RatioPPP2MER", round = 8, file = "pm_shPPPMER.cs4r") calcOutput("MacroInvestments", round = 8, file = "p01_boundInvMacro.cs4r") From 7cd959b304847ebe1e286ac5b80f308d6c055d17 Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Mon, 15 Jul 2024 16:41:39 +0200 Subject: [PATCH 02/42] drop price conversion in BP reference data --- R/calcBP.R | 6 +++--- R/convertBP.R | 3 +-- inst/extdata/reportingVariables/Mapping_BP.csv | 12 +++++++----- 3 files changed, 11 insertions(+), 10 deletions(-) diff --git a/R/calcBP.R b/R/calcBP.R index ebf4c2f9..591288a4 100644 --- a/R/calcBP.R +++ b/R/calcBP.R @@ -113,9 +113,9 @@ calcBP <- function() { map <- toolGetMapping("Mapping_BP.csv", type = "reportingVariables", where = "mrremind") %>% filter(!is.na(.data$REMIND), .data$REMIND != "") %>% mutate( - "from" := paste0(trimws(.data$variable), " (", .data$unit, ")"), - "to" := paste0(trimws(.data$REMIND), " (", .data$Unit_REMIND, ")"), - "conversion" := as.numeric(.data$Factor) + "from" = paste0(trimws(.data$variable), " (", .data$unit, ")"), + "to" = paste0(trimws(.data$REMIND), " (", .data$Unit_REMIND, ")"), + "conversion" = as.numeric(.data$Factor) ) %>% select("from", "to", "conversion") diff --git a/R/convertBP.R b/R/convertBP.R index 6523c87a..49e36b19 100644 --- a/R/convertBP.R +++ b/R/convertBP.R @@ -11,8 +11,6 @@ #' convertBP <- function(x, subtype) { - PE <- calcOutput("PE", aggregate = FALSE) - .removeNaRegions <- function(x) { remove <- magpply(x, function(y) all(is.na(y)), MARGIN = 1) return(x[!remove, , ]) @@ -40,6 +38,7 @@ convertBP <- function(x, subtype) { mappingRegions <- mappingFull[mappingFull$Region_name %in% regions & !mappingFull$ISO3.code %in% ctry & mappingFull$ISO3.code != "SUN", ] + PE <- calcOutput("PE", aggregate = FALSE) weight <- PE[mappingRegions$ISO3.code, 2014, "PE (EJ/yr)"] # disaggregation of other regions to iso countries diff --git a/inst/extdata/reportingVariables/Mapping_BP.csv b/inst/extdata/reportingVariables/Mapping_BP.csv index 847d6d56..b396b7c5 100755 --- a/inst/extdata/reportingVariables/Mapping_BP.csv +++ b/inst/extdata/reportingVariables/Mapping_BP.csv @@ -35,9 +35,11 @@ Net Trade|Gas,bcm,0.036,EJ/yr,Trade|Gas,, Trade|Export|Coal,EJ,1,EJ/yr,Trade|Exports|Coal,, Trade|Import|Coal,EJ,1,EJ/yr,Trade|Imports|Coal,, Net Trade|Coal,EJ,1,EJ/yr,Trade|Coal,, -Price|Crude Oil,$2023/bbl,0.12256904722994,US$2005/GJ,Price|Primary Energy|Oil,"Source: $2020 → $2005 = 0.75 (online) -1 barrel of oil equivalent (boe) = 6.119 million kJ -Conversion: 0.75 / 6.119", -Price|Natural Gas,$/mbtu,1.05,US$2005/GJ,Price|Primary Energy|Gas,source: 1 trillion British thermal units = 1.050 petajoules NG, -Price|Coal,$/t,0.025,US$2005/GJ,Price|Primary Energy|Coal,source: 1EJ = 40 million tonnes of hard coal, +Price|Crude Oil,$2023/bbl,0.163425396306586,US$2023/GJ,Price|Primary Energy|Oil,"source: 1 barrel of oil equivalent (boe) = 6.119 million kJ +Conversion: 1 / 6.119 +TODO: consider unit conversion to US$2017", +Price|Natural Gas,$/mbtu,1.05,US$/GJ,Price|Primary Energy|Gas,"source: 1 trillion British thermal units = 1.050 petajoules NG +TODO: consider unit conversion to US$2017", +Price|Coal,$/t,0.025,US$/GJ,Price|Primary Energy|Coal,"source: 1EJ = 40 million tonnes of hard coal +TODO: consider unit conversion to US$2017", Emi|CO2,Mt CO2,1,Mt CO2/yr,Emi|CO2|Energy,, From a5e90540e9af89f20b1360e1976e2f888f243d43 Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Tue, 16 Jul 2024 11:25:45 +0200 Subject: [PATCH 03/42] convert unit in calcCO2Prices --- R/calcCO2Prices.R | 16 +++++++++++++++- 1 file changed, 15 insertions(+), 1 deletion(-) diff --git a/R/calcCO2Prices.R b/R/calcCO2Prices.R index c7f32457..5c93c4ce 100644 --- a/R/calcCO2Prices.R +++ b/R/calcCO2Prices.R @@ -1,8 +1,22 @@ calcCO2Prices <- function() { + # read data x <- readSource("ExpertGuess", subtype = "co2prices") getNames(x) <- NULL + + # convert from $2005 to $2017 + map <- toolGetMapping(type = "regional", name = "regionmappingH12.csv", where = "mappingfolder") %>% + select("iso3c" = "CountryCode", "region" = "RegionCode") + + x <- GDPuc::convertGDP( + gdp = x, + unit_in = "constant 2005 Int$PPP", + unit_out = "constant 2017 Int$PPP", + with_regions = map, + replace_NAs = "regional_average" + ) + # read data used for weight ceds <- calcOutput("Emissions", datasource = "CEDS2024", aggregate = FALSE) ceds <- ceds[, , "Emi|CO2|Energy and Industrial Processes (Mt CO2/yr)"] @@ -12,7 +26,7 @@ calcCO2Prices <- function() { return(list( x = x, weight = ceds, - unit = "US$2005/t CO2", + unit = "US$2017/t CO2", description = "CO2 prices in 2010, 2015 and 2020" )) } From 8b84568583ae0704f277577f021a35013d3e5f48 Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Tue, 16 Jul 2024 18:08:22 +0200 Subject: [PATCH 04/42] convert unit in calcCostsWeathering --- R/calcCostsWeathering.R | 27 ++++++++++++++++++++------- 1 file changed, 20 insertions(+), 7 deletions(-) diff --git a/R/calcCostsWeathering.R b/R/calcCostsWeathering.R index 05d1ebc1..ad52b4cc 100644 --- a/R/calcCostsWeathering.R +++ b/R/calcCostsWeathering.R @@ -3,21 +3,34 @@ #' @return transport costs of spreading rock on the fields #' @seealso \code{\link{calcOutput}} #' @examples -#' #' \dontrun{ #' calcOutput("CostsWeathering") #' } #' - calcCostsWeathering <- function() { - costs <- readSource("Strefler", subtype = "weathering_costs") + + # convert from $2005 to $2017 + map <- toolGetMapping(type = "regional", name = "regionmappingH12.csv", where = "mappingfolder") %>% + select("iso3c" = "CountryCode", "region" = "RegionCode") + + x <- GDPuc::convertGDP( + gdp = costs, + unit_in = "constant 2005 Int$PPP", + unit_out = "constant 2017 Int$PPP", + with_regions = map, + replace_NAs = "regional_average" + ) + weight <- costs # get the same dimensions of the data weight[, , ] <- 1 # this will take the average of the countries to get the regional resolution - return(list(x = costs, - weight = weight, - unit = "T$/Gt stone", - description = "Transport costs for spreading rocks on the fields. The first rlf corresponds to climate regions (1 - warm, 2 - temperate). The second rlf are the distances of fields from the sources of the material." + return(list( + x = x, + weight = weight, + unit = "T$/Gt stone", + description = "Transport costs for spreading rocks on the fields. + The first rlf corresponds to climate regions (1 - warm, 2 - temperate). + The second rlf are the distances of fields from the sources of the material." )) } From d6811da6424e203a3c5d571f38ded540b3a0099d Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Wed, 17 Jul 2024 15:43:30 +0200 Subject: [PATCH 05/42] convert unit in calcDiffInvestCosts --- R/calcCostsWeathering.R | 2 +- R/calcDiffInvestCosts.R | 74 ++++++++++++++++++++++++++--------------- R/convertIEA_PVPS.R | 3 +- R/readIEA_PVPS.R | 10 ++---- R/readREN21.R | 4 +-- 5 files changed, 54 insertions(+), 39 deletions(-) diff --git a/R/calcCostsWeathering.R b/R/calcCostsWeathering.R index ad52b4cc..d343a046 100644 --- a/R/calcCostsWeathering.R +++ b/R/calcCostsWeathering.R @@ -28,7 +28,7 @@ calcCostsWeathering <- function() { return(list( x = x, weight = weight, - unit = "T$/Gt stone", + unit = "T US$2017/Gt stone", description = "Transport costs for spreading rocks on the fields. The first rlf corresponds to climate regions (1 - warm, 2 - temperate). The second rlf are the distances of fields from the sources of the material." diff --git a/R/calcDiffInvestCosts.R b/R/calcDiffInvestCosts.R index ff7efd75..16aff370 100644 --- a/R/calcDiffInvestCosts.R +++ b/R/calcDiffInvestCosts.R @@ -1,20 +1,20 @@ #' Aggregated investment cost data for REMIND regions (based on IEA_WEO) #' @description Disaggregated investment cost data is aggregated and technologies renamed to REMIND names -#' @details REMIND does not have a classification of coal power plants e.g., sub-critical. Therefore, countries are given coal plant -#' costs assuming what type of coal plants are expected to develop there. For other technologies, certain assumptions are taken +#' @details REMIND does not have a classification of coal power plants e.g., sub-critical. +#' Therefore, countries are given coal plant costs assuming what type of coal plants are +#' expected to develop there. For other technologies, certain assumptions are taken #' to change to REMIND convention. -#' @param subtype Investment Costs, I&M Costs, and Efficiency -#' @return Magpie object with aggregated but diffrentiated investment costs for some technologies. +#' @param subtype either "Invest_Costs" or "Efficiency" +#' @return Magpie object with aggregated but differentiated investment costs for some technologies. #' @author Aman Malik -#' @importFrom dplyr filter calcDiffInvestCosts <- function(subtype) { + if (subtype == "Invest_Costs") { + + # IEA WEO 2016 costs are expressed in US dollars (2015 values) x <- readSource("IEA_WEO", subtype = "Invest_Costs") - x_REN21 <- readSource("REN21", subtype = "investmentCosts") - x_IEA_PVPS <- readSource("IEA_PVPS", subtype = "CAPEX") - # x <- readSource("IEA_WEO")# reading data end of convert function x[, , ] <- as.numeric(x[, , ]) # convertng data values into numeric # Various mapping files used to get needed mappings, for e.g., South Asia @@ -30,6 +30,7 @@ calcDiffInvestCosts <- function(subtype) { "Coal.Steam Coal - SUPERCRITICAL", "Coal.Steam Coal - ULTRASUPERCRITICAL" )] <- 0 + # For countries in LAM, IND, FSU and MEA use supercritical plant investment costs as standard coal plant costs x[c( countries$CountryCode[countries$RegionCode == "LAM"], "IND", @@ -40,11 +41,12 @@ calcDiffInvestCosts <- function(subtype) { "Coal.Steam Coal - ULTRASUPERCRITICAL" )] <- 0 - # For countries in OECD and CHN use ultrasupercritical investment costs ultrasupercritical plants for "Coal.Steam Coal - ULTRASUPERCRITICAL")] <- 0 + # For countries in OECD and CHN use ultrasupercritical investment costs x[c("CHN", "KOR", "MAC", "HKG", countries3$CountryCode[countries3$RegionCode == "OECD"]), , c( "Coal.Steam Coal - SUBCRITICAL", "Coal.Steam Coal - SUPERCRITICAL" )] <- 0 + # For remaining countries not covered above, use subcritical plant investment costs years <- getYears(x) for (y in years) { @@ -58,7 +60,8 @@ calcDiffInvestCosts <- function(subtype) { ) ] <- 0 } - tech_mapping <- toolGetMapping("comparison.csv", where = "mappingfolder", type = "sectoral") %>% filter(!is.na(!!sym("tech"))) + tech_mapping <- toolGetMapping("comparison.csv", where = "mappingfolder", type = "sectoral") %>% + dplyr::filter(!is.na(!!sym("tech"))) # create new magpie object with names of corresponding REMIND technologies x_new <- new.magpie(getRegions(x), names = unique(tech_mapping$tech), years = getYears(x), fill = 0) @@ -70,26 +73,26 @@ calcDiffInvestCosts <- function(subtype) { # for "spv" take 1/4 of costs from small-scale and 3/4 costs from large scale (utility scale)ildings x_new[, , "spv"] <- 0.75 * x[, , "Renewables.Solar photovoltaics - Large scale"] + 0.25 * x[, , "Renewables.Solar photovoltaics - Buildings"] - # same for hydro - removed when hydro values are fed from "private" data source - # x_new[,,"hydro"] <- 0.75*x[,,"Renewables.Hydropower - large-scale"] + 0.25*x[,,"Renewables.Hydropower - small-scale"] x_new[, , "hydro"] <- x[, , "Renewables.Hydropower - large-scale"] + # and Biomass CHP x_new[, , "biochp"] <- 0.75 * x[, , "Renewables.Biomass CHP Medium"] + 0.25 * x[, , "Renewables.Biomass CHP Small"] # for rest of technologies, simply match - further_techs_to_map <- filter(tech_mapping, !(!!sym("tech") %in% c("pc", "spv", "hydro", "biochp"))) + further_techs_to_map <- dplyr::filter(tech_mapping, !(!!sym("tech") %in% c("pc", "spv", "hydro", "biochp"))) x_new[, , further_techs_to_map$tech] <- as.numeric(x[, , further_techs_to_map$IEA]) - x_new <- time_interpolate(x_new, c(2025, 2035), integrate_interpolated_years = T) - # overwrite investmetn costs vor renewables with data form REN21 + x_new <- time_interpolate(x_new, c(2025, 2035), integrate_interpolated_years = TRUE) + # overwrite investment costs for renewables with data form REN21 + # did not find any explicit info, but REN costs should be roughly in US dollars (2015 values) + x_REN21 <- readSource("REN21", subtype = "investmentCosts") x_REN21_wa <- collapseNames(x_REN21[, , "wa"]) # use weighted average getNames(x_REN21_wa) <- gsub("hydropower", "hydro", getNames(x_REN21_wa)) getNames(x_REN21_wa) <- gsub("Solar PV", "spv", getNames(x_REN21_wa)) getNames(x_REN21_wa) <- gsub("wind-on", "wind", getNames(x_REN21_wa)) x_REN21_wa <- x_REN21_wa[, , c("Biopower", "Geothermal Power", "wind-off", "csp"), invert = TRUE] - # use REN21 data for all time steps for hydro - # x_new[,,"hydro"] <- x_REN21_wa[,,"hydro"] + # use REN21 data only for 2015 for spv,csp and wind; all other time steps are 0 x_new[, , c("spv", "wind")] <- 0 x_new[, 2015, c("spv", "wind")] <- x_REN21_wa[, , c("spv", "wind")] @@ -148,13 +151,33 @@ calcDiffInvestCosts <- function(subtype) { x_adj_iso <- toolAggregate(x_adj, regmapping) # regions which have not been manually adjusted -> replace by original IEA PVPS data + # IEAP PVPS are expressed in US dollars (2015 values) + x_IEA_PVPS <- readSource("IEA_PVPS") + x_adj_iso[which(is.na(x_adj_iso))] <- x_IEA_PVPS[which(is.na(x_adj_iso))] + # add new 2020 values PV x_new[, "y2020", "spv"] <- x_adj_iso - return(list(x = x_new, weight = x_new, unit = "USD$/KW 2015", description = "Investment costs data")) - } else if (subtype == "O&M_Costs") { - x <- readSource("IEA_WEO", subtype = "Invest_Costs") + # convert data from $2015 to $2017 + map <- toolGetMapping(type = "regional", name = "regionmappingH12.csv", where = "mappingfolder") %>% + dplyr::select("iso3c" = "CountryCode", "region" = "RegionCode") + + x_new <- GDPuc::convertGDP( + gdp = x_new, + unit_in = "constant 2015 Int$PPP", + unit_out = "constant 2017 Int$PPP", + with_regions = map, + replace_NAs = "regional_average" + ) + + return(list( + x = x_new, + weight = x_new, + unit = "US$2017/KW", + description = "Investment costs data" + )) + } else if (subtype == "Efficiency") { x <- readSource("IEA_WEO", subtype = "Efficiency") x[, , ] <- as.numeric(x[, , ]) # convertng data values into numeric @@ -200,7 +223,8 @@ calcDiffInvestCosts <- function(subtype) { ) ] <- 0 } - tech_mapping <- toolGetMapping("comparison.csv", where = "mappingfolder", type = "sectoral") %>% filter(!is.na(!!sym("tech"))) + tech_mapping <- toolGetMapping("comparison.csv", where = "mappingfolder", type = "sectoral") %>% + dplyr::filter(!is.na(!!sym("tech"))) # create new magpie object with names of corresponding REMIND technologies x_new <- new.magpie(getRegions(x), names = unique(tech_mapping$tech), years = getYears(x), fill = 0) @@ -210,15 +234,11 @@ calcDiffInvestCosts <- function(subtype) { x[, , "Coal.Steam Coal - ULTRASUPERCRITICAL"] # for rest of technologies, simply match - further_techs_to_map <- filter(tech_mapping, !(!!sym("tech") %in% c("pc", "spv", "hydro", "biochp"))) + further_techs_to_map <- dplyr::filter(tech_mapping, !(!!sym("tech") %in% c("pc", "spv", "hydro", "biochp"))) x_new[, , further_techs_to_map$tech] <- as.numeric(x[, , further_techs_to_map$IEA]) - x_new <- time_interpolate(x_new, c(2025, 2035), integrate_interpolated_years = T) + x_new <- time_interpolate(x_new, c(2025, 2035), integrate_interpolated_years = TRUE) return(list(x = x_new, weight = x_new, unit = "NA", description = "Efficiency data")) } - - if (subtype == "Invest_Costs" | subtype == "O&M_Costs") { - return(list(x = x_new, weight = x_new, unit = "USD$/KW 2015", description = "Investment costs data")) - } } diff --git a/R/convertIEA_PVPS.R b/R/convertIEA_PVPS.R index 0803cdf5..622cad12 100644 --- a/R/convertIEA_PVPS.R +++ b/R/convertIEA_PVPS.R @@ -1,11 +1,10 @@ #' Convert IEA PVPS data from REMIND regions to iso countries #' @description maps to iso countries #' @param x MAgPIE object to be converted -#' @param subtype type of data read from IEA PVPS #' @return Magpie object with IEA PVPS investment cost per country #' @author Felix Schreyer -convertIEA_PVPS <- function(x, subtype) { +convertIEA_PVPS <- function(x) { regmapping <- toolGetMapping("regionmappingH12.csv", where = "mappingfolder", type = "regional") x_iso <- toolAggregate(x, regmapping) return(x_iso) diff --git a/R/readIEA_PVPS.R b/R/readIEA_PVPS.R index f94ceb66..1aff880c 100644 --- a/R/readIEA_PVPS.R +++ b/R/readIEA_PVPS.R @@ -2,12 +2,8 @@ #' @description reads excel sheet with PV investment cost data #' @return magpie object with PV investment cost data #' @author Felix Schreyer -#' @param subtype type of data read from IEA PVPS -#' @importFrom readxl read_excel -readIEA_PVPS <- function(subtype) { - if (subtype == "CAPEX") { - IEA.PVPS <- read_excel("IEA_PVPS.xlsx", sheet = "IEA_PVPS_data") - x <- collapseNames(as.magpie(IEA.PVPS, spatial = 1, datacol = 2)) - } +readIEA_PVPS <- function() { + IEA.PVPS <- readxl::read_excel("IEA_PVPS.xlsx", sheet = "IEA_PVPS_data") + x <- as.magpie(IEA.PVPS, spatial = 1, datacol = 2) return(x) } diff --git a/R/readREN21.R b/R/readREN21.R index 69e34b60..de3b75f5 100644 --- a/R/readREN21.R +++ b/R/readREN21.R @@ -4,8 +4,8 @@ #' (TIC-Absolute), Additional Installed Capacity (AC-Absolute), and Production Absolute targets) #' or regional technology costs #' @details Country name is ISO coded. Capacity/Additional Capacity targets are in GW. Generation/Production targets are in GWh. -#' @return magpie object with Total Installed Capacity targets in GW for different target years -#' @author Aman Malik, Lavinia Baumstark +#' @return magpie object with Total Installed Capacity targets in GW for different target years +#' @author Aman Malik, Lavinia Baumstark #' @param subtype Capacity Generation Emissions Share #' @importFrom readxl read_excel From 9d7e6ea3661ff62c5434e7b3444f0b85680b7bf2 Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Wed, 17 Jul 2024 16:17:04 +0200 Subject: [PATCH 06/42] convert unit calcEconometricEmiParameter --- R/calcEconometricEmiParameter.R | 25 +++++++++++++++++-------- 1 file changed, 17 insertions(+), 8 deletions(-) diff --git a/R/calcEconometricEmiParameter.R b/R/calcEconometricEmiParameter.R index 3d890592..088e5ad9 100644 --- a/R/calcEconometricEmiParameter.R +++ b/R/calcEconometricEmiParameter.R @@ -3,9 +3,8 @@ #' Provides REMIND data for CO2 parameters to calculate baseline emissions of #' waste from population and investment. #' -#' -#' @return REMIND data forCO2 parameters to calculate baseline emissions of -#' waste from population and investment and corresonding weights (population) +#' @return REMIND data for CO2 parameters to calculate baseline emissions of +#' waste from population and investment and corresponding weights (population) #' as a list of two MAgPIE objects #' @author Lavinia Baumstark #' @seealso \code{\link{calcOutput}}, \code{\link{readSource}} @@ -13,8 +12,6 @@ #' \dontrun{ #' calcOutput("calcEconometricEmiParameter") #' } -#' @importFrom utils read.csv - calcEconometricEmiParameter <- function() { @@ -33,12 +30,24 @@ calcEconometricEmiParameter <- function() { getNames(p4) <- "co2cement_process.p4" getYears(p4) <- getYears(p3) + # convert data from $2005 to $2017 + map <- toolGetMapping(type = "regional", name = "regionmappingH12.csv", where = "mappingfolder") %>% + dplyr::select("iso3c" = "CountryCode", "region" = "RegionCode") + + p4 <- GDPuc::convertGDP( + gdp = p4, + unit_in = "constant 2005 Int$PPP", + unit_out = "constant 2017 Int$PPP", + with_regions = map, + replace_NAs = "regional_average" + ) + # combine all parameters x <- mbind(p3, p4) getYears(x) <- NULL + return(list(x = x, weight = pop, - unit = "p3 - GtC/Cap, p4 - $US2005/Cap", - description = "CO2 parameters to calculate baseline emissions of waste from population and investment", - note = c("more to be added by Jessi"))) + unit = "p3 - GtC/Cap, p4 - $US2017/Cap", + description = "CO2 parameters to calculate baseline emissions of waste from population and investment")) } From b0c2d4830bafffbea7ed4bb660e083ea541b7acf Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Wed, 17 Jul 2024 17:28:39 +0200 Subject: [PATCH 07/42] convert prices in calcEU_ReferenceScenario --- R/calcEU_ReferenceScenario.R | 47 +++++++++++++++++++++++++++++------- 1 file changed, 38 insertions(+), 9 deletions(-) diff --git a/R/calcEU_ReferenceScenario.R b/R/calcEU_ReferenceScenario.R index d06ac50d..01f71253 100644 --- a/R/calcEU_ReferenceScenario.R +++ b/R/calcEU_ReferenceScenario.R @@ -1,18 +1,47 @@ calcEU_ReferenceScenario <- function() { - EU_ReferenceScenario_2016 <- readSource("EU_ReferenceScenario", subtype = "2016") - EU_ReferenceScenario_2016 <- add_dimension(EU_ReferenceScenario_2016, dim = 3.1, add = "model", - nm = "EU_ReferenceScenario_2016") + map <- toolGetMapping(type = "regional", name = "regionmapping_21_EU11.csv", where = "mappingfolder") %>% + dplyr::select("iso3c" = "CountryCode", "region" = "RegionCode") - EU_ReferenceScenario_2020 <- readSource("EU_ReferenceScenario", subtype = "2020") - EU_ReferenceScenario_2020 <- add_columns(EU_ReferenceScenario_2020, "y2000", dim = 2) - EU_ReferenceScenario_2020 <- add_dimension(EU_ReferenceScenario_2020, dim = 3.1, add = "model", - nm = "EU_ReferenceScenario_2020") + euRef2016 <- readSource("EU_ReferenceScenario", subtype = "2016") - x <- mbind(EU_ReferenceScenario_2016, EU_ReferenceScenario_2020) + # convert EUR2013 -> US$2017 + tmp <- GDPuc::convertGDP( + gdp = euRef2016[, , "Price|Secondary Energy|Electricity (EUR2013/GJ)"], + unit_in = "constant 2013 €", + unit_out = "constant 2017 Int$PPP", + with_regions = map, + replace_NAs = "regional_average" + ) + + getNames(tmp) <- "Price|Secondary Energy|Electricity (US$2017/GJ)" + euRef2016 <- euRef2016[, , "Price|Secondary Energy|Electricity (EUR2013/GJ)", invert = TRUE] + euRef2016 <- mbind(euRef2016, tmp) + + euRef2016 <- add_dimension(euRef2016, dim = 3.1, add = "model", nm = "EU_ReferenceScenario_2016") + + euRef2020 <- readSource("EU_ReferenceScenario", subtype = "2020") + + # convert EUR2015 -> US$2017 + tmp <- GDPuc::convertGDP( + gdp = euRef2020[, , "Price|Secondary Energy|Electricity (EUR2015/GJ)"], + unit_in = "constant 2015 €", + unit_out = "constant 2017 Int$PPP", + with_regions = map, + replace_NAs = "regional_average" + ) + + getNames(tmp) <- "Price|Secondary Energy|Electricity (US$2017/GJ)" + euRef2020 <- euRef2020[, , "Price|Secondary Energy|Electricity (EUR2015/GJ)", invert = TRUE] + euRef2020 <- mbind(euRef2020, tmp) + + euRef2020 <- add_columns(euRef2020, "y2000", dim = 2) + euRef2020 <- add_dimension(euRef2020, dim = 3.1, add = "model", nm = "EU_ReferenceScenario_2020") + + x <- mbind(euRef2016, euRef2020) weights <- x weights[, , ] <- NA - weights[, , "Price|Secondary Energy|Electricity (US$2005/GJ)"] <- 1 + weights[, , "Price|Secondary Energy|Electricity (US$2017/GJ)"] <- 1 return(list( x = x, weight = weights, mixed_aggregation = TRUE, From 83e447eccff3a6d59b61c2232387c0e229fc7a12 Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Thu, 18 Jul 2024 14:42:39 +0200 Subject: [PATCH 08/42] update unit conversion in calcPETaxes --- R/calcPETaxes.R | 52 +++++++++++++++++++++---------------- R/convertIIASA_subs_taxes.R | 12 ++++++--- 2 files changed, 38 insertions(+), 26 deletions(-) diff --git a/R/calcPETaxes.R b/R/calcPETaxes.R index e65e459e..d4d4bbd0 100644 --- a/R/calcPETaxes.R +++ b/R/calcPETaxes.R @@ -3,7 +3,7 @@ #' Reads in the data of the source IIASA_subs_taxes, by country. and #' calculate taxes at primary energy level. Regional aggregation is done via the #' respective energy quantities as weights. -#' +#' #' @param subtype subsidies rate ("subsidies") output #' #' @return MAgPIE object @@ -11,47 +11,55 @@ #' @seealso \code{\link{calcOutput}}, \code{\link{readIIASA_subs_taxes}}, #' \code{\link{convertIIASA_subs_taxes}} #' @examples -#' #' \dontrun{ #' calcOutput("PETaxes") -#' #' } #' - -calcPETaxes <- function(subtype="subsidies") { - - if (subtype == "subsidies") { - tax <- -readSource("IIASA_subs_taxes", subtype = "subsidies_bulk") - desc <- "Aggregated primary energy subsidy data from country level data provided by IIASA (Jessica Jewell)" - } else { +calcPETaxes <- function(subtype = "subsidies") { + if (subtype != "subsidies") { stop("the subtype must be 'subsidies'") } - #read in energy values + tax <- -readSource("IIASA_subs_taxes", subtype = "subsidies_bulk") + desc <- "Aggregated primary energy subsidy data from country level data provided by IIASA (Jessica Jewell)" + + # read in energy values energy <- readSource("IIASA_subs_taxes", subtype = "energy") - #energy = 0 for regions/carriers with no information on subsidies, so that they are not considered in the weighting + # energy = 0 for regions/carriers with no information on subsidies, so that they are not considered in the weighting energy[is.na(tax)] <- 0 - #taxes without value are considered to be zero + # taxes without value are considered to be zero tax[is.na(tax)] <- 0 - #energy without value is considered to be zero + # energy without value is considered to be zero energy[is.na(energy)] <- 0 tax_map <- c( - "pegas" = "PE-Naturalgas", - "peoil" = "PE-Oil", - "pecoal" = "PE-Coal" + "pegas" = "PE-Naturalgas", + "peoil" = "PE-Oil", + "pecoal" = "PE-Coal" ) - Rtax <- setNames(tax[,,tax_map],names(tax_map)) - Renergy <- setNames(energy[,,tax_map],names(tax_map)) + Rtax <- setNames(tax[, , tax_map], names(tax_map)) + Renergy <- setNames(energy[, , tax_map], names(tax_map)) + + # convert tax data from $2005 to $2017 + map <- toolGetMapping(type = "regional", name = "regionmappingH12.csv", where = "mappingfolder") %>% + dplyr::select("iso3c" = "CountryCode", "region" = "RegionCode") + + Rtax <- GDPuc::convertGDP( + gdp = Rtax, + unit_in = "constant 2005 Int$PPP", + unit_out = "constant 2017 Int$PPP", + with_regions = map, + replace_NAs = "regional_average" + ) # convert original data from bulk values to subsidies rates for the case of subsidies - Rtax <- Rtax/Renergy*1e9 #converting from billion$/GJ to $/GJ + Rtax <- Rtax / Renergy * 1e9 # converting from billion$/GJ to $/GJ Rtax[is.na(Rtax)] <- 0 - #set base year + # set base year getYears(Rtax) <- "2005" getYears(Renergy) <- "2005" - return(list(x=Rtax,weight=Renergy,unit="$2005/GJ",description=desc)) + return(list(x = Rtax, weight = Renergy, unit = "$2017/GJ", description = desc)) } diff --git a/R/convertIIASA_subs_taxes.R b/R/convertIIASA_subs_taxes.R index dec708cf..5c893937 100644 --- a/R/convertIIASA_subs_taxes.R +++ b/R/convertIIASA_subs_taxes.R @@ -9,12 +9,16 @@ #' @return IIASA_subs_taxes data as MAgPIE object aggregated to country level #' @author Christoph Bertram #' @examples -#' -#' \dontrun{ a <- convertIIASA_subs_taxes(x) +#' \dontrun{ +#' a <- convertIIASA_subs_taxes(x) #' } #' convertIIASA_subs_taxes <- function(x) { - # fill all missing countries with 0, remove all countries not part of official 249 ISO countries - x <- toolCountryFill(x, verbosity = 2, fill = 0) + + x <- toolCountryFill(x, + verbosity = 2, fill = 0, + no_remove_warning = c("ADO", "CHI", "ZAR", "IMY", "KSV", "ROM", "TMP", "WBG") + ) + return(x) } From 600bd494b75b8f1c55f8d8b39e2c4abb203c9c49 Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Thu, 18 Jul 2024 15:34:28 +0200 Subject: [PATCH 09/42] update monetary unit conversion in convertIIASA_subs_taxes --- R/calcFETaxes.R | 108 ++++++++++++++++++------------------ R/calcPETaxes.R | 12 ---- R/convertIIASA_subs_taxes.R | 21 ++++++- R/readIIASA_subs_taxes.R | 10 +++- 4 files changed, 83 insertions(+), 68 deletions(-) diff --git a/R/calcFETaxes.R b/R/calcFETaxes.R index 246ff2cf..eb71ddad 100644 --- a/R/calcFETaxes.R +++ b/R/calcFETaxes.R @@ -12,35 +12,32 @@ #' @seealso \code{\link{calcOutput}}, \code{\link{readIIASA_subs_taxes}}, #' \code{\link{convertIIASA_subs_taxes}} #' @examples -#' #' \dontrun{ #' calcOutput("FETaxes") -#' #' } #' -calcFETaxes <- function(subtype="taxes") { - - #read in taxes/subsidies values - if (subtype == "taxes"){ - tax <- readSource("IIASA_subs_taxes", subtype="tax_rate") +calcFETaxes <- function(subtype = "taxes") { + # read in taxes/subsidies values + if (subtype == "taxes") { + tax <- readSource("IIASA_subs_taxes", subtype = "tax_rate") desc <- "Aggregated final energy tax data from country level data provided by IIASA (Jessica Jewell)" - } else if (subtype == "subsidies"){ - tax <- -readSource("IIASA_subs_taxes", subtype="subsidies_bulk") + } else if (subtype == "subsidies") { + tax <- -readSource("IIASA_subs_taxes", subtype = "subsidies_bulk") desc <- "Aggregated final energy subsidy data from country level data provided by IIASA (Jessica Jewell)" } else { stop("the subtype must be either 'taxes' or 'subsidies'") } - #read in energy values - energy <- readSource("IIASA_subs_taxes", subtype="energy") - #energy = 0 for regions/carriers with no information on subsidies, so that they are not considered in the weighting + # read in energy values + energy <- readSource("IIASA_subs_taxes", subtype = "energy") + # energy = 0 for regions/carriers with no information on subsidies, so that they are not considered in the weighting energy[is.na(tax)] <- 0 - #taxes without value are considered to be zero + # taxes without value are considered to be zero tax[is.na(tax)] <- 0 - #energy without value is considered to be zero + # energy without value is considered to be zero energy[is.na(energy)] <- 0 - tax_map = list( + tax_map <- list( "indst" = c( "fegas" = "IN-Naturalgas", "feh2s" = "IN-Naturalgas", @@ -68,63 +65,68 @@ calcFETaxes <- function(subtype="taxes") { Rtax <- Renergy <- NULL - for(sector in c("indst","build","trans")){ + for (sector in c("indst", "build", "trans")) { Rtax <- mbind(Rtax, - add_dimension(setNames(tax[,,tax_map[[sector]]],names(tax_map[[sector]])), dim = 3.1, add = "sector", nm = sector)) + add_dimension(setNames(tax[, , tax_map[[sector]]], names(tax_map[[sector]])), + dim = 3.1, add = "sector", nm = sector)) Renergy <- mbind(Renergy, - add_dimension(setNames(energy[,,tax_map[[sector]]],names(tax_map[[sector]])), dim = 3.1, add = "sector", nm = sector)) + add_dimension(setNames(energy[, , tax_map[[sector]]], names(tax_map[[sector]])), + dim = 3.1, add = "sector", nm = sector)) } # convert original data from bulk values to subsidies rates for the case of subsidies - if (subtype == "subsidies"){ - Rtax <- Rtax/Renergy*1e9 #converting from billion$/GJ to $/GJ + if (subtype == "subsidies") { + Rtax <- Rtax / Renergy * 1e9 # converting from billion$/GJ to $/GJ Rtax[is.na(Rtax)] <- 0 } - #Ex-post tax rate adjustments - #feelt tax rate as weighted average on industry and buildings - Rtax[,,"trans.feelt"] <- (Rtax[,,"indst.feels"]*Renergy[,,"indst.feels"] + Rtax[,,"build.feels"]*Renergy[,,"build.feels"]) / (Renergy[,,"indst.feels"] + Renergy[,,"build.feels"]) - Rtax[,,"trans.feelt"][is.na(Rtax[,,"trans.feelt"])] <- 0 + # Ex-post tax rate adjustments + # feelt tax rate as weighted average on industry and buildings + Rtax[, , "trans.feelt"] <- (Rtax[, , "indst.feels"] * Renergy[, , "indst.feels"] + Rtax[, , "build.feels"] * + Renergy[, , "build.feels"]) / (Renergy[, , "indst.feels"] + Renergy[, , "build.feels"]) + Rtax[, , "trans.feelt"][is.na(Rtax[, , "trans.feelt"])] <- 0 ## feh2t tax rate as same as feelt - Rtax[,,"trans.feh2t"] <- Rtax[,,"trans.feelt"] + Rtax[, , "trans.feh2t"] <- Rtax[, , "trans.feelt"] # disabling tax for fehes and feh2t - Rtax[,,c("fehes")] <- 0 + Rtax[, , c("fehes")] <- 0 # do not apply gas subsidies to H2 - if (subtype == "subsidies"){ - Rtax[,,c("feh2s")] <- 0 + if (subtype == "subsidies") { + Rtax[, , c("feh2s")] <- 0 } - #Ex-post energy weight adjustments - Renergy[,,'build.feh2s'] <- Renergy[,,'build.fegas'] - Renergy[,,'indst.feh2s'] <- Renergy[,,'indst.fegas'] - Renergy[,,'trans.feelt'] <- Renergy[,,"build.feels"] - Renergy[,,'trans.feh2t'] <- Renergy[,,"build.feels"] - Renergy[,,c("fehes")] <- 0 + # Ex-post energy weight adjustments + Renergy[, , "build.feh2s"] <- Renergy[, , "build.fegas"] + Renergy[, , "indst.feh2s"] <- Renergy[, , "indst.fegas"] + Renergy[, , "trans.feelt"] <- Renergy[, , "build.feels"] + Renergy[, , "trans.feh2t"] <- Renergy[, , "build.feels"] + Renergy[, , c("fehes")] <- 0 - #cdr sector taxes equal to industry taxes - cdrTax <- Rtax[,,"indst"] - getNames(cdrTax,dim = 1) <- "cdr" - Rtax <- mbind(Rtax,cdrTax) - cdrEnergy <- Renergy[,,"indst"] - getNames(cdrEnergy,dim = 1) <- "cdr" - Renergy <- mbind(Renergy,cdrEnergy) + # cdr sector taxes equal to industry taxes + cdrTax <- Rtax[, , "indst"] + getNames(cdrTax, dim = 1) <- "cdr" + Rtax <- mbind(Rtax, cdrTax) + cdrEnergy <- Renergy[, , "indst"] + getNames(cdrEnergy, dim = 1) <- "cdr" + Renergy <- mbind(Renergy, cdrEnergy) - #bunkers sector taxes equal to transport taxes - bunkersTax <- Rtax[,,"trans"] - getNames(bunkersTax,dim = 1) <- "bunkers" - Rtax <- mbind(Rtax,bunkersTax) - bunkersEnergy <- Renergy[,,"trans"] - getNames(bunkersEnergy,dim = 1) <- "bunkers" - Renergy <- mbind(Renergy,bunkersEnergy) + # bunkers sector taxes equal to transport taxes + bunkersTax <- Rtax[, , "trans"] + getNames(bunkersTax, dim = 1) <- "bunkers" + Rtax <- mbind(Rtax, bunkersTax) + bunkersEnergy <- Renergy[, , "trans"] + getNames(bunkersEnergy, dim = 1) <- "bunkers" + Renergy <- mbind(Renergy, bunkersEnergy) - #set base year + # set base year getYears(Rtax) <- "2005" getYears(Renergy) <- "2005" - # Weights do not take into account the differentiation by services. So if the tax in a Cooling country - # is very high and the tax in a country in the same region using a lot of electricity for cooking is low, - # the tax for cooling and cooking with electricity will be equal where it should be high for cooling and low for cooking + # Weights do not take into account the differentiation by services. So if + # the tax in a Cooling country is very high and the tax in a country in the + # same region using a lot of electricity for cooking is low, the tax for + # cooling and cooking with electricity will be equal where it should be high + # for cooling and low for cooking # So, we can assume that countries are app. similar in a given region - return(list(x=Rtax,weight=Renergy,unit="$2005/GJ",description=desc)) + return(list(x = Rtax, weight = Renergy, unit = "$2017/GJ", description = desc)) } diff --git a/R/calcPETaxes.R b/R/calcPETaxes.R index d4d4bbd0..1375a730 100644 --- a/R/calcPETaxes.R +++ b/R/calcPETaxes.R @@ -41,18 +41,6 @@ calcPETaxes <- function(subtype = "subsidies") { Rtax <- setNames(tax[, , tax_map], names(tax_map)) Renergy <- setNames(energy[, , tax_map], names(tax_map)) - # convert tax data from $2005 to $2017 - map <- toolGetMapping(type = "regional", name = "regionmappingH12.csv", where = "mappingfolder") %>% - dplyr::select("iso3c" = "CountryCode", "region" = "RegionCode") - - Rtax <- GDPuc::convertGDP( - gdp = Rtax, - unit_in = "constant 2005 Int$PPP", - unit_out = "constant 2017 Int$PPP", - with_regions = map, - replace_NAs = "regional_average" - ) - # convert original data from bulk values to subsidies rates for the case of subsidies Rtax <- Rtax / Renergy * 1e9 # converting from billion$/GJ to $/GJ Rtax[is.na(Rtax)] <- 0 diff --git a/R/convertIIASA_subs_taxes.R b/R/convertIIASA_subs_taxes.R index 5c893937..39d8d34b 100644 --- a/R/convertIIASA_subs_taxes.R +++ b/R/convertIIASA_subs_taxes.R @@ -6,6 +6,10 @@ #' #' @param x MAgPIE object containing IIASA subsidies and taxes data in country #' resolution +#' @param subtype Type of country level data as compiled by IIASA that should +#' be read in. Available types are: \itemize{ \item \code{tax_rate}: tax rate +#' pre final energy category \item \code{subsidies_bulk}: subsidy rate per final +#' energy category \item \code{energy}: final energy quantities per category } #' @return IIASA_subs_taxes data as MAgPIE object aggregated to country level #' @author Christoph Bertram #' @examples @@ -13,12 +17,27 @@ #' a <- convertIIASA_subs_taxes(x) #' } #' -convertIIASA_subs_taxes <- function(x) { +convertIIASA_subs_taxes <- function(x, subtype) { x <- toolCountryFill(x, verbosity = 2, fill = 0, no_remove_warning = c("ADO", "CHI", "ZAR", "IMY", "KSV", "ROM", "TMP", "WBG") ) + # convert monetary data from $2005 to $2017 + if (!subtype %in% c("subsidies_bulk", "tax_rate")) { + + map <- toolGetMapping(type = "regional", name = "regionmappingH12.csv", where = "mappingfolder") %>% + dplyr::select("iso3c" = "CountryCode", "region" = "RegionCode") + + x <- GDPuc::convertGDP( + gdp = x, + unit_in = "constant 2005 Int$PPP", + unit_out = "constant 2017 Int$PPP", + with_regions = map, + replace_NAs = "regional_average" + ) + } + return(x) } diff --git a/R/readIIASA_subs_taxes.R b/R/readIIASA_subs_taxes.R index ff65867e..4a66c4d0 100644 --- a/R/readIIASA_subs_taxes.R +++ b/R/readIIASA_subs_taxes.R @@ -6,7 +6,7 @@ #' #' @param subtype Type of country level data as compiled by IIASA that should #' be read in. Available types are: \itemize{ \item \code{tax_rate}: tax rate -#' pre final energy category \item \code{sub_rate}: subsidy rate per final +#' pre final energy category \item \code{subsidies_bulk}: subsidy rate per final #' energy category \item \code{energy}: final energy quantities per category } #' @return magpie object of the IIASA_subs_taxes data #' @author Christoph Bertram @@ -17,8 +17,14 @@ #' } #' readIIASA_subs_taxes <- function(subtype) { + file <- "unlinked_countries_2017_03.xlsx" - # subtype = tax_rate, sub_rate, energy + + if (!subtype %in% c("tax_rate", "subsidies_bulk", "energy")) { + stop(paste('Invalid subtype -- supported subtypes are:', + paste(c("tax_rate", "subsidies_bulk", "energy"), collapse = ', '))) + } + data <- read_excel(file, sheet = subtype) data <- data[!is.na(data[[1]]), ] From 7eb4a0f63a5e246675b7f344dae6c4476e403b73 Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Fri, 19 Jul 2024 14:05:00 +0200 Subject: [PATCH 10/42] convert unit in calcFossilExtraction --- R/calcFossilExtraction.R | 43 +++++++++++++++++++++++++------------- R/convertDylanAusGasCost.R | 2 +- 2 files changed, 29 insertions(+), 16 deletions(-) diff --git a/R/calcFossilExtraction.R b/R/calcFossilExtraction.R index 8af92595..1885c37c 100644 --- a/R/calcFossilExtraction.R +++ b/R/calcFossilExtraction.R @@ -16,17 +16,19 @@ calcFossilExtraction <- function(subtype = "FossilExtraction") { stop("Not a valid subtype!") } - # setting the weight to the country reserves potential (same weight used on the convertREMIND_11Regi, fossilExtractionCoeff and uraniumExtractionCoeff subtypes) + # setting the weight to the country reserves potential + # (same weight used on the convertREMIND_11Regi, fossilExtractionCoeff and uraniumExtractionCoeff subtypes) if (subtype == "FossilExtraction") { description <- "Coefficients for the 3rd-order polynomial Oil, Gas and Coal extraction costs." # loading coefficients data at country level output <- readSource("REMIND_11Regi", subtype = "fossilExtractionCoeff") # upper bound upperBoundMaxExtraction <- readSource("REMIND_11Regi", subtype = "ffPolyCumEx")[, , "max"] - # high cost curve -> empty list :the aggregation function will choose the coefficients even for regions with no extraction potential + # high cost curve -> empty list :the aggregation function will choose the coefficients + # even for regions with no extraction potential highCostCurve <- list() - # FS: add specific Austrlian gas extraction cost curve based on Dylan McConnell/GSOO data + # FS: add specific Australian gas extraction cost curve based on Dylan McConnell/GSOO data AusRawData <- readSource("DylanAusGasCost") s_GJ_2_twa <- 31.71e-12 @@ -42,33 +44,39 @@ calcFossilExtraction <- function(subtype = "FossilExtraction") { rename(Res = Data2, Price = Value) %>% mutate(Price = as.numeric(Price), Res = as.numeric(as.character(Res))) + # add extraction between 2005 and 2015 + # DIIS data: 2005-2015 natural gas production: 23EJ + # assume that 23 EJ were extracted at 1.5AUSD2015/GJ + # (1.58 is lowest price in gas extraction data after 2015) + DIIS <- data.frame( + Res = 23000, + Price = GDPuc::convertSingle(x = 1.5, iso3c = "USA", + unit_in = "constant 2015 LCU", + unit_out = "constant 2017 Int$PPP") + ) + RegrData <- RegrData %>% # remove depleted sites (zero resources) %>% filter(Res > 0) %>% - # add extraction between 2005 and 2015 - # DIIS data: 2005-2015 natural gas production: 23EJ - # assume that 23 EJ were extracted at 1.5AUSD/GJ -> 0.9 USD - # (1.58 is lowest price in gas extraction data after 2015) -> 0.9 USD - rbind(data.frame(Res = 23000, Price = 0.9)) %>% + rbind(DIIS) %>% # convert from PJ to TWa mutate(Res = Res * 1e-15 / s_GJ_2_twa) %>% # convert from USD/GJ to tr USD/Twa mutate(Price = Price / s_GJ_2_twa / 1e12) %>% arrange(Price) - RegrData$CumRes <- cumsum(RegrData$Res) - RegrData <- RegrData %>% - # remove data points above 6 TWa Cumulative Extraaction, because then Extraction cost constant and would only be outliers to fit, + # remove data points above 6 TWa Cumulative Extraaction, because then + # Extraction cost constant and would only be outliers to fit, # assume that we do not reach with extraction there anyways filter(CumRes < 6) # linear fit to extraction cost data linfit <- lm(Price ~ poly(CumRes, 1, raw = TRUE), data = RegrData) - # subsitute Australia gas extraction polcy coef for medium Scenario with linear fit to Dylan's data + # substitute Australia gas extraction polcy coef for medium Scenario with linear fit to Dylan's data output["AUS", , "medGas.0"] <- coef(linfit)[1] output["AUS", , "medGas.1"] <- coef(linfit)[2] output["AUS", , "medGas.2"] <- 0 @@ -91,12 +99,17 @@ calcFossilExtraction <- function(subtype = "FossilExtraction") { # loading coefficients data at country level data <- readSource("REMIND_11Regi", subtype = "uraniumExtractionCoeff") # maxExtraction (upper limit for function estimation) - BGRuranium <- readSource("BGR", subtype = "uranium")[, , "Remaining_Potential"] # Remaining extraction potential per country + # Remaining extraction potential per country + BGRuranium <- readSource("BGR", subtype = "uranium")[, , "Remaining_Potential"] BGRuranium <- toolCountryFill(BGRuranium, fill = 0, verbosity = 2) totalBGRuranium <- as.numeric(colSums(BGRuranium)) - upperBoundMaxExtraction <- 23 * (BGRuranium / totalBGRuranium) # 23 -> from s31_max_disp_peur -> max global "maximum amount of cumulative uranium production in Megatonnes of metal uranium (U3O8, the stuff that is traded at 40-60US$/lb)." + # 23 -> from s31_max_disp_peur -> max global "maximum amount of cumulative uranium production in + # Megatonnes of metal uranium (U3O8, the stuff that is traded at 40-60US$/lb)." + upperBoundMaxExtraction <- 23 * (BGRuranium / totalBGRuranium) upperBoundMaxExtraction <- add_dimension(upperBoundMaxExtraction, dim = 3.1, add = "pe", nm = "peur") - upperBoundMaxExtraction <- upperBoundMaxExtraction * 1.5 # adding a 50% more to the maximum extraction because the countries shares do not take into consideration the different marginal costs of each country + # adding a 50% more to the maximum extraction because the countries shares do + # not take into consideration the different marginal costs of each country + upperBoundMaxExtraction <- upperBoundMaxExtraction * 1.5 output <- data # set high cost curve if all countries within a region have zero extraction capacity highCostCurve <- list("xi1" = 0.025, "xi2" = 1000, "xi3" = 0, "xi4" = 0) diff --git a/R/convertDylanAusGasCost.R b/R/convertDylanAusGasCost.R index 9c6547fb..1e2adcc1 100644 --- a/R/convertDylanAusGasCost.R +++ b/R/convertDylanAusGasCost.R @@ -10,7 +10,7 @@ convertDylanAusGasCost <- function(x) { # Converting from constant 2015 Australian dollars to constant 2017 Int$PPP GDPuc::convertGDP(unit_in = "constant 2015 LCU", unit_out = "constant 2017 Int$PPP") %>% add_dimension(dim = 3.4, add = "unit", nm = "Natural Gas Extraction Cost [2017USD/GJ]") %>% - toolCountryFill(fill = 0) %>% + toolCountryFill(fill = 0, verbosity = 2) %>% return() } From b90023d6b31a8e9332fef30d76804529470559dc Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Fri, 19 Jul 2024 14:29:06 +0200 Subject: [PATCH 11/42] switch NA replacement strategy in convertGDP --- R/calcCO2Prices.R | 6 +----- R/calcCostsWeathering.R | 5 +---- R/calcDiffInvestCosts.R | 5 +---- R/calcEU_ReferenceScenario.R | 8 ++------ R/calcEconometricEmiParameter.R | 5 +---- R/calcIndustry_EEK.R | 2 +- R/convertIIASA_subs_taxes.R | 7 +------ 7 files changed, 8 insertions(+), 30 deletions(-) diff --git a/R/calcCO2Prices.R b/R/calcCO2Prices.R index 5c93c4ce..b772cf88 100644 --- a/R/calcCO2Prices.R +++ b/R/calcCO2Prices.R @@ -4,17 +4,13 @@ calcCO2Prices <- function() { x <- readSource("ExpertGuess", subtype = "co2prices") getNames(x) <- NULL - # convert from $2005 to $2017 - map <- toolGetMapping(type = "regional", name = "regionmappingH12.csv", where = "mappingfolder") %>% - select("iso3c" = "CountryCode", "region" = "RegionCode") x <- GDPuc::convertGDP( gdp = x, unit_in = "constant 2005 Int$PPP", unit_out = "constant 2017 Int$PPP", - with_regions = map, - replace_NAs = "regional_average" + replace_NAs = "with_USA" ) # read data used for weight diff --git a/R/calcCostsWeathering.R b/R/calcCostsWeathering.R index d343a046..7edb9bea 100644 --- a/R/calcCostsWeathering.R +++ b/R/calcCostsWeathering.R @@ -11,15 +11,12 @@ calcCostsWeathering <- function() { costs <- readSource("Strefler", subtype = "weathering_costs") # convert from $2005 to $2017 - map <- toolGetMapping(type = "regional", name = "regionmappingH12.csv", where = "mappingfolder") %>% - select("iso3c" = "CountryCode", "region" = "RegionCode") x <- GDPuc::convertGDP( gdp = costs, unit_in = "constant 2005 Int$PPP", unit_out = "constant 2017 Int$PPP", - with_regions = map, - replace_NAs = "regional_average" + replace_NAs = "with_USA" ) weight <- costs # get the same dimensions of the data diff --git a/R/calcDiffInvestCosts.R b/R/calcDiffInvestCosts.R index 16aff370..6017169f 100644 --- a/R/calcDiffInvestCosts.R +++ b/R/calcDiffInvestCosts.R @@ -160,15 +160,12 @@ calcDiffInvestCosts <- function(subtype) { x_new[, "y2020", "spv"] <- x_adj_iso # convert data from $2015 to $2017 - map <- toolGetMapping(type = "regional", name = "regionmappingH12.csv", where = "mappingfolder") %>% - dplyr::select("iso3c" = "CountryCode", "region" = "RegionCode") x_new <- GDPuc::convertGDP( gdp = x_new, unit_in = "constant 2015 Int$PPP", unit_out = "constant 2017 Int$PPP", - with_regions = map, - replace_NAs = "regional_average" + replace_NAs = "with_USA" ) return(list( diff --git a/R/calcEU_ReferenceScenario.R b/R/calcEU_ReferenceScenario.R index 01f71253..3229dbb6 100644 --- a/R/calcEU_ReferenceScenario.R +++ b/R/calcEU_ReferenceScenario.R @@ -1,6 +1,4 @@ calcEU_ReferenceScenario <- function() { - map <- toolGetMapping(type = "regional", name = "regionmapping_21_EU11.csv", where = "mappingfolder") %>% - dplyr::select("iso3c" = "CountryCode", "region" = "RegionCode") euRef2016 <- readSource("EU_ReferenceScenario", subtype = "2016") @@ -9,8 +7,7 @@ calcEU_ReferenceScenario <- function() { gdp = euRef2016[, , "Price|Secondary Energy|Electricity (EUR2013/GJ)"], unit_in = "constant 2013 €", unit_out = "constant 2017 Int$PPP", - with_regions = map, - replace_NAs = "regional_average" + replace_NAs = "with_USA" ) getNames(tmp) <- "Price|Secondary Energy|Electricity (US$2017/GJ)" @@ -26,8 +23,7 @@ calcEU_ReferenceScenario <- function() { gdp = euRef2020[, , "Price|Secondary Energy|Electricity (EUR2015/GJ)"], unit_in = "constant 2015 €", unit_out = "constant 2017 Int$PPP", - with_regions = map, - replace_NAs = "regional_average" + replace_NAs = "with_USA" ) getNames(tmp) <- "Price|Secondary Energy|Electricity (US$2017/GJ)" diff --git a/R/calcEconometricEmiParameter.R b/R/calcEconometricEmiParameter.R index 088e5ad9..8c0df5f4 100644 --- a/R/calcEconometricEmiParameter.R +++ b/R/calcEconometricEmiParameter.R @@ -31,15 +31,12 @@ calcEconometricEmiParameter <- function() { getYears(p4) <- getYears(p3) # convert data from $2005 to $2017 - map <- toolGetMapping(type = "regional", name = "regionmappingH12.csv", where = "mappingfolder") %>% - dplyr::select("iso3c" = "CountryCode", "region" = "RegionCode") p4 <- GDPuc::convertGDP( gdp = p4, unit_in = "constant 2005 Int$PPP", unit_out = "constant 2017 Int$PPP", - with_regions = map, - replace_NAs = "regional_average" + replace_NAs = "with_USA" ) # combine all parameters diff --git a/R/calcIndustry_EEK.R b/R/calcIndustry_EEK.R index 389d6359..423b9e97 100644 --- a/R/calcIndustry_EEK.R +++ b/R/calcIndustry_EEK.R @@ -111,7 +111,7 @@ calcIndustry_EEK <- function(kap) { dplyr::rename("value" = "EEK") %>% GDPuc::convertGDP(unit_in = "constant 2012 Int$PPP", unit_out = "constant 2017 Int$PPP", - replace_NAs = "with USA") %>% + replace_NAs = "with_USA") %>% dplyr::mutate(value = .data$value * 1e-3) %>% dplyr::rename("EEK" = "value") diff --git a/R/convertIIASA_subs_taxes.R b/R/convertIIASA_subs_taxes.R index 39d8d34b..15cffab9 100644 --- a/R/convertIIASA_subs_taxes.R +++ b/R/convertIIASA_subs_taxes.R @@ -26,16 +26,11 @@ convertIIASA_subs_taxes <- function(x, subtype) { # convert monetary data from $2005 to $2017 if (!subtype %in% c("subsidies_bulk", "tax_rate")) { - - map <- toolGetMapping(type = "regional", name = "regionmappingH12.csv", where = "mappingfolder") %>% - dplyr::select("iso3c" = "CountryCode", "region" = "RegionCode") - x <- GDPuc::convertGDP( gdp = x, unit_in = "constant 2005 Int$PPP", unit_out = "constant 2017 Int$PPP", - with_regions = map, - replace_NAs = "regional_average" + replace_NAs = "with_USA" ) } From 756d5b29e66d1cf9e0646ba48254d9ed1febb134 Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Fri, 19 Jul 2024 14:55:26 +0200 Subject: [PATCH 12/42] convert currency units in calcINNOPATHS --- R/calcINNOPATHS.R | 18 +++++- .../reportingVariables/Mapping_INNOPATHS.csv | 58 +++++++++---------- 2 files changed, 45 insertions(+), 31 deletions(-) diff --git a/R/calcINNOPATHS.R b/R/calcINNOPATHS.R index 85aa43ef..21cf2197 100644 --- a/R/calcINNOPATHS.R +++ b/R/calcINNOPATHS.R @@ -29,10 +29,24 @@ calcINNOPATHS <- function() { to = "REMIND", partrel = TRUE, verbosity = 2 ) + # convert currency units from €2015 to $2017 + tmp <- x[, , "EUR2015", pmatch = TRUE] + x <- x[, , getNames(tmp), invert = TRUE] + getNames(tmp) <- gsub("EUR2015", "US$2017", getNames(tmp)) + + tmp <- GDPuc::convertGDP( + gdp = tmp, + unit_in = "constant 2015 €", + unit_out = "constant 2017 Int$PPP", + replace_NAs = "with_USA" + ) + + x <- mbind(x, tmp) + weights <- x weights[, , ] <- NA - weights[, , "US$2005", pmatch = TRUE] <- 1 - weights[, , "GDP|MER (billion US$2005/yr)"] <- NA + weights[, , "US$2017", pmatch = TRUE] <- 1 + weights[, , "GDP|MER (billion US$2017/yr)"] <- NA return(list( x = x, diff --git a/inst/extdata/reportingVariables/Mapping_INNOPATHS.csv b/inst/extdata/reportingVariables/Mapping_INNOPATHS.csv index 3882025a..3f3e9b5b 100755 --- a/inst/extdata/reportingVariables/Mapping_INNOPATHS.csv +++ b/inst/extdata/reportingVariables/Mapping_INNOPATHS.csv @@ -124,8 +124,8 @@ "NA";"Final Energy|Transportation|Passenger|LDV|Liquids (PJ/yr)";"NA"; "FE|Transport|Pass|Train|Electricity (EJ/yr)";"Final Energy|Transportation|Passenger|Train|Electricity (PJ/yr)";0.001; "Floorspace demand (million m2)";"Services and Products|Residential and Commercial|Floorspace demand (million m2)";1; -"GDP|MER (billion US$2005/yr)";"Economy|GDP|MER (billion EUR2015/yr)";0.9259259; -"GDP|PPP (billion US$2005/yr)";"Economy|GDP|PPP (billion EUR2015/yr)";0.9259259; +"GDP|MER (billion EUR2015/yr)";"Economy|GDP|MER (billion EUR2015/yr)";1; +"GDP|PPP (billion EUR2015/yr)";"Economy|GDP|PPP (billion EUR2015/yr)";1; "NA";"Capacity Additions|Electricity|Gas|CC (GW/yr)";"NA"; "NA";"Capacity Additions|Electricity|Gas|OC (GW/yr)";"NA"; "NA";"Capacity Additions|Electricity|Geothermal (GW/yr)";"NA"; @@ -586,7 +586,7 @@ "NA";"Capacity Additions|Electricity|Solar|PV (GW/yr)";"NA";"zero values in source" "NA";"Capacity Additions|Electricity|Wind (GW/yr)";"NA";"zero values in source" "NA";"Capacity Additions|Electricity|Wind|Onshore (GW/yr)";"NA";"zero values in source" -"OandM costs (billion US$2005/yr)";"Total Energy System Cost|O&M Costs (billion EUR2015/yr)";0.9259259; +"OandM costs (billion EUR2015/yr)";"Total Energy System Cost|O&M Costs (billion EUR2015/yr)";1; "PE (EJ/yr)";"Primary Energy (PJ/yr)";0.001; "PE|Biomass (EJ/yr)";"Primary Energy|Biomass (PJ/yr)";0.001; "PE|Biomass|Electricity (EJ/yr)";"Primary Energy|Biomass|Electricity (PJ/yr)";0.001; @@ -638,30 +638,30 @@ "PE|Solar (EJ/yr)";"Primary Energy|Solar (PJ/yr)";0.001; "PE|Wind (EJ/yr)";"Primary Energy|Wind (PJ/yr)";0.001; "Population (million)";"Economy|Population (million people)";1; -"Price|Biomass|World Market (US$2005/GJ)";"Price|Primary Energy|Biomass (EUR2015/GJ)";0.9259259; -"Price|Carbon (US$2005/t CO2)";"Price|Carbon|Net|Transport (EUR2015/t CO2)";0.9259259; -"Price|Carbon (US$2005/t CO2)";"Price|Carbon|EU-wide Regulation All Sectors (EUR2015/t CO2)";0.9259259; -"Price|Primary Energy|Coal (US$2005/GJ)";"Price|Primary Energy|Coal (EUR2015/GJ)";0.9259259; -"Price|Secondary Energy|Solids|Fossil (US$2005/GJ)";"Price|Secondary Energy|Solids|Coal (EUR2015/GJ)";0.9259259; -"Price|Primary Energy|Oil (US$2005/GJ)";"Price|Primary Energy|Oil (EUR2015/GJ)";0.9259259; -"Price|Final Energy|Buildings|Electricity (US$2005/GJ)";"Price|Final Energy|Residential and Commercial|Electricity (EUR2015/GJ)";0.9259259; -"Price|Final Energy|Industry|Electricity (US$2005/GJ)";"Price|Final Energy|Industry|Electricity (EUR2015/GJ)";0.9259259; -"Price|Final Energy|Buildings|Gases (US$2005/GJ)";"Price|Final Energy|Residential and Commercial|Gases (EUR2015/GJ)";0.9259259; -"Price|Final Energy|Industry|Gases (US$2005/GJ)";"Price|Final Energy|Industry|Gases (EUR2015/GJ)";0.9259259; -"Price|Final Energy|Buildings|Heat (US$2005/GJ)";"Price|Final Energy|Residential and Commercial|Heat (EUR2015/GJ)";0.9259259; -"Price|Final Energy|Industry|Heat (US$2005/GJ)";"Price|Final Energy|Industry|Heat (EUR2015/GJ)";0.9259259; -"Price|Final Energy|Buildings|Heating Oil (US$2005/GJ)";"Price|Final Energy|Residential and Commercial|Liquids (EUR2015/GJ)";0.9259259; -"Price|Final Energy|Industry|Heating Oil (US$2005/GJ)";"Price|Final Energy|Industry|Liquids (EUR2015/GJ)";0.9259259; -"Price|Final Energy|Buildings|Hydrogen (US$2005/GJ)";"Price|Final Energy|Residential and Commercial|Hydrogen (EUR2015/GJ)";0.9259259; -"Price|Final Energy|Industry|Hydrogen (US$2005/GJ)";"Price|Final Energy|Industry|Hydrogen (EUR2015/GJ)";0.9259259; -"Price|Final Energy|Buildings|Solids (US$2005/GJ)";"Price|Final Energy|Residential and Commercial|Solids (EUR2015/GJ)";0.9259259; -"Price|Final Energy|Industry|Solids (US$2005/GJ)";"Price|Final Energy|Industry|Solids (EUR2015/GJ)";0.9259259; -"Price|Primary Energy|Gas (US$2005/GJ)";"Price|Primary Energy|Gas (EUR2015/GJ)";0.9259259; -"Price|Secondary Energy|Electricity (US$2005/GJ)";"Price|Secondary Energy|Electricity (EUR2015/GJ)";0.9259259; -"Price|Secondary Energy|Gases (US$2005/GJ)";"Price|Secondary Energy|Gases (EUR2015/GJ)";0.9259259; -"Price|Secondary Energy|Hydrogen (US$2005/GJ)";"Price|Secondary Energy|Hydrogen (EUR2015/GJ)";0.9259259; -"Price|Secondary Energy|Liquids (US$2005/GJ)";"Price|Secondary Energy|Liquids (EUR2015/GJ)";0.9259259; -"Price|Secondary Energy|Solids|Biomass (US$2005/GJ)";"Price|Secondary Energy|Solids|Biomass (EUR2015/GJ)";0.9259259; +"Price|Biomass|World Market (EUR2015/GJ)";"Price|Primary Energy|Biomass (EUR2015/GJ)";1; +"Price|Carbon (EUR2015/t CO2)";"Price|Carbon|Net|Transport (EUR2015/t CO2)";1; +"Price|Carbon (EUR2015/t CO2)";"Price|Carbon|EU-wide Regulation All Sectors (EUR2015/t CO2)";1; +"Price|Primary Energy|Coal (EUR2015/GJ)";"Price|Primary Energy|Coal (EUR2015/GJ)";1; +"Price|Secondary Energy|Solids|Fossil (EUR2015/GJ)";"Price|Secondary Energy|Solids|Coal (EUR2015/GJ)";1; +"Price|Primary Energy|Oil (EUR2015/GJ)";"Price|Primary Energy|Oil (EUR2015/GJ)";1; +"Price|Final Energy|Buildings|Electricity (EUR2015/GJ)";"Price|Final Energy|Residential and Commercial|Electricity (EUR2015/GJ)";1; +"Price|Final Energy|Industry|Electricity (EUR2015/GJ)";"Price|Final Energy|Industry|Electricity (EUR2015/GJ)";1; +"Price|Final Energy|Buildings|Gases (EUR2015/GJ)";"Price|Final Energy|Residential and Commercial|Gases (EUR2015/GJ)";1; +"Price|Final Energy|Industry|Gases (EUR2015/GJ)";"Price|Final Energy|Industry|Gases (EUR2015/GJ)";1; +"Price|Final Energy|Buildings|Heat (EUR2015/GJ)";"Price|Final Energy|Residential and Commercial|Heat (EUR2015/GJ)";1; +"Price|Final Energy|Industry|Heat (EUR2015/GJ)";"Price|Final Energy|Industry|Heat (EUR2015/GJ)";1; +"Price|Final Energy|Buildings|Heating Oil (EUR2015/GJ)";"Price|Final Energy|Residential and Commercial|Liquids (EUR2015/GJ)";1; +"Price|Final Energy|Industry|Heating Oil (EUR2015/GJ)";"Price|Final Energy|Industry|Liquids (EUR2015/GJ)";1; +"Price|Final Energy|Buildings|Hydrogen (EUR2015/GJ)";"Price|Final Energy|Residential and Commercial|Hydrogen (EUR2015/GJ)";1; +"Price|Final Energy|Industry|Hydrogen (EUR2015/GJ)";"Price|Final Energy|Industry|Hydrogen (EUR2015/GJ)";1; +"Price|Final Energy|Buildings|Solids (EUR2015/GJ)";"Price|Final Energy|Residential and Commercial|Solids (EUR2015/GJ)";1; +"Price|Final Energy|Industry|Solids (EUR2015/GJ)";"Price|Final Energy|Industry|Solids (EUR2015/GJ)";1; +"Price|Primary Energy|Gas (EUR2015/GJ)";"Price|Primary Energy|Gas (EUR2015/GJ)";1; +"Price|Secondary Energy|Electricity (EUR2015/GJ)";"Price|Secondary Energy|Electricity (EUR2015/GJ)";1; +"Price|Secondary Energy|Gases (EUR2015/GJ)";"Price|Secondary Energy|Gases (EUR2015/GJ)";1; +"Price|Secondary Energy|Hydrogen (EUR2015/GJ)";"Price|Secondary Energy|Hydrogen (EUR2015/GJ)";1; +"Price|Secondary Energy|Liquids (EUR2015/GJ)";"Price|Secondary Energy|Liquids (EUR2015/GJ)";1; +"Price|Secondary Energy|Solids|Biomass (EUR2015/GJ)";"Price|Secondary Energy|Solids|Biomass (EUR2015/GJ)";1; "NA";"Secondary Energy (PJ/yr)";"NA";"zero values in source" "SE|Electricity (EJ/yr)";"Secondary Energy|Electricity (PJ/yr)";0.001; "SE|Electricity|Biomass (EJ/yr)";"Secondary Energy|Electricity|Biomass (TWh/yr)";0.0036; @@ -718,8 +718,8 @@ "SE|Solids (EJ/yr)";"Secondary Energy|Solids (PJ/yr)";0.001; "SE|Solids|Biomass (EJ/yr)";"Secondary Energy|Solids|Biomass (PJ/yr)";0.001; "SE|Solids|Coal (EJ/yr)";"Secondary Energy|Solids|Coal (PJ/yr)";0.001; -"Total Energy costs (billion US$2005/yr)";"Total Energy System Cost (billion EUR2015/yr)";0.9259259; -"Total Energy costs|Electricity (billion US$2005/yr)";"Total Energy System Cost|Power Sector (billion EUR2015/yr)";0.9259259; +"Total Energy costs (billion EUR2015/yr)";"Total Energy System Cost (billion EUR2015/yr)";1; +"Total Energy costs|Electricity (billion EUR2015/yr)";"Total Energy System Cost|Power Sector (billion EUR2015/yr)";1; "Trade|Biomass (EJ/yr)";"Trade|Primary Energy|Biomass|Volume (PJ/yr)";0.001; "Trade|Coal (EJ/yr)";"Trade|Primary Energy|Coal|Volume (PJ/yr)";0.001; "Trade|Gas (EJ/yr)";"Trade|Primary Energy|Gas|Volume (PJ/yr)";0.001; From 18d03e5bf5b2b8c8fe03d1f2a8c85de5abe5d0a7 Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Fri, 19 Jul 2024 15:06:22 +0200 Subject: [PATCH 13/42] move jrc idees mappings to library --- R/calcJRC_IDEES.R | 20 +- .../Mapping_JRC_IDEES_REMIND_Industry.csv | 886 ++++++++ .../Mapping_JRC_IDEES_REMIND_ResCom.csv | 7 + .../Mapping_JRC_IDEES_REMIND_Transport.csv | 1827 +++++++++++++++++ 4 files changed, 2729 insertions(+), 11 deletions(-) create mode 100755 inst/extdata/reportingVariables/Mapping_JRC_IDEES_REMIND_Industry.csv create mode 100755 inst/extdata/reportingVariables/Mapping_JRC_IDEES_REMIND_ResCom.csv create mode 100755 inst/extdata/reportingVariables/Mapping_JRC_IDEES_REMIND_Transport.csv diff --git a/R/calcJRC_IDEES.R b/R/calcJRC_IDEES.R index cfdd1e64..c1f00e07 100644 --- a/R/calcJRC_IDEES.R +++ b/R/calcJRC_IDEES.R @@ -29,23 +29,23 @@ calcJRC_IDEES <- function(subtype) { energy <- readSource("JRC_IDEES", subtype = "Energy") jrc <- mbind(ind, emi, energy) mapping <- toolGetMapping("Mapping_JRC_IDEES_REMIND_Industry.csv", - type = "reportingVariables", where = "mappingfolder") + type = "reportingVariables", where = "mrremind") } else if (subtype == "Transport") { transport <- readSource("JRC_IDEES", subtype = "Transport") mbunkers <- readSource("JRC_IDEES", subtype = "MBunkers") jrc <- mbind(transport, mbunkers) mapping <- toolGetMapping("Mapping_JRC_IDEES_REMIND_Transport.csv", - type = "reportingVariables", where = "mappingfolder") + type = "reportingVariables", where = "mrremind") } else { residential <- readSource("JRC_IDEES", subtype = "Residential") services <- readSource("JRC_IDEES", subtype = "Tertiary") jrc <- mbind(residential, services) mapping <- toolGetMapping("Mapping_JRC_IDEES_REMIND_ResCom.csv", - type = "reportingVariables", where = "mappingfolder") + type = "reportingVariables", where = "mrremind") } mapping <- mapping %>% - mutate(!!sym("conversion") := as.numeric(!!sym("Factor")) * !!sym("Weight")) %>% + mutate("conversion" = as.numeric(!!sym("Factor")) * !!sym("Weight")) %>% select("variable" = "JRC_complete", "REMIND_variable", "conversion", "unit" = "Unit_JRC", "Unit_REMIND") mapping$variable <- gsub(pattern = "\\.", replacement = "_", mapping$variable) %>% trimws() @@ -55,7 +55,7 @@ calcJRC_IDEES <- function(subtype) { EU28_regions <- cntr[which(cntr$RegionCode == "EUR"), ]$CountryCode x <- left_join( - jrc %>% + jrc %>% mselect(iso3c = EU28_regions, variable = unique(mapping$variable)) %>% as.data.frame() %>% as_tibble() %>% @@ -64,16 +64,14 @@ calcJRC_IDEES <- function(subtype) { mapping, by = "variable" ) %>% - mutate(!!sym("value") := !!sym("value") * !!sym("conversion"), - !!sym("REMIND_variable") := paste0(!!sym("REMIND_variable"), " (", !!sym("Unit_REMIND"), ")")) %>% + mutate("value" = !!sym("value") * !!sym("conversion"), + "REMIND_variable" = paste0(!!sym("REMIND_variable"), " (", !!sym("Unit_REMIND"), ")")) %>% select("variable" = "REMIND_variable", "region", "year", "value") x <- aggregate(value ~ variable + region + year, x, sum) %>% as.magpie() %>% - toolCountryFill(fill = NA, verbosity = 2) - - # fill smaller EU-countries with 0s to allow for aggregation of EU-region - x[c("ALA", "FRO", "GIB", "GGY", "IMN", "JEY"),,] <- 0 + toolCountryFill(fill = NA, verbosity = 2) %>% + toolFillEU34Countries() return(list(x = x, weight = NULL, unit = "billion US$2005/yr, EJ/yr, Mt CO2/yr, Mt/yr", diff --git a/inst/extdata/reportingVariables/Mapping_JRC_IDEES_REMIND_Industry.csv b/inst/extdata/reportingVariables/Mapping_JRC_IDEES_REMIND_Industry.csv new file mode 100755 index 00000000..b26c1e50 --- /dev/null +++ b/inst/extdata/reportingVariables/Mapping_JRC_IDEES_REMIND_Industry.csv @@ -0,0 +1,886 @@ +"REMIND_variable";"Comment";"JRC_variable";"JRC_Excel";"JRC_spreadsheet";"JRC_line ";"Weight";"Unit_REMIND";"Unit_JRC";"Factor";"JRC_complete" +"FE|Industry";"Energy consumption ";"by fuel (EUROSTAT DATA)";"JRC-IDEES-2015_Industry_";"Ind_Summary";29;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Energy consumption|by fuel (EUROSTAT DATA)" +"FE|Industry";"Non-energy use";"by fuel (EUROSTAT DATA)";"JRC-IDEES-2015_Industry_";"Ind_Summary";80;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Non-energy use|by fuel (EUROSTAT DATA)" +"FE|Industry";"Agriculture/Forestry/Fishing";"All Products";"JRC-IDEES-2015_EnergyBalance_";"cagr";2;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|All Products" +"FE|Industry";"Transf. Input Coke Ovens";"All Products";"JRC-IDEES-2015_EnergyBalance_";"tick";2;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|All Products" +"FE|Industry";"Transf. Input Blast Furnace";"All Products";"JRC-IDEES-2015_EnergyBalance_";"tibf";2;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|All Products" +"FE|Industry";"Transf. Output Coke Ovens";"All Products";"JRC-IDEES-2015_EnergyBalance_";"tock";2;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|All Products" +"FE|Industry";"Transf. Output Blast Furnace";"All Products";"JRC-IDEES-2015_EnergyBalance_";"tobf";2;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|All Products" +"FE|Industry";"Consumption Coke Ovens";"All Products";"JRC-IDEES-2015_EnergyBalance_";"cenck";2;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|All Products" +"FE|Industry";"Consumption Blast Furnaces";"All Products";"JRC-IDEES-2015_EnergyBalance_";"cenbf";2;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|All Products" +"FE|w/o Non-energy Use|Industry";"Energy consumption ";"by fuel (EUROSTAT DATA)";"JRC-IDEES-2015_Industry_";"Ind_Summary";29;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Energy consumption|by fuel (EUROSTAT DATA)" +"FE|w/o Non-energy Use|Industry";"Agriculture/Forestry/Fishing";"All Products";"JRC-IDEES-2015_EnergyBalance_";"cagr";2;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|All Products" +"FE|w/o Non-energy Use|Industry";"Transf. Input Coke Ovens";"All Products";"JRC-IDEES-2015_EnergyBalance_";"tick";2;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|All Products" +"FE|w/o Non-energy Use|Industry";"Transf. Input Blast Furnace";"All Products";"JRC-IDEES-2015_EnergyBalance_";"tibf";2;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|All Products" +"FE|w/o Non-energy Use|Industry";"Transf. Output Coke Ovens";"All Products";"JRC-IDEES-2015_EnergyBalance_";"tock";2;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|All Products" +"FE|w/o Non-energy Use|Industry";"Transf. Output Blast Furnace";"All Products";"JRC-IDEES-2015_EnergyBalance_";"tobf";2;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|All Products" +"FE|w/o Non-energy Use|Industry";"Consumption Coke Ovens";"All Products";"JRC-IDEES-2015_EnergyBalance_";"cenck";2;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|All Products" +"FE|w/o Non-energy Use|Industry";"Consumption Blast Furnaces";"All Products";"JRC-IDEES-2015_EnergyBalance_";"cenbf";2;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|All Products" +"FE|Industry|Solids";"Energy consumption ";"Solids";"JRC-IDEES-2015_Industry_";"Ind_Summary";30;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Energy consumption|by fuel (EUROSTAT DATA)|Solids" +"FE|Industry|Solids";"Energy consumption ";"Biomass and wastes";"JRC-IDEES-2015_Industry_";"Ind_Summary";43;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Energy consumption|by fuel (EUROSTAT DATA)|RES and wastes|Biomass and wastes" +"FE|Industry|Solids";"Non-energy use";"Solids";"JRC-IDEES-2015_Industry_";"Ind_Summary";81;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Non-energy use|by fuel (EUROSTAT DATA)|Solids" +"FE|Industry|Solids";"Agriculture/Forestry/Fishing";"Solid Fuels";"JRC-IDEES-2015_EnergyBalance_";"cagr";3;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|Solid Fuels" +"FE|Industry|Solids";"Agriculture/Forestry/Fishing";"Solid biofuels (Wood & Wood waste)";"JRC-IDEES-2015_EnergyBalance_";"cagr";69;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|Solid biofuels (Wood & Wood waste)" +"FE|Industry|Solids";"Agriculture/Forestry/Fishing";"Charcoal";"JRC-IDEES-2015_EnergyBalance_";"cagr";70;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|Charcoal" +"FE|Industry|Solids";"Agriculture/Forestry/Fishing";"Municipal waste (renewable)";"JRC-IDEES-2015_EnergyBalance_";"cagr";72;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|Municipal waste (renewable)" +"FE|Industry|Solids";"Agriculture/Forestry/Fishing";"Wastes (non-renewable)";"JRC-IDEES-2015_EnergyBalance_";"cagr";80;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|Wastes (non-renewable)" +"FE|Industry|Solids";"Transf. Input Coke Ovens";"Solid Fuels";"JRC-IDEES-2015_EnergyBalance_";"tick";3;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|Solid Fuels" +"FE|Industry|Solids";"Transf. Input Coke Ovens";"Solid biofuels (Wood & Wood waste)";"JRC-IDEES-2015_EnergyBalance_";"tick";69;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|Solid biofuels (Wood & Wood waste)" +"FE|Industry|Solids";"Transf. Input Coke Ovens";"Charcoal";"JRC-IDEES-2015_EnergyBalance_";"tick";70;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|Charcoal" +"FE|Industry|Solids";"Transf. Input Coke Ovens";"Municipal waste (renewable)";"JRC-IDEES-2015_EnergyBalance_";"tick";72;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|Municipal waste (renewable)" +"FE|Industry|Solids";"Transf. Input Coke Ovens";"Wastes (non-renewable)";"JRC-IDEES-2015_EnergyBalance_";"tick";80;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|Wastes (non-renewable)" +"FE|Industry|Solids";"Transf. Input Blast Furnace";"Solid Fuels";"JRC-IDEES-2015_EnergyBalance_";"tibf";3;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|Solid Fuels" +"FE|Industry|Solids";"Transf. Input Blast Furnace";"Solid biofuels (Wood & Wood waste)";"JRC-IDEES-2015_EnergyBalance_";"tibf";69;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|Solid biofuels (Wood & Wood waste)" +"FE|Industry|Solids";"Transf. Input Blast Furnace";"Charcoal";"JRC-IDEES-2015_EnergyBalance_";"tibf";70;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|Charcoal" +"FE|Industry|Solids";"Transf. Input Blast Furnace";"Municipal waste (renewable)";"JRC-IDEES-2015_EnergyBalance_";"tibf";72;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|Municipal waste (renewable)" +"FE|Industry|Solids";"Transf. Input Blast Furnace";"Wastes (non-renewable)";"JRC-IDEES-2015_EnergyBalance_";"tibf";80;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|Wastes (non-renewable)" +"FE|Industry|Solids";"Transf. Output Coke Ovens";"Solid Fuels";"JRC-IDEES-2015_EnergyBalance_";"tock";3;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|Solid Fuels" +"FE|Industry|Solids";"Transf. Output Coke Ovens";"Solid biofuels (Wood & Wood waste)";"JRC-IDEES-2015_EnergyBalance_";"tock";69;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|Solid biofuels (Wood & Wood waste)" +"FE|Industry|Solids";"Transf. Output Coke Ovens";"Charcoal";"JRC-IDEES-2015_EnergyBalance_";"tock";70;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|Charcoal" +"FE|Industry|Solids";"Transf. Output Coke Ovens";"Municipal waste (renewable)";"JRC-IDEES-2015_EnergyBalance_";"tock";72;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|Municipal waste (renewable)" +"FE|Industry|Solids";"Transf. Output Coke Ovens";"Wastes (non-renewable)";"JRC-IDEES-2015_EnergyBalance_";"tock";80;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|Wastes (non-renewable)" +"FE|Industry|Solids";"Transf. Output Blast Furnace";"Solid Fuels";"JRC-IDEES-2015_EnergyBalance_";"tobf";3;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|Solid Fuels" +"FE|Industry|Solids";"Transf. Output Blast Furnace";"Solid biofuels (Wood & Wood waste)";"JRC-IDEES-2015_EnergyBalance_";"tobf";69;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|Solid biofuels (Wood & Wood waste)" +"FE|Industry|Solids";"Transf. Output Blast Furnace";"Charcoal";"JRC-IDEES-2015_EnergyBalance_";"tobf";70;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|Charcoal" +"FE|Industry|Solids";"Transf. Output Blast Furnace";"Municipal waste (renewable)";"JRC-IDEES-2015_EnergyBalance_";"tobf";72;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|Municipal waste (renewable)" +"FE|Industry|Solids";"Transf. Output Blast Furnace";"Wastes (non-renewable)";"JRC-IDEES-2015_EnergyBalance_";"tobf";80;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|Wastes (non-renewable)" +"FE|Industry|Solids";"Consumption Coke Ovens";"Solid Fuels";"JRC-IDEES-2015_EnergyBalance_";"cenck";3;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|Solid Fuels" +"FE|Industry|Solids";"Consumption Coke Ovens";"Solid biofuels (Wood & Wood waste)";"JRC-IDEES-2015_EnergyBalance_";"cenck";69;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|Solid biofuels (Wood & Wood waste)" +"FE|Industry|Solids";"Consumption Coke Ovens";"Charcoal";"JRC-IDEES-2015_EnergyBalance_";"cenck";70;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|Charcoal" +"FE|Industry|Solids";"Consumption Coke Ovens";"Municipal waste (renewable)";"JRC-IDEES-2015_EnergyBalance_";"cenck";72;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|Municipal waste (renewable)" +"FE|Industry|Solids";"Consumption Coke Ovens";"Wastes (non-renewable)";"JRC-IDEES-2015_EnergyBalance_";"cenck";80;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|Wastes (non-renewable)" +"FE|Industry|Solids";"Consumption Blast Furnaces";"Solid Fuels";"JRC-IDEES-2015_EnergyBalance_";"cenbf";3;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|Solid Fuels" +"FE|Industry|Solids";"Consumption Blast Furnaces";"Solid biofuels (Wood & Wood waste)";"JRC-IDEES-2015_EnergyBalance_";"cenbf";69;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|Solid biofuels (Wood & Wood waste)" +"FE|Industry|Solids";"Consumption Blast Furnaces";"Charcoal";"JRC-IDEES-2015_EnergyBalance_";"cenbf";70;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|Charcoal" +"FE|Industry|Solids";"Consumption Blast Furnaces";"Municipal waste (renewable)";"JRC-IDEES-2015_EnergyBalance_";"cenbf";72;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|Municipal waste (renewable)" +"FE|Industry|Solids";"Consumption Blast Furnaces";"Wastes (non-renewable)";"JRC-IDEES-2015_EnergyBalance_";"cenbf";80;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|Wastes (non-renewable)" +"FE|Industry|Liquids";"Energy consumption ";"Liquids";"JRC-IDEES-2015_Industry_";"Ind_Summary";33;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Energy consumption|by fuel (EUROSTAT DATA)|Liquids" +"FE|Industry|Liquids";"Energy consumption ";"Liquid biofuels";"JRC-IDEES-2015_Industry_";"Ind_Summary";45;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Energy consumption|by fuel (EUROSTAT DATA)|RES and wastes|Liquid biofuels" +"FE|Industry|Liquids";"Non-energy use";"Liquids";"JRC-IDEES-2015_Industry_";"Ind_Summary";82;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Non-energy use|by fuel (EUROSTAT DATA)|Liquids" +"FE|Industry|Liquids";"Agriculture/Forestry/Fishing";"Total petroleum products (without biofuels)";"JRC-IDEES-2015_EnergyBalance_";"cagr";21;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|Total petroleum products (without biofuels)" +"FE|Industry|Liquids";"Agriculture/Forestry/Fishing";"Liquid biofuels";"JRC-IDEES-2015_EnergyBalance_";"cagr";73;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|Liquid biofuels" +"FE|Industry|Liquids";"Transf. Input Coke Ovens";"Total petroleum products (without biofuels)";"JRC-IDEES-2015_EnergyBalance_";"tick";21;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|Total petroleum products (without biofuels)" +"FE|Industry|Liquids";"Transf. Input Coke Ovens";"Liquid biofuels";"JRC-IDEES-2015_EnergyBalance_";"tick";73;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|Liquid biofuels" +"FE|Industry|Liquids";"Transf. Input Blast Furnace";"Total petroleum products (without biofuels)";"JRC-IDEES-2015_EnergyBalance_";"tibf";21;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|Total petroleum products (without biofuels)" +"FE|Industry|Liquids";"Transf. Input Blast Furnace";"Liquid biofuels";"JRC-IDEES-2015_EnergyBalance_";"tibf";73;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|Liquid biofuels" +"FE|Industry|Liquids";"Transf. Output Coke Ovens";"Total petroleum products (without biofuels)";"JRC-IDEES-2015_EnergyBalance_";"tock";21;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|Total petroleum products (without biofuels)" +"FE|Industry|Liquids";"Transf. Output Coke Ovens";"Liquid biofuels";"JRC-IDEES-2015_EnergyBalance_";"tock";73;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|Liquid biofuels" +"FE|Industry|Liquids";"Transf. Output Blast Furnace";"Total petroleum products (without biofuels)";"JRC-IDEES-2015_EnergyBalance_";"tobf";21;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|Total petroleum products (without biofuels)" +"FE|Industry|Liquids";"Transf. Output Blast Furnace";"Liquid biofuels";"JRC-IDEES-2015_EnergyBalance_";"tobf";73;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|Liquid biofuels" +"FE|Industry|Liquids";"Consumption Coke Ovens";"Total petroleum products (without biofuels)";"JRC-IDEES-2015_EnergyBalance_";"cenck";21;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|Total petroleum products (without biofuels)" +"FE|Industry|Liquids";"Consumption Coke Ovens";"Liquid biofuels";"JRC-IDEES-2015_EnergyBalance_";"cenck";73;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|Liquid biofuels" +"FE|Industry|Liquids";"Consumption Blast Furnaces";"Total petroleum products (without biofuels)";"JRC-IDEES-2015_EnergyBalance_";"cenbf";21;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|Total petroleum products (without biofuels)" +"FE|Industry|Liquids";"Consumption Blast Furnaces";"Liquid biofuels";"JRC-IDEES-2015_EnergyBalance_";"cenbf";73;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|Liquid biofuels" +"FE|Industry|Gases";"Energy consumption ";"Gases";"JRC-IDEES-2015_Industry_";"Ind_Summary";39;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Energy consumption|by fuel (EUROSTAT DATA)|Gases" +"FE|Industry|Gases";"Energy consumption ";"Biogas";"JRC-IDEES-2015_Industry_";"Ind_Summary";44;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Energy consumption|by fuel (EUROSTAT DATA)|RES and wastes|Biogas" +"FE|Industry|Gases";"Non-energy use";"Gas";"JRC-IDEES-2015_Industry_";"Ind_Summary";89;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Non-energy use|by fuel (EUROSTAT DATA)|Gas" +"FE|Industry|Gases";"Agriculture/Forestry/Fishing";"Gases";"JRC-IDEES-2015_EnergyBalance_";"cagr";52;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|Gases" +"FE|Industry|Gases";"Agriculture/Forestry/Fishing";"Biogas";"JRC-IDEES-2015_EnergyBalance_";"cagr";71;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|Biogas" +"FE|Industry|Gases";"Transf. Input Coke Ovens";"Gases";"JRC-IDEES-2015_EnergyBalance_";"tick";52;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|Gases" +"FE|Industry|Gases";"Transf. Input Coke Ovens";"Biogas";"JRC-IDEES-2015_EnergyBalance_";"tick";71;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|Biogas" +"FE|Industry|Gases";"Transf. Input Blast Furnace";"Gases";"JRC-IDEES-2015_EnergyBalance_";"tibf";52;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|Gases" +"FE|Industry|Gases";"Transf. Input Blast Furnace";"Biogas";"JRC-IDEES-2015_EnergyBalance_";"tibf";71;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|Biogas" +"FE|Industry|Gases";"Transf. Output Coke Ovens";"Gases";"JRC-IDEES-2015_EnergyBalance_";"tock";52;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|Gases" +"FE|Industry|Gases";"Transf. Output Coke Ovens";"Biogas";"JRC-IDEES-2015_EnergyBalance_";"tock";71;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|Biogas" +"FE|Industry|Gases";"Transf. Output Blast Furnace";"Gases";"JRC-IDEES-2015_EnergyBalance_";"tobf";52;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|Gases" +"FE|Industry|Gases";"Transf. Output Blast Furnace";"Biogas";"JRC-IDEES-2015_EnergyBalance_";"tobf";71;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|Biogas" +"FE|Industry|Gases";"Consumption Coke Ovens";"Gases";"JRC-IDEES-2015_EnergyBalance_";"cenck";52;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|Gases" +"FE|Industry|Gases";"Consumption Coke Ovens";"Biogas";"JRC-IDEES-2015_EnergyBalance_";"cenck";71;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|Biogas" +"FE|Industry|Gases";"Consumption Blast Furnaces";"Gases";"JRC-IDEES-2015_EnergyBalance_";"cenbf";52;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|Gases" +"FE|Industry|Gases";"Consumption Blast Furnaces";"Biogas";"JRC-IDEES-2015_EnergyBalance_";"cenbf";71;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|Biogas" +"FE|Industry|Heat";"Energy consumption ";"Solar";"JRC-IDEES-2015_Industry_";"Ind_Summary";46;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Energy consumption|by fuel (EUROSTAT DATA)|RES and wastes|Solar" +"FE|Industry|Heat";"Energy consumption ";"Geothermal";"JRC-IDEES-2015_Industry_";"Ind_Summary";47;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Energy consumption|by fuel (EUROSTAT DATA)|RES and wastes|Geothermal" +"FE|Industry|Heat";"Energy consumption ";"Steam distributed";"JRC-IDEES-2015_Industry_";"Ind_Summary";48;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Energy consumption|by fuel (EUROSTAT DATA)|Steam distributed" +"FE|Industry|Heat";"Agriculture/Forestry/Fishing";"Nuclear heat";"JRC-IDEES-2015_EnergyBalance_";"cagr";59;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|Nuclear heat" +"FE|Industry|Heat";"Agriculture/Forestry/Fishing";"Derived heat";"JRC-IDEES-2015_EnergyBalance_";"cagr";60;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|Derived heat" +"FE|Industry|Heat";"Agriculture/Forestry/Fishing";"Hydro power";"JRC-IDEES-2015_EnergyBalance_";"cagr";62;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|Hydro power" +"FE|Industry|Heat";"Agriculture/Forestry/Fishing";"Wind Power";"JRC-IDEES-2015_EnergyBalance_";"cagr";63;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|Wind Power" +"FE|Industry|Heat";"Agriculture/Forestry/Fishing";"Solar energy";"JRC-IDEES-2015_EnergyBalance_";"cagr";64;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|Solar energy" +"FE|Industry|Heat";"Agriculture/Forestry/Fishing";"Tide, Wave and Ocean";"JRC-IDEES-2015_EnergyBalance_";"cagr";67;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|Tide, Wave and Ocean" +"FE|Industry|Heat";"Agriculture/Forestry/Fishing";"Geothermal";"JRC-IDEES-2015_EnergyBalance_";"cagr";78;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|Geothermal" +"FE|Industry|Heat";"Consumption Blast Furnaces";"Nuclear heat";"JRC-IDEES-2015_EnergyBalance_";"cenbf";59;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|Nuclear heat" +"FE|Industry|Heat";"Consumption Blast Furnaces";"Derived heat";"JRC-IDEES-2015_EnergyBalance_";"cenbf";60;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|Derived heat" +"FE|Industry|Heat";"Consumption Blast Furnaces";"Geothermal";"JRC-IDEES-2015_EnergyBalance_";"cenbf";78;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|Geothermal" +"FE|Industry|Heat";"Consumption Blast Furnaces";"Solar energy";"JRC-IDEES-2015_EnergyBalance_";"cenbf";64;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|Solar energy" +"FE|Industry|Heat";"Consumption Coke Ovens";"Nuclear heat";"JRC-IDEES-2015_EnergyBalance_";"cenck";59;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|Nuclear heat" +"FE|Industry|Heat";"Consumption Coke Ovens";"Derived heat";"JRC-IDEES-2015_EnergyBalance_";"cenck";60;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|Derived heat" +"FE|Industry|Heat";"Consumption Coke Ovens";"Geothermal";"JRC-IDEES-2015_EnergyBalance_";"cenck";78;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|Geothermal" +"FE|Industry|Heat";"Consumption Coke Ovens";"Solar energy";"JRC-IDEES-2015_EnergyBalance_";"cenck";64;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|Solar energy" +"FE|Industry|Heat";"Transf. Output Blast Furnace";"Nuclear heat";"JRC-IDEES-2015_EnergyBalance_";"tobf";59;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|Nuclear heat" +"FE|Industry|Heat";"Transf. Output Blast Furnace";"Derived heat";"JRC-IDEES-2015_EnergyBalance_";"tobf";60;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|Derived heat" +"FE|Industry|Heat";"Transf. Output Blast Furnace";"Geothermal";"JRC-IDEES-2015_EnergyBalance_";"tobf";78;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|Geothermal" +"FE|Industry|Heat";"Transf. Output Blast Furnace";"Solar energy";"JRC-IDEES-2015_EnergyBalance_";"tobf";64;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|Solar energy" +"FE|Industry|Heat";"Transf. Output Coke Ovens";"Nuclear heat";"JRC-IDEES-2015_EnergyBalance_";"tock";59;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|Nuclear heat" +"FE|Industry|Heat";"Transf. Output Coke Ovens";"Derived heat";"JRC-IDEES-2015_EnergyBalance_";"tock";60;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|Derived heat" +"FE|Industry|Heat";"Transf. Output Coke Ovens";"Geothermal";"JRC-IDEES-2015_EnergyBalance_";"tock";78;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|Geothermal" +"FE|Industry|Heat";"Transf. Output Coke Ovens";"Solar energy";"JRC-IDEES-2015_EnergyBalance_";"tock";64;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|Solar energy" +"FE|Industry|Heat";"Transf. Input Blast Furnace";"Nuclear heat";"JRC-IDEES-2015_EnergyBalance_";"tibf";59;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|Nuclear heat" +"FE|Industry|Heat";"Transf. Input Blast Furnace";"Derived heat";"JRC-IDEES-2015_EnergyBalance_";"tibf";60;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|Derived heat" +"FE|Industry|Heat";"Transf. Input Blast Furnace";"Geothermal";"JRC-IDEES-2015_EnergyBalance_";"tibf";78;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|Geothermal" +"FE|Industry|Heat";"Transf. Input Blast Furnace";"Solar energy";"JRC-IDEES-2015_EnergyBalance_";"tibf";64;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|Solar energy" +"FE|Industry|Heat";"Transf. Input Coke Ovens";"Nuclear heat";"JRC-IDEES-2015_EnergyBalance_";"tick";59;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|Nuclear heat" +"FE|Industry|Heat";"Transf. Input Coke Ovens";"Derived heat";"JRC-IDEES-2015_EnergyBalance_";"tick";60;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|Derived heat" +"FE|Industry|Heat";"Transf. Input Coke Ovens";"Geothermal";"JRC-IDEES-2015_EnergyBalance_";"tick";78;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|Geothermal" +"FE|Industry|Heat";"Transf. Input Coke Ovens";"Solar energy";"JRC-IDEES-2015_EnergyBalance_";"tick";64;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|Solar energy" +"FE|Industry|Electricity";"Energy consumption ";"Electricity";"JRC-IDEES-2015_Industry_";"Ind_Summary";49;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Energy consumption|by fuel (EUROSTAT DATA)|Electricity" +"FE|Industry|Electricity";"Agriculture/Forestry/Fishing";"Electricity";"JRC-IDEES-2015_EnergyBalance_";"cagr";79;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|Electricity" +"FE|Industry|Electricity";"Consumption Blast Furnaces";"Hydro power";"JRC-IDEES-2015_EnergyBalance_";"cenbf";62;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|Hydro power" +"FE|Industry|Electricity";"Consumption Blast Furnaces";"Wind Power";"JRC-IDEES-2015_EnergyBalance_";"cenbf";63;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|Wind Power" +"FE|Industry|Electricity";"Consumption Blast Furnaces";"Tide, Wave and Ocean";"JRC-IDEES-2015_EnergyBalance_";"cenbf";67;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|Tide, Wave and Ocean" +"FE|Industry|Electricity";"Consumption Blast Furnaces";"Electricity";"JRC-IDEES-2015_EnergyBalance_";"cenbf";79;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|Electricity" +"FE|Industry|Electricity";"Consumption Coke Ovens";"Hydro power";"JRC-IDEES-2015_EnergyBalance_";"cenck";62;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|Hydro power" +"FE|Industry|Electricity";"Consumption Coke Ovens";"Wind Power";"JRC-IDEES-2015_EnergyBalance_";"cenck";63;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|Wind Power" +"FE|Industry|Electricity";"Consumption Coke Ovens";"Tide, Wave and Ocean";"JRC-IDEES-2015_EnergyBalance_";"cenck";67;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|Tide, Wave and Ocean" +"FE|Industry|Electricity";"Consumption Coke Ovens";"Electricity";"JRC-IDEES-2015_EnergyBalance_";"cenck";79;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|Electricity" +"FE|Industry|Electricity";"Transf. Output Blast Furnace";"Hydro power";"JRC-IDEES-2015_EnergyBalance_";"tobf";62;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|Hydro power" +"FE|Industry|Electricity";"Transf. Output Blast Furnace";"Wind Power";"JRC-IDEES-2015_EnergyBalance_";"tobf";63;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|Wind Power" +"FE|Industry|Electricity";"Transf. Output Blast Furnace";"Tide, Wave and Ocean";"JRC-IDEES-2015_EnergyBalance_";"tobf";67;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|Tide, Wave and Ocean" +"FE|Industry|Electricity";"Transf. Output Blast Furnace";"Electricity";"JRC-IDEES-2015_EnergyBalance_";"tobf";79;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|Electricity" +"FE|Industry|Electricity";"Transf. Output Coke Ovens";"Hydro power";"JRC-IDEES-2015_EnergyBalance_";"tock";62;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|Hydro power" +"FE|Industry|Electricity";"Transf. Output Coke Ovens";"Wind Power";"JRC-IDEES-2015_EnergyBalance_";"tock";63;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|Wind Power" +"FE|Industry|Electricity";"Transf. Output Coke Ovens";"Tide, Wave and Ocean";"JRC-IDEES-2015_EnergyBalance_";"tock";67;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|Tide, Wave and Ocean" +"FE|Industry|Electricity";"Transf. Output Coke Ovens";"Electricity";"JRC-IDEES-2015_EnergyBalance_";"tock";79;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|Electricity" +"FE|Industry|Electricity";"Transf. Input Blast Furnace";"Hydro power";"JRC-IDEES-2015_EnergyBalance_";"tibf";62;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|Hydro power" +"FE|Industry|Electricity";"Transf. Input Blast Furnace";"Wind Power";"JRC-IDEES-2015_EnergyBalance_";"tibf";63;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|Wind Power" +"FE|Industry|Electricity";"Transf. Input Blast Furnace";"Tide, Wave and Ocean";"JRC-IDEES-2015_EnergyBalance_";"tibf";67;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|Tide, Wave and Ocean" +"FE|Industry|Electricity";"Transf. Input Blast Furnace";"Electricity";"JRC-IDEES-2015_EnergyBalance_";"tibf";79;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|Electricity" +"FE|Industry|Electricity";"Transf. Input Coke Ovens";"Hydro power";"JRC-IDEES-2015_EnergyBalance_";"tick";62;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|Hydro power" +"FE|Industry|Electricity";"Transf. Input Coke Ovens";"Wind Power";"JRC-IDEES-2015_EnergyBalance_";"tick";63;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|Wind Power" +"FE|Industry|Electricity";"Transf. Input Coke Ovens";"Tide, Wave and Ocean";"JRC-IDEES-2015_EnergyBalance_";"tick";67;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|Tide, Wave and Ocean" +"FE|Industry|Electricity";"Transf. Input Coke Ovens";"Electricity";"JRC-IDEES-2015_EnergyBalance_";"tick";79;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|Electricity" +"FE|Industry|Chemicals ";"Chemicals (excluding feedstocks)";"Basic chemicals";"JRC-IDEES-2015_Industry_";"CHI_fec";5;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals" +"FE|Industry|Chemicals ";"Chemicals (excluding feedstocks)";"Other chemicals";"JRC-IDEES-2015_Industry_";"CHI_fec";60;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals" +"FE|Industry|Chemicals ";"Chemicals (excluding feedstocks)";"Pharmaceutical products etc.";"JRC-IDEES-2015_Industry_";"CHI_fec";108;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc." +"FE|Industry|Chemicals ";"Chemicals (excluding feedstocks)";"Feedstocks to be excluded";"JRC-IDEES-2015_Industry_";"CHI_fec";15;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Feedstock (energy used as raw material)" +"Value Added|Industry|Chemicals";"Value added chemicals";"Chemicals Industry";"JRC-IDEES-2015_Industry_";"Ind_Summary";9;1;"billion US$2005/yr";"M€2010";0.00119;"Industry Summary|Value added|Chemicals Industry" +"FE|Industry|Chemicals|Feedstocks";"chemical feedstocks only ";"Chemicals: Feedstock (energy used as raw material)";"JRC-IDEES-2015_Industry_";"CHI_fec";15;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Feedstock (energy used as raw material)" +"FE|Industry|Solids|Chemicals";"Solids";"Solids";"JRC-IDEES-2015_Industry_";"CHI_fec";25;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Steam processing|Solids" +"FE|Industry|Solids|Chemicals";"Solids";"Biomass";"JRC-IDEES-2015_Industry_";"CHI_fec";33;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Steam processing|Biomass" +"FE|Industry|Solids|Chemicals";"Solids";"Solids";"JRC-IDEES-2015_Industry_";"CHI_fec";37;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Furnaces|Chemicals: Furnaces - Thermal|Solids" +"FE|Industry|Solids|Chemicals";"Solids";"Solids";"JRC-IDEES-2015_Industry_";"CHI_fec";46;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Solids" +"FE|Industry|Solids|Chemicals";"Solids";"Biomass";"JRC-IDEES-2015_Industry_";"CHI_fec";54;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Biomass" +"FE|Industry|Solids|Chemicals";"Solids";"Solids";"JRC-IDEES-2015_Industry_";"CHI_fec";72;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Solids" +"FE|Industry|Solids|Chemicals";"Solids";"Biomass";"JRC-IDEES-2015_Industry_";"CHI_fec";80;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Biomass" +"FE|Industry|Solids|Chemicals";"Solids";"Solids";"JRC-IDEES-2015_Industry_";"CHI_fec";85;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Furnaces|Chemicals: Furnaces - Thermal|Solids" +"FE|Industry|Solids|Chemicals";"Solids";"Solids";"JRC-IDEES-2015_Industry_";"CHI_fec";94;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Solids" +"FE|Industry|Solids|Chemicals";"Solids";"Biomass";"JRC-IDEES-2015_Industry_";"CHI_fec";102;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Biomass" +"FE|Industry|Solids|Chemicals";"Solids";"Biomass";"JRC-IDEES-2015_Industry_";"CHI_fec";120;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Solids " +"FE|Industry|Solids|Chemicals";"Solids";"Biomass";"JRC-IDEES-2015_Industry_";"CHI_fec";128;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Biomass" +"FE|Industry|Solids|Chemicals";"Solids";"Solids";"JRC-IDEES-2015_Industry_";"CHI_fec";133;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Furnaces|Chemicals: Furnaces - Thermal|Solids" +"FE|Industry|Solids|Chemicals";"Solids";"Solids";"JRC-IDEES-2015_Industry_";"CHI_fec";142;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Solids" +"FE|Industry|Solids|Chemicals";"Solids";"Biomass";"JRC-IDEES-2015_Industry_";"CHI_fec";150;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Biomass" +"FE|Industry|Liquids|Chemicals";"Liquids";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"CHI_fec";11;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Low enthalpy heat|Diesel oil (incl. biofuels) " +"FE|Industry|Liquids|Chemicals";"Liquids";"LPG";"JRC-IDEES-2015_Industry_";"CHI_fec";27;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Steam processing|LPG" +"FE|Industry|Liquids|Chemicals";"Liquids";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"CHI_fec";28;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Steam processing|Diesel oil (incl. biofuels) " +"FE|Industry|Liquids|Chemicals";"Liquids";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"CHI_fec";29;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Steam processing|Residual fuel oil " +"FE|Industry|Liquids|Chemicals";"Liquids";"Other liquids";"JRC-IDEES-2015_Industry_";"CHI_fec";30;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Steam processing|Other liquids " +"FE|Industry|Liquids|Chemicals";"Liquids";"LPG";"JRC-IDEES-2015_Industry_";"CHI_fec";38;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Furnaces|Chemicals: Furnaces - Thermal|LPG" +"FE|Industry|Liquids|Chemicals";"Liquids";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"CHI_fec";39;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Furnaces|Chemicals: Furnaces - Thermal|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|Chemicals";"Liquids";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"CHI_fec";40;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Furnaces|Chemicals: Furnaces - Thermal|Residual fuel oil " +"FE|Industry|Liquids|Chemicals";"Liquids";"LPG";"JRC-IDEES-2015_Industry_";"CHI_fec";48;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|LPG" +"FE|Industry|Liquids|Chemicals";"Liquids";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"CHI_fec";49;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|Chemicals";"Liquids";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"CHI_fec";50;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Residual fuel oil " +"FE|Industry|Liquids|Chemicals";"Liquids";"Other liquids";"JRC-IDEES-2015_Industry_";"CHI_fec";51;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Other liquids " +"FE|Industry|Liquids|Chemicals";"Liquids";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"CHI_fec";66;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Low enthalpy heat|Diesel oil (incl. biofuels) " +"FE|Industry|Liquids|Chemicals";"Liquids";"LPG";"JRC-IDEES-2015_Industry_";"CHI_fec";74;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|LPG" +"FE|Industry|Liquids|Chemicals";"Liquids";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"CHI_fec";75;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|Chemicals";"Liquids";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"CHI_fec";76;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Residual fuel oil" +"FE|Industry|Liquids|Chemicals";"Liquids";"Other liquids";"JRC-IDEES-2015_Industry_";"CHI_fec";77;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Other liquids" +"FE|Industry|Liquids|Chemicals";"Liquids";"LPG";"JRC-IDEES-2015_Industry_";"CHI_fec";86;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Furnaces|Chemicals: Furnaces - Thermal|LPG" +"FE|Industry|Liquids|Chemicals";"Liquids";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"CHI_fec";87;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Furnaces|Chemicals: Furnaces - Thermal|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|Chemicals";"Liquids";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"CHI_fec";88;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Furnaces|Chemicals: Furnaces - Thermal|Residual fuel oil " +"FE|Industry|Liquids|Chemicals";"Liquids";"LPG";"JRC-IDEES-2015_Industry_";"CHI_fec";96;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|LPG" +"FE|Industry|Liquids|Chemicals";"Liquids";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"CHI_fec";97;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|Chemicals";"Liquids";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"CHI_fec";98;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Residual fuel oil " +"FE|Industry|Liquids|Chemicals";"Liquids";"Other liquids";"JRC-IDEES-2015_Industry_";"CHI_fec";99;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Other liquids " +"FE|Industry|Liquids|Chemicals";"Liquids";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"CHI_fec";114;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Low enthalpy heat|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|Chemicals";"Liquids";"LPG";"JRC-IDEES-2015_Industry_";"CHI_fec";122;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|LPG" +"FE|Industry|Liquids|Chemicals";"Liquids";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"CHI_fec";123;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|Chemicals";"Liquids";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"CHI_fec";124;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Residual fuel oil" +"FE|Industry|Liquids|Chemicals";"Liquids";"Other liquids";"JRC-IDEES-2015_Industry_";"CHI_fec";125;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Other liquids" +"FE|Industry|Liquids|Chemicals";"Liquids";"LPG";"JRC-IDEES-2015_Industry_";"CHI_fec";134;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Furnaces|Chemicals: Furnaces - Thermal|LPG" +"FE|Industry|Liquids|Chemicals";"Liquids";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"CHI_fec";135;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Furnaces|Chemicals: Furnaces - Thermal|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|Chemicals";"Liquids";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"CHI_fec";136;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Furnaces|Chemicals: Furnaces - Thermal|Residual fuel oil" +"FE|Industry|Liquids|Chemicals";"Liquids";"LPG";"JRC-IDEES-2015_Industry_";"CHI_fec";144;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Process cooling|Chemicals: Process cooling - Steam|LPG" +"FE|Industry|Liquids|Chemicals";"Liquids";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"CHI_fec";145;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|Chemicals";"Liquids";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"CHI_fec";146;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Residual fuel oil" +"FE|Industry|Liquids|Chemicals";"Liquids";"Other liquids";"JRC-IDEES-2015_Industry_";"CHI_fec";147;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Other liquids" +"FE|Industry|Gases|Chemicals";"Gases";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"CHI_fec";12;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Low enthalpy heat|Natural gas (incl. biogas)" +"FE|Industry|Gases|Chemicals";"Gases";"Refinery gas";"JRC-IDEES-2015_Industry_";"CHI_fec";26;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Steam processing|Refinery gas" +"FE|Industry|Gases|Chemicals";"Gases";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"CHI_fec";31;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Steam processing|Natural gas (incl. biogas)" +"FE|Industry|Gases|Chemicals";"Gases";"Derived gases";"JRC-IDEES-2015_Industry_";"CHI_fec";32;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Steam processing|Derived gases " +"FE|Industry|Gases|Chemicals";"Gases";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"CHI_fec";41;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Furnaces|Chemicals: Furnaces - Thermal|Natural gas (incl. biogas)" +"FE|Industry|Gases|Chemicals";"Gases";"Chemicals: Process cooling - Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"CHI_fec";44;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Natural gas (incl. biogas)" +"FE|Industry|Gases|Chemicals";"Gases";"Refinery gas";"JRC-IDEES-2015_Industry_";"CHI_fec";47;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Refinery gas" +"FE|Industry|Gases|Chemicals";"Gases";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"CHI_fec";52;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Natural gas (incl. biogas)" +"FE|Industry|Gases|Chemicals";"Gases";"Derived gases";"JRC-IDEES-2015_Industry_";"CHI_fec";53;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Derived gases " +"FE|Industry|Gases|Chemicals";"Gases";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"CHI_fec";67;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Low enthalpy heat|Natural gas (incl. biogas)" +"FE|Industry|Gases|Chemicals";"Gases";"Refinery gas";"JRC-IDEES-2015_Industry_";"CHI_fec";73;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Refinery gas " +"FE|Industry|Gases|Chemicals";"Gases";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"CHI_fec";78;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Natural gas (incl. biogas)" +"FE|Industry|Gases|Chemicals";"Gases";"Derived gases";"JRC-IDEES-2015_Industry_";"CHI_fec";79;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Derived gases" +"FE|Industry|Gases|Chemicals";"Gases";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"CHI_fec";89;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Furnaces|Chemicals: Furnaces - Thermal|Natural gas (incl. biogas)" +"FE|Industry|Gases|Chemicals";"Gases";"Chemicals: Process cooling - Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"CHI_fec";92;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Natural gas (incl. biogas)" +"FE|Industry|Gases|Chemicals";"Gases";"Refinery gas";"JRC-IDEES-2015_Industry_";"CHI_fec";95;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Refinery gas" +"FE|Industry|Gases|Chemicals";"Gases";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"CHI_fec";100;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Natural gas (incl. biogas)" +"FE|Industry|Gases|Chemicals";"Gases";"Derived gases";"JRC-IDEES-2015_Industry_";"CHI_fec";101;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Derived gases " +"FE|Industry|Gases|Chemicals";"Gases";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"CHI_fec";115;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Low enthalpy heat|Natural gas (incl. biogas)" +"FE|Industry|Gases|Chemicals";"Gases";"Refinery gas";"JRC-IDEES-2015_Industry_";"CHI_fec";121;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Refinery gas" +"FE|Industry|Gases|Chemicals";"Gases";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"CHI_fec";126;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Natural gas (incl. biogas) " +"FE|Industry|Gases|Chemicals";"Gases";"Derived gases";"JRC-IDEES-2015_Industry_";"CHI_fec";127;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Derived gases" +"FE|Industry|Gases|Chemicals";"Gases";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"CHI_fec";137;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Furnaces|Chemicals: Furnaces - Thermal|Natural gas (incl. biogas)" +"FE|Industry|Gases|Chemicals";"Gases";"Chemicals: Process cooling - Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"CHI_fec";140;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Process cooling|Chemicals: Process cooling - Natural gas (incl. biogas) " +"FE|Industry|Gases|Chemicals";"Gases";"Refinery gas";"JRC-IDEES-2015_Industry_";"CHI_fec";143;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Refinery gas " +"FE|Industry|Gases|Chemicals";"Gases";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"CHI_fec";148;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Natural gas (incl. biogas)" +"FE|Industry|Gases|Chemicals";"Gases";"Derived gases";"JRC-IDEES-2015_Industry_";"CHI_fec";149;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Derived gases" +"FE|Industry|Electricity|Chemicals";"Electricity";"Lighting";"JRC-IDEES-2015_Industry_";"CHI_fec";6;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Lighting" +"FE|Industry|Electricity|Chemicals";"Electricity";"Air compressors";"JRC-IDEES-2015_Industry_";"CHI_fec";7;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Air compressors" +"FE|Industry|Electricity|Chemicals";"Electricity";"Motor drives";"JRC-IDEES-2015_Industry_";"CHI_fec";8;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Motor drives" +"FE|Industry|Electricity|Chemicals";"Electricity";"Fans and pumps";"JRC-IDEES-2015_Industry_";"CHI_fec";9;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Fans and pumps" +"FE|Industry|Electricity|Chemicals";"Electricity";"Electricity";"JRC-IDEES-2015_Industry_";"CHI_fec";14;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Low enthalpy heat|Electricity " +"FE|Industry|Electricity|Chemicals";"Electricity";"Chemicals: Furnaces - Electric";"JRC-IDEES-2015_Industry_";"CHI_fec";42;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Furnaces|Chemicals: Furnaces - Electric" +"FE|Industry|Electricity|Chemicals";"Electricity";"Chemicals: Process cooling - Electric";"JRC-IDEES-2015_Industry_";"CHI_fec";56;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Electric" +"FE|Industry|Electricity|Chemicals";"Electricity";"Chemicals: Generic electric process";"JRC-IDEES-2015_Industry_";"CHI_fec";57;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Generic electric process" +"FE|Industry|Electricity|Chemicals";"Electricity";"Lighting";"JRC-IDEES-2015_Industry_";"CHI_fec";61;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Lighting" +"FE|Industry|Electricity|Chemicals";"Electricity";"Air compressors";"JRC-IDEES-2015_Industry_";"CHI_fec";62;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Air compressors" +"FE|Industry|Electricity|Chemicals";"Electricity";"Motor drives";"JRC-IDEES-2015_Industry_";"CHI_fec";63;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Motor drives" +"FE|Industry|Electricity|Chemicals";"Electricity";"Fans and pumps";"JRC-IDEES-2015_Industry_";"CHI_fec";64;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Fans and pumps" +"FE|Industry|Electricity|Chemicals";"Electricity";"Electricity";"JRC-IDEES-2015_Industry_";"CHI_fec";69;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Low enthalpy heat|Electricity " +"FE|Industry|Electricity|Chemicals";"Electricity";"High enthalpy heat processing - Electric (microwave)";"JRC-IDEES-2015_Industry_";"CHI_fec";82;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Electric (microwave)" +"FE|Industry|Electricity|Chemicals";"Electricity";"Chemicals: Furnaces - Electric";"JRC-IDEES-2015_Industry_";"CHI_fec";90;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Furnaces|Chemicals: Furnaces - Electric" +"FE|Industry|Electricity|Chemicals";"Electricity";"Chemicals: Process cooling - Electric";"JRC-IDEES-2015_Industry_";"CHI_fec";104;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Electric" +"FE|Industry|Electricity|Chemicals";"Electricity";"Chemicals: Generic electric process";"JRC-IDEES-2015_Industry_";"CHI_fec";105;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Generic electric process" +"FE|Industry|Electricity|Chemicals";"Electricity";"Lighting";"JRC-IDEES-2015_Industry_";"CHI_fec";109;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Lighting " +"FE|Industry|Electricity|Chemicals";"Electricity";"Air compressors";"JRC-IDEES-2015_Industry_";"CHI_fec";110;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Air compressors" +"FE|Industry|Electricity|Chemicals";"Electricity";"Motor drives";"JRC-IDEES-2015_Industry_";"CHI_fec";111;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Motor drives " +"FE|Industry|Electricity|Chemicals";"Electricity";"Fans and pumps";"JRC-IDEES-2015_Industry_";"CHI_fec";112;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Fans and pumps" +"FE|Industry|Electricity|Chemicals";"Electricity";"Electricity";"JRC-IDEES-2015_Industry_";"CHI_fec";117;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Low enthalpy heat|Electricity" +"FE|Industry|Electricity|Chemicals";"Electricity";"High enthalpy heat processing - Electric (microwave)";"JRC-IDEES-2015_Industry_";"CHI_fec";130;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Electric (microwave) " +"FE|Industry|Electricity|Chemicals";"Electricity";"Chemicals: Furnaces - Electric";"JRC-IDEES-2015_Industry_";"CHI_fec";138;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Furnaces|Chemicals: Furnaces - Electric " +"FE|Industry|Electricity|Chemicals";"Electricity";"Chemicals: Process cooling - Electric";"JRC-IDEES-2015_Industry_";"CHI_fec";152;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Process cooling|Chemicals: Process cooling - Electric" +"FE|Industry|Electricity|Chemicals";"Electricity";"Chemicals: Generic electric process";"JRC-IDEES-2015_Industry_";"CHI_fec";153;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Generic electric process" +"FE|Industry|Heat|Chemicals";"Heat";"Solar and geothermal";"JRC-IDEES-2015_Industry_";"CHI_fec";13;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Low enthalpy heat|Solar and geothermal" +"FE|Industry|Heat|Chemicals";"Heat";"Steam distributed";"JRC-IDEES-2015_Industry_";"CHI_fec";34;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Steam processing|Steam distributed " +"FE|Industry|Heat|Chemicals";"Heat";"Steam distributed";"JRC-IDEES-2015_Industry_";"CHI_fec";55;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Steam distributed " +"FE|Industry|Heat|Chemicals";"Heat";"Solar and geothermal";"JRC-IDEES-2015_Industry_";"CHI_fec";68;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Low enthalpy heat|Solar and geothermal" +"FE|Industry|Heat|Chemicals";"Heat";"Steam distributed";"JRC-IDEES-2015_Industry_";"CHI_fec";81;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Steam distributed" +"FE|Industry|Heat|Chemicals";"Heat";"Steam distributed";"JRC-IDEES-2015_Industry_";"CHI_fec";103;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Steam distributed " +"FE|Industry|Heat|Chemicals";"Heat";"Solar and geothermal";"JRC-IDEES-2015_Industry_";"CHI_fec";116;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Low enthalpy heat|Solar and geothermal " +"FE|Industry|Heat|Chemicals";"Heat";"Steam distributed";"JRC-IDEES-2015_Industry_";"CHI_fec";129;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Steam distributed" +"FE|Industry|Heat|Chemicals";"Heat";"Steam distributed";"JRC-IDEES-2015_Industry_";"CHI_fec";151;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Steam distributed" +"FE|Industry|Steel ";"Primary steel";"Integrated steelworks";"JRC-IDEES-2015_Industry_";"ISI_fec";5;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks" +"FE|Industry|Steel ";"Secondary Steel ";"Electric arc";"JRC-IDEES-2015_Industry_";"ISI_fec";53;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc" +"FE|Industry|Steel ";"Transf. Input Coke Ovens";"All Products";"JRC-IDEES-2015_EnergyBalance_";"tick";2;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|All Products" +"FE|Industry|Steel ";"Transf. Input Blast Furnace";"All Products";"JRC-IDEES-2015_EnergyBalance_";"tibf";2;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|All Products" +"FE|Industry|Steel ";"Transf. Output Coke Ovens";"All Products";"JRC-IDEES-2015_EnergyBalance_";"tock";2;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|All Products" +"FE|Industry|Steel ";"Transf. Output Blast Furnace";"All Products";"JRC-IDEES-2015_EnergyBalance_";"tobf";2;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|All Products" +"FE|Industry|Steel ";"Consumption Coke Ovens";"All Products";"JRC-IDEES-2015_EnergyBalance_";"cenck";2;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|All Products" +"FE|Industry|Steel ";"Consumption Blast Furnaces";"All Products";"JRC-IDEES-2015_EnergyBalance_";"cenbf";2;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|All Products" +"Production|Industry|Steel";"Steel (primary + secondary)";"Physical output (kt steel)";"JRC-IDEES-2015_Industry_";"ISI";7;1;"Mt/yr";"kt steel";0.001;"Iron and Steel|Physical output" +"Production|Industry|Steel|Primary";"Tonnes primary steel ";"Integrated steelworks";"JRC-IDEES-2015_Industry_";"ISI";8;1;"Mt/yr";"kt steel";0.001;"Iron and Steel|Physical output|Integrated steelworks" +"Production|Industry|Steel|Secondary";"Tonnes secondary steel ";"Electric arc";"JRC-IDEES-2015_Industry_";"ISI";9;1;"Mt/yr";"kt steel";0.001;"Iron and Steel|Physical output|Electric arc" +"FE|Industry|Steel|Primary";"Primary steel";"Integrated steelworks";"JRC-IDEES-2015_Industry_";"ISI_fec";5;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks" +"FE|Industry|Steel|Primary";"Transf. Input Coke Ovens";"All Products";"JRC-IDEES-2015_EnergyBalance_";"tick";2;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|All Products" +"FE|Industry|Steel|Primary";"Transf. Input Blast Furnace";"All Products";"JRC-IDEES-2015_EnergyBalance_";"tibf";2;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|All Products" +"FE|Industry|Steel|Primary";"Transf. Output Coke Ovens";"All Products";"JRC-IDEES-2015_EnergyBalance_";"tock";2;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|All Products" +"FE|Industry|Steel|Primary";"Transf. Output Blast Furnace";"All Products";"JRC-IDEES-2015_EnergyBalance_";"tobf";2;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|All Products" +"FE|Industry|Steel|Primary";"Consumption Coke Ovens";"All Products";"JRC-IDEES-2015_EnergyBalance_";"cenck";2;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|All Products" +"FE|Industry|Steel|Primary";"Consumption Blast Furnaces";"All Products";"JRC-IDEES-2015_EnergyBalance_";"cenbf";2;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|All Products" +"FE|Industry|Steel|Secondary";"Secondary Steel ";"Electric arc";"JRC-IDEES-2015_Industry_";"ISI_fec";53;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc" +"FE|Industry|Solids|Steel|Primary";"Transf. Input Coke Ovens";"Solid Fuels";"JRC-IDEES-2015_EnergyBalance_";"tick";3;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|Solid Fuels" +"FE|Industry|Solids|Steel|Primary";"Transf. Input Coke Ovens";"Solid biofuels (Wood & Wood waste)";"JRC-IDEES-2015_EnergyBalance_";"tick";69;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|Solid biofuels (Wood & Wood waste)" +"FE|Industry|Solids|Steel|Primary";"Transf. Input Coke Ovens";"Charcoal";"JRC-IDEES-2015_EnergyBalance_";"tick";70;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|Charcoal" +"FE|Industry|Solids|Steel|Primary";"Transf. Input Coke Ovens";"Municipal waste (renewable)";"JRC-IDEES-2015_EnergyBalance_";"tick";72;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|Municipal waste (renewable)" +"FE|Industry|Solids|Steel|Primary";"Transf. Input Coke Ovens";"Wastes (non-renewable)";"JRC-IDEES-2015_EnergyBalance_";"tick";80;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|Wastes (non-renewable)" +"FE|Industry|Liquids|Steel|Primary";"Transf. Input Coke Ovens";"Total petroleum products (without biofuels)";"JRC-IDEES-2015_EnergyBalance_";"tick";21;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|Total petroleum products (without biofuels)" +"FE|Industry|Liquids|Steel|Primary";"Transf. Input Coke Ovens";"Liquid biofuels";"JRC-IDEES-2015_EnergyBalance_";"tick";73;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|Liquid biofuels" +"FE|Industry|Gases|Steel|Primary";"Transf. Input Coke Ovens";"Gases";"JRC-IDEES-2015_EnergyBalance_";"tick";52;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|Gases" +"FE|Industry|Gases|Steel|Primary";"Transf. Input Coke Ovens";"Biogas";"JRC-IDEES-2015_EnergyBalance_";"tick";71;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|Biogas" +"FE|Industry|Heat|Steel|Primary";"Transf. Input Coke Ovens";"Nuclear heat";"JRC-IDEES-2015_EnergyBalance_";"tick";59;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|Nuclear heat" +"FE|Industry|Heat|Steel|Primary";"Transf. Input Coke Ovens";"Derived heat";"JRC-IDEES-2015_EnergyBalance_";"tick";60;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|Derived heat" +"FE|Industry|Heat|Steel|Primary";"Transf. Input Coke Ovens";"Geothermal";"JRC-IDEES-2015_EnergyBalance_";"tick";78;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|Geothermal" +"FE|Industry|Heat|Steel|Primary";"Transf. Input Coke Ovens";"Solar energy";"JRC-IDEES-2015_EnergyBalance_";"tick";64;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|Solar energy" +"FE|Industry|Electricity|Steel|Primary";"Transf. Input Coke Ovens";"Hydro power";"JRC-IDEES-2015_EnergyBalance_";"tick";62;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|Hydro power" +"FE|Industry|Electricity|Steel|Primary";"Transf. Input Coke Ovens";"Wind Power";"JRC-IDEES-2015_EnergyBalance_";"tick";63;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|Wind Power" +"FE|Industry|Electricity|Steel|Primary";"Transf. Input Coke Ovens";"Tide, Wave and Ocean";"JRC-IDEES-2015_EnergyBalance_";"tick";67;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|Tide, Wave and Ocean" +"FE|Industry|Electricity|Steel|Primary";"Transf. Input Coke Ovens";"Electricity";"JRC-IDEES-2015_EnergyBalance_";"tick";79;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Coke Ovens|Electricity" +"FE|Industry|Solids|Steel|Primary";"Transf. Input Blast Furnace";"Solid Fuels";"JRC-IDEES-2015_EnergyBalance_";"tibf";3;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|Solid Fuels" +"FE|Industry|Solids|Steel|Primary";"Transf. Input Blast Furnace";"Solid biofuels (Wood & Wood waste)";"JRC-IDEES-2015_EnergyBalance_";"tibf";69;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|Solid biofuels (Wood & Wood waste)" +"FE|Industry|Solids|Steel|Primary";"Transf. Input Blast Furnace";"Charcoal";"JRC-IDEES-2015_EnergyBalance_";"tibf";70;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|Charcoal" +"FE|Industry|Solids|Steel|Primary";"Transf. Input Blast Furnace";"Municipal waste (renewable)";"JRC-IDEES-2015_EnergyBalance_";"tibf";72;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|Municipal waste (renewable)" +"FE|Industry|Solids|Steel|Primary";"Transf. Input Blast Furnace";"Wastes (non-renewable)";"JRC-IDEES-2015_EnergyBalance_";"tibf";80;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|Wastes (non-renewable)" +"FE|Industry|Liquids|Steel|Primary";"Transf. Input Blast Furnace";"Total petroleum products (without biofuels)";"JRC-IDEES-2015_EnergyBalance_";"tibf";21;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|Total petroleum products (without biofuels)" +"FE|Industry|Liquids|Steel|Primary";"Transf. Input Blast Furnace";"Liquid biofuels";"JRC-IDEES-2015_EnergyBalance_";"tibf";73;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|Liquid biofuels" +"FE|Industry|Gases|Steel|Primary";"Transf. Input Blast Furnace";"Gases";"JRC-IDEES-2015_EnergyBalance_";"tibf";52;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|Gases" +"FE|Industry|Gases|Steel|Primary";"Transf. Input Blast Furnace";"Biogas";"JRC-IDEES-2015_EnergyBalance_";"tibf";71;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|Biogas" +"FE|Industry|Heat|Steel|Primary";"Transf. Input Blast Furnace";"Nuclear heat";"JRC-IDEES-2015_EnergyBalance_";"tibf";59;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|Nuclear heat" +"FE|Industry|Heat|Steel|Primary";"Transf. Input Blast Furnace";"Derived heat";"JRC-IDEES-2015_EnergyBalance_";"tibf";60;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|Derived heat" +"FE|Industry|Heat|Steel|Primary";"Transf. Input Blast Furnace";"Geothermal";"JRC-IDEES-2015_EnergyBalance_";"tibf";78;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|Geothermal" +"FE|Industry|Heat|Steel|Primary";"Transf. Input Blast Furnace";"Solar energy";"JRC-IDEES-2015_EnergyBalance_";"tibf";64;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|Solar energy" +"FE|Industry|Electricity|Steel|Primary";"Transf. Input Blast Furnace";"Hydro power";"JRC-IDEES-2015_EnergyBalance_";"tibf";62;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|Hydro power" +"FE|Industry|Electricity|Steel|Primary";"Transf. Input Blast Furnace";"Wind Power";"JRC-IDEES-2015_EnergyBalance_";"tibf";63;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|Wind Power" +"FE|Industry|Electricity|Steel|Primary";"Transf. Input Blast Furnace";"Tide, Wave and Ocean";"JRC-IDEES-2015_EnergyBalance_";"tibf";67;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|Tide, Wave and Ocean" +"FE|Industry|Electricity|Steel|Primary";"Transf. Input Blast Furnace";"Electricity";"JRC-IDEES-2015_EnergyBalance_";"tibf";79;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation input - Blast Furnaces|Electricity" +"FE|Industry|Solids|Steel|Primary";"Transf. Output Coke Ovens";"Solid Fuels";"JRC-IDEES-2015_EnergyBalance_";"tock";3;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|Solid Fuels" +"FE|Industry|Solids|Steel|Primary";"Transf. Output Coke Ovens";"Solid biofuels (Wood & Wood waste)";"JRC-IDEES-2015_EnergyBalance_";"tock";69;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|Solid biofuels (Wood & Wood waste)" +"FE|Industry|Solids|Steel|Primary";"Transf. Output Coke Ovens";"Charcoal";"JRC-IDEES-2015_EnergyBalance_";"tock";70;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|Charcoal" +"FE|Industry|Solids|Steel|Primary";"Transf. Output Coke Ovens";"Municipal waste (renewable)";"JRC-IDEES-2015_EnergyBalance_";"tock";72;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|Municipal waste (renewable)" +"FE|Industry|Solids|Steel|Primary";"Transf. Output Coke Ovens";"Wastes (non-renewable)";"JRC-IDEES-2015_EnergyBalance_";"tock";80;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|Wastes (non-renewable)" +"FE|Industry|Liquids|Steel|Primary";"Transf. Output Coke Ovens";"Total petroleum products (without biofuels)";"JRC-IDEES-2015_EnergyBalance_";"tock";21;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|Total petroleum products (without biofuels)" +"FE|Industry|Liquids|Steel|Primary";"Transf. Output Coke Ovens";"Liquid biofuels";"JRC-IDEES-2015_EnergyBalance_";"tock";73;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|Liquid biofuels" +"FE|Industry|Gases|Steel|Primary";"Transf. Output Coke Ovens";"Gases";"JRC-IDEES-2015_EnergyBalance_";"tock";52;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|Gases" +"FE|Industry|Gases|Steel|Primary";"Transf. Output Coke Ovens";"Biogas";"JRC-IDEES-2015_EnergyBalance_";"tock";71;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|Biogas" +"FE|Industry|Heat|Steel|Primary";"Transf. Output Coke Ovens";"Nuclear heat";"JRC-IDEES-2015_EnergyBalance_";"tock";59;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|Nuclear heat" +"FE|Industry|Heat|Steel|Primary";"Transf. Output Coke Ovens";"Derived heat";"JRC-IDEES-2015_EnergyBalance_";"tock";60;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|Derived heat" +"FE|Industry|Heat|Steel|Primary";"Transf. Output Coke Ovens";"Geothermal";"JRC-IDEES-2015_EnergyBalance_";"tock";78;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|Geothermal" +"FE|Industry|Heat|Steel|Primary";"Transf. Output Coke Ovens";"Solar energy";"JRC-IDEES-2015_EnergyBalance_";"tock";64;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|Solar energy" +"FE|Industry|Electricity|Steel|Primary";"Transf. Output Coke Ovens";"Hydro power";"JRC-IDEES-2015_EnergyBalance_";"tock";62;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|Hydro power" +"FE|Industry|Electricity|Steel|Primary";"Transf. Output Coke Ovens";"Wind Power";"JRC-IDEES-2015_EnergyBalance_";"tock";63;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|Wind Power" +"FE|Industry|Electricity|Steel|Primary";"Transf. Output Coke Ovens";"Tide, Wave and Ocean";"JRC-IDEES-2015_EnergyBalance_";"tock";67;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|Tide, Wave and Ocean" +"FE|Industry|Electricity|Steel|Primary";"Transf. Output Coke Ovens";"Electricity";"JRC-IDEES-2015_EnergyBalance_";"tock";79;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Coke Ovens|Electricity" +"FE|Industry|Solids|Steel|Primary";"Transf. Output Blast Furnace";"Solid Fuels";"JRC-IDEES-2015_EnergyBalance_";"tobf";3;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|Solid Fuels" +"FE|Industry|Solids|Steel|Primary";"Transf. Output Blast Furnace";"Solid biofuels (Wood & Wood waste)";"JRC-IDEES-2015_EnergyBalance_";"tobf";69;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|Solid biofuels (Wood & Wood waste)" +"FE|Industry|Solids|Steel|Primary";"Transf. Output Blast Furnace";"Charcoal";"JRC-IDEES-2015_EnergyBalance_";"tobf";70;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|Charcoal" +"FE|Industry|Solids|Steel|Primary";"Transf. Output Blast Furnace";"Municipal waste (renewable)";"JRC-IDEES-2015_EnergyBalance_";"tobf";72;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|Municipal waste (renewable)" +"FE|Industry|Solids|Steel|Primary";"Transf. Output Blast Furnace";"Wastes (non-renewable)";"JRC-IDEES-2015_EnergyBalance_";"tobf";80;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|Wastes (non-renewable)" +"FE|Industry|Liquids|Steel|Primary";"Transf. Output Blast Furnace";"Total petroleum products (without biofuels)";"JRC-IDEES-2015_EnergyBalance_";"tobf";21;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|Total petroleum products (without biofuels)" +"FE|Industry|Liquids|Steel|Primary";"Transf. Output Blast Furnace";"Liquid biofuels";"JRC-IDEES-2015_EnergyBalance_";"tobf";73;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|Liquid biofuels" +"FE|Industry|Gases|Steel|Primary";"Transf. Output Blast Furnace";"Gases";"JRC-IDEES-2015_EnergyBalance_";"tobf";52;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|Gases" +"FE|Industry|Gases|Steel|Primary";"Transf. Output Blast Furnace";"Biogas";"JRC-IDEES-2015_EnergyBalance_";"tobf";71;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|Biogas" +"FE|Industry|Heat|Steel|Primary";"Transf. Output Blast Furnace";"Nuclear heat";"JRC-IDEES-2015_EnergyBalance_";"tobf";59;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|Nuclear heat" +"FE|Industry|Heat|Steel|Primary";"Transf. Output Blast Furnace";"Derived heat";"JRC-IDEES-2015_EnergyBalance_";"tobf";60;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|Derived heat" +"FE|Industry|Heat|Steel|Primary";"Transf. Output Blast Furnace";"Geothermal";"JRC-IDEES-2015_EnergyBalance_";"tobf";78;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|Geothermal" +"FE|Industry|Heat|Steel|Primary";"Transf. Output Blast Furnace";"Solar energy";"JRC-IDEES-2015_EnergyBalance_";"tobf";64;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|Solar energy" +"FE|Industry|Electricity|Steel|Primary";"Transf. Output Blast Furnace";"Hydro power";"JRC-IDEES-2015_EnergyBalance_";"tobf";62;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|Hydro power" +"FE|Industry|Electricity|Steel|Primary";"Transf. Output Blast Furnace";"Wind Power";"JRC-IDEES-2015_EnergyBalance_";"tobf";63;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|Wind Power" +"FE|Industry|Electricity|Steel|Primary";"Transf. Output Blast Furnace";"Tide, Wave and Ocean";"JRC-IDEES-2015_EnergyBalance_";"tobf";67;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|Tide, Wave and Ocean" +"FE|Industry|Electricity|Steel|Primary";"Transf. Output Blast Furnace";"Electricity";"JRC-IDEES-2015_EnergyBalance_";"tobf";79;-1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Transformation output - Blast Furnaces|Electricity" +"FE|Industry|Solids|Steel|Primary";"Consumption Coke Ovens";"Solid Fuels";"JRC-IDEES-2015_EnergyBalance_";"cenck";3;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|Solid Fuels" +"FE|Industry|Solids|Steel|Primary";"Consumption Coke Ovens";"Solid biofuels (Wood & Wood waste)";"JRC-IDEES-2015_EnergyBalance_";"cenck";69;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|Solid biofuels (Wood & Wood waste)" +"FE|Industry|Solids|Steel|Primary";"Consumption Coke Ovens";"Charcoal";"JRC-IDEES-2015_EnergyBalance_";"cenck";70;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|Charcoal" +"FE|Industry|Solids|Steel|Primary";"Consumption Coke Ovens";"Municipal waste (renewable)";"JRC-IDEES-2015_EnergyBalance_";"cenck";72;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|Municipal waste (renewable)" +"FE|Industry|Solids|Steel|Primary";"Consumption Coke Ovens";"Wastes (non-renewable)";"JRC-IDEES-2015_EnergyBalance_";"cenck";80;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|Wastes (non-renewable)" +"FE|Industry|Liquids|Steel|Primary";"Consumption Coke Ovens";"Total petroleum products (without biofuels)";"JRC-IDEES-2015_EnergyBalance_";"cenck";21;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|Total petroleum products (without biofuels)" +"FE|Industry|Liquids|Steel|Primary";"Consumption Coke Ovens";"Liquid biofuels";"JRC-IDEES-2015_EnergyBalance_";"cenck";73;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|Liquid biofuels" +"FE|Industry|Gases|Steel|Primary";"Consumption Coke Ovens";"Gases";"JRC-IDEES-2015_EnergyBalance_";"cenck";52;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|Gases" +"FE|Industry|Gases|Steel|Primary";"Consumption Coke Ovens";"Biogas";"JRC-IDEES-2015_EnergyBalance_";"cenck";71;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|Biogas" +"FE|Industry|Heat|Steel|Primary";"Consumption Coke Ovens";"Nuclear heat";"JRC-IDEES-2015_EnergyBalance_";"cenck";59;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|Nuclear heat" +"FE|Industry|Heat|Steel|Primary";"Consumption Coke Ovens";"Derived heat";"JRC-IDEES-2015_EnergyBalance_";"cenck";60;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|Derived heat" +"FE|Industry|Heat|Steel|Primary";"Consumption Coke Ovens";"Geothermal";"JRC-IDEES-2015_EnergyBalance_";"cenck";78;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|Geothermal" +"FE|Industry|Heat|Steel|Primary";"Consumption Coke Ovens";"Solar energy";"JRC-IDEES-2015_EnergyBalance_";"cenck";64;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|Solar energy" +"FE|Industry|Electricity|Steel|Primary";"Consumption Coke Ovens";"Hydro power";"JRC-IDEES-2015_EnergyBalance_";"cenck";62;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|Hydro power" +"FE|Industry|Electricity|Steel|Primary";"Consumption Coke Ovens";"Wind Power";"JRC-IDEES-2015_EnergyBalance_";"cenck";63;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|Wind Power" +"FE|Industry|Electricity|Steel|Primary";"Consumption Coke Ovens";"Tide, Wave and Ocean";"JRC-IDEES-2015_EnergyBalance_";"cenck";67;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|Tide, Wave and Ocean" +"FE|Industry|Electricity|Steel|Primary";"Consumption Coke Ovens";"Electricity";"JRC-IDEES-2015_EnergyBalance_";"cenck";79;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Coke Ovens|Electricity" +"FE|Industry|Solids|Steel|Primary";"Consumption Blast Furnaces";"Solid Fuels";"JRC-IDEES-2015_EnergyBalance_";"cenbf";3;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|Solid Fuels" +"FE|Industry|Solids|Steel|Primary";"Consumption Blast Furnaces";"Solid biofuels (Wood & Wood waste)";"JRC-IDEES-2015_EnergyBalance_";"cenbf";69;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|Solid biofuels (Wood & Wood waste)" +"FE|Industry|Solids|Steel|Primary";"Consumption Blast Furnaces";"Charcoal";"JRC-IDEES-2015_EnergyBalance_";"cenbf";70;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|Charcoal" +"FE|Industry|Solids|Steel|Primary";"Consumption Blast Furnaces";"Municipal waste (renewable)";"JRC-IDEES-2015_EnergyBalance_";"cenbf";72;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|Municipal waste (renewable)" +"FE|Industry|Solids|Steel|Primary";"Consumption Blast Furnaces";"Wastes (non-renewable)";"JRC-IDEES-2015_EnergyBalance_";"cenbf";80;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|Wastes (non-renewable)" +"FE|Industry|Liquids|Steel|Primary";"Consumption Blast Furnaces";"Total petroleum products (without biofuels)";"JRC-IDEES-2015_EnergyBalance_";"cenbf";21;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|Total petroleum products (without biofuels)" +"FE|Industry|Liquids|Steel|Primary";"Consumption Blast Furnaces";"Liquid biofuels";"JRC-IDEES-2015_EnergyBalance_";"cenbf";73;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|Liquid biofuels" +"FE|Industry|Gases|Steel|Primary";"Consumption Blast Furnaces";"Gases";"JRC-IDEES-2015_EnergyBalance_";"cenbf";52;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|Gases" +"FE|Industry|Gases|Steel|Primary";"Consumption Blast Furnaces";"Biogas";"JRC-IDEES-2015_EnergyBalance_";"cenbf";71;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|Biogas" +"FE|Industry|Heat|Steel|Primary";"Consumption Blast Furnaces";"Nuclear heat";"JRC-IDEES-2015_EnergyBalance_";"cenbf";59;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|Nuclear heat" +"FE|Industry|Heat|Steel|Primary";"Consumption Blast Furnaces";"Derived heat";"JRC-IDEES-2015_EnergyBalance_";"cenbf";60;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|Derived heat" +"FE|Industry|Heat|Steel|Primary";"Consumption Blast Furnaces";"Geothermal";"JRC-IDEES-2015_EnergyBalance_";"cenbf";78;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|Geothermal" +"FE|Industry|Heat|Steel|Primary";"Consumption Blast Furnaces";"Solar energy";"JRC-IDEES-2015_EnergyBalance_";"cenbf";64;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|Solar energy" +"FE|Industry|Electricity|Steel|Primary";"Consumption Blast Furnaces";"Hydro power";"JRC-IDEES-2015_EnergyBalance_";"cenbf";62;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|Hydro power" +"FE|Industry|Electricity|Steel|Primary";"Consumption Blast Furnaces";"Wind Power";"JRC-IDEES-2015_EnergyBalance_";"cenbf";63;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|Wind Power" +"FE|Industry|Electricity|Steel|Primary";"Consumption Blast Furnaces";"Tide, Wave and Ocean";"JRC-IDEES-2015_EnergyBalance_";"cenbf";67;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|Tide, Wave and Ocean" +"FE|Industry|Electricity|Steel|Primary";"Consumption Blast Furnaces";"Electricity";"JRC-IDEES-2015_EnergyBalance_";"cenbf";79;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Consumption in Blast Furnaces|Electricity" +"FE|Industry|Electricity|Steel|Primary";"Primary steel";"Lighting";"JRC-IDEES-2015_Industry_";"ISI_fec";6;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Lighting" +"FE|Industry|Electricity|Steel|Primary";"Primary steel";"Air compressors";"JRC-IDEES-2015_Industry_";"ISI_fec";7;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Air compressors" +"FE|Industry|Electricity|Steel|Primary";"Primary steel";"Motor drives";"JRC-IDEES-2015_Industry_";"ISI_fec";8;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Motor drives" +"FE|Industry|Electricity|Steel|Primary";"Primary steel";"Fans and pumps";"JRC-IDEES-2015_Industry_";"ISI_fec";9;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Fans and pumps" +"FE|Industry|Electricity|Steel|Primary";"Primary steel";"Electricity";"JRC-IDEES-2015_Industry_";"ISI_fec";14;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Low enthalpy heat|Electricity" +"FE|Industry|Electricity|Steel|Primary";"Primary steel";"Electricity";"JRC-IDEES-2015_Industry_";"ISI_fec";20;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Sinter/Pellet making|Electricity" +"FE|Industry|Electricity|Steel|Primary";"Primary steel";"Steel: Furnaces, Refining and Rolling - Electric";"JRC-IDEES-2015_Industry_";"ISI_fec";33;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Furnaces, Refining and Rolling|Steel: Furnaces, Refining and Rolling - Electric" +"FE|Industry|Electricity|Steel|Primary";"Primary steel";"Steel: Products finishing - Electric";"JRC-IDEES-2015_Industry_";"ISI_fec";50;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Products finishing|Steel: Products finishing - Electric" +"FE|Industry|Liquids|Steel|Primary";"Primary steel";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"ISI_fec";11;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Low enthalpy heat|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|Steel|Primary";"Primary steel";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"ISI_fec";17;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Sinter/Pellet making|Residual fuel oil" +"FE|Industry|Liquids|Steel|Primary";"Primary steel";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"ISI_fec";24;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Blast /Basic oxygen furnace|Residual fuel oil" +"FE|Industry|Liquids|Steel|Primary";"Primary steel";"LPG";"JRC-IDEES-2015_Industry_";"ISI_fec";29;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Furnaces, Refining and Rolling|Steel: Furnaces, Refining and Rolling - Thermal|LPG" +"FE|Industry|Liquids|Steel|Primary";"Primary steel";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"ISI_fec";30;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Furnaces, Refining and Rolling|Steel: Furnaces, Refining and Rolling - Thermal|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|Steel|Primary";"Primary steel";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"ISI_fec";31;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Furnaces, Refining and Rolling|Steel: Furnaces, Refining and Rolling - Thermal|Residual fuel oil" +"FE|Industry|Liquids|Steel|Primary";"Primary steel";"LPG";"JRC-IDEES-2015_Industry_";"ISI_fec";36;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Products finishing|Steel: Products finishing - Thermal|LPG" +"FE|Industry|Liquids|Steel|Primary";"Primary steel";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"ISI_fec";37;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Products finishing|Steel: Products finishing - Thermal|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|Steel|Primary";"Primary steel";"LPG";"JRC-IDEES-2015_Industry_";"ISI_fec";42;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Products finishing|Steel: Products finishing - Steam|LPG" +"FE|Industry|Liquids|Steel|Primary";"Primary steel";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"ISI_fec";43;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Products finishing|Steel: Products finishing - Steam|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|Steel|Primary";"Primary steel";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"ISI_fec";44;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Products finishing|Steel: Products finishing - Steam|Residual fuel oil" +"FE|Industry|Liquids|Steel|Primary";"Primary steel";"Other liquids";"JRC-IDEES-2015_Industry_";"ISI_fec";45;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Products finishing|Steel: Products finishing - Steam|Other liquids" +"FE|Industry|Gases|Steel|Primary";"Primary steel";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"ISI_fec";12;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Low enthalpy heat|Natural gas (incl. biogas)" +"FE|Industry|Gases|Steel|Primary";"Primary steel";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"ISI_fec";18;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Sinter/Pellet making|Natural gas (incl. biogas)" +"FE|Industry|Gases|Steel|Primary";"Primary steel";"Derived gases";"JRC-IDEES-2015_Industry_";"ISI_fec";19;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Sinter/Pellet making|Derived gases" +"FE|Industry|Gases|Steel|Primary";"Primary steel";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"ISI_fec";25;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Blast /Basic oxygen furnace|Natural gas (incl. biogas)" +"FE|Industry|Gases|Steel|Primary";"Primary steel";"Derived gases";"JRC-IDEES-2015_Industry_";"ISI_fec";26;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Blast /Basic oxygen furnace|Derived gases" +"FE|Industry|Gases|Steel|Primary";"Primary steel";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"ISI_fec";32;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Furnaces, Refining and Rolling|Steel: Furnaces, Refining and Rolling - Thermal|Natural gas (incl. biogas)" +"FE|Industry|Gases|Steel|Primary";"Primary steel";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"ISI_fec";38;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Products finishing|Steel: Products finishing - Thermal|Natural gas (incl. biogas)" +"FE|Industry|Gases|Steel|Primary";"Primary steel";"Refinery gas";"JRC-IDEES-2015_Industry_";"ISI_fec";41;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Products finishing|Steel: Products finishing - Steam|Refinery gas" +"FE|Industry|Gases|Steel|Primary";"Primary steel";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"ISI_fec";46;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Products finishing|Steel: Products finishing - Steam|Natural gas (incl. biogas)" +"FE|Industry|Gases|Steel|Primary";"Primary steel";"Derived gases";"JRC-IDEES-2015_Industry_";"ISI_fec";47;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Products finishing|Steel: Products finishing - Steam|Derived gases" +"FE|Industry|Heat|Steel|Primary";"Primary steel";"Solar and geothermal";"JRC-IDEES-2015_Industry_";"ISI_fec";13;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Low enthalpy heat|Solar and geothermal" +"FE|Industry|Heat|Steel|Primary";"Primary steel";"Steam distributed";"JRC-IDEES-2015_Industry_";"ISI_fec";49;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Products finishing|Steel: Products finishing - Steam|Steam distributed" +"FE|Industry|Solids|Steel|Primary";"Primary steel";"Solids";"JRC-IDEES-2015_Industry_";"ISI_fec";16;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Sinter/Pellet making|Solids" +"FE|Industry|Solids|Steel|Primary";"Primary steel";"Solids";"JRC-IDEES-2015_Industry_";"ISI_fec";22;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Blast /Basic oxygen furnace|Solids" +"FE|Industry|Solids|Steel|Primary";"Primary steel";"Coke";"JRC-IDEES-2015_Industry_";"ISI_fec";23;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Blast /Basic oxygen furnace|Coke" +"FE|Industry|Solids|Steel|Primary";"Primary steel";"Solids";"JRC-IDEES-2015_Industry_";"ISI_fec";40;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Products finishing|Steel: Products finishing - Steam|Solids" +"FE|Industry|Solids|Steel|Primary";"Primary steel";"Biomass";"JRC-IDEES-2015_Industry_";"ISI_fec";48;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Products finishing|Steel: Products finishing - Steam|Biomass" +"FE|Industry|Electricity|Steel|Secondary";"Secondary Steel ";"Lighting";"JRC-IDEES-2015_Industry_";"ISI_fec";54;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Lighting" +"FE|Industry|Electricity|Steel|Secondary";"Secondary Steel ";"Air compressors";"JRC-IDEES-2015_Industry_";"ISI_fec";55;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Air compressors" +"FE|Industry|Electricity|Steel|Secondary";"Secondary Steel ";"Motor drives";"JRC-IDEES-2015_Industry_";"ISI_fec";56;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Motor drives" +"FE|Industry|Electricity|Steel|Secondary";"Secondary Steel ";"Fans and pumps";"JRC-IDEES-2015_Industry_";"ISI_fec";57;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Fans and pumps" +"FE|Industry|Electricity|Steel|Secondary";"Secondary Steel ";"Electricity";"JRC-IDEES-2015_Industry_";"ISI_fec";62;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Low enthalpy heat|Electricity" +"FE|Industry|Electricity|Steel|Secondary";"Secondary Steel ";"Electricity";"JRC-IDEES-2015_Industry_";"ISI_fec";68;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Smelters|Electricity" +"FE|Industry|Electricity|Steel|Secondary";"Secondary Steel ";"Steel: Electric arc";"JRC-IDEES-2015_Industry_";"ISI_fec";69;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Electric arc" +"FE|Industry|Electricity|Steel|Secondary";"Secondary Steel ";"Steel: Furnaces, Refining and Rolling - Electric";"JRC-IDEES-2015_Industry_";"ISI_fec";76;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Furnaces, Refining and Rolling|Steel: Furnaces, Refining and Rolling - Electric" +"FE|Industry|Electricity|Steel|Secondary";"Secondary Steel ";"Steel: Products finishing - Electric";"JRC-IDEES-2015_Industry_";"ISI_fec";93;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Products finishing|Steel: Products finishing - Electric" +"FE|Industry|Liquids|Steel|Secondary";"Secondary Steel ";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"ISI_fec";65;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Smelters|Residual fuel oil" +"FE|Industry|Liquids|Steel|Secondary";"Secondary Steel ";"LPG";"JRC-IDEES-2015_Industry_";"ISI_fec";72;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Furnaces, Refining and Rolling|Steel: Furnaces, Refining and Rolling - Thermal|LPG" +"FE|Industry|Liquids|Steel|Secondary";"Secondary Steel ";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"ISI_fec";73;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Furnaces, Refining and Rolling|Steel: Furnaces, Refining and Rolling - Thermal|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|Steel|Secondary";"Secondary Steel ";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"ISI_fec";74;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Furnaces, Refining and Rolling|Steel: Furnaces, Refining and Rolling - Thermal|Residual fuel oil" +"FE|Industry|Liquids|Steel|Secondary";"Secondary Steel ";"LPG";"JRC-IDEES-2015_Industry_";"ISI_fec";79;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Products finishing|Steel: Products finishing - Thermal|LPG" +"FE|Industry|Liquids|Steel|Secondary";"Secondary Steel ";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"ISI_fec";80;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Products finishing|Steel: Products finishing - Thermal|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|Steel|Secondary";"Secondary Steel ";"LPG";"JRC-IDEES-2015_Industry_";"ISI_fec";85;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Products finishing|Steel: Products finishing - Steam|LPG" +"FE|Industry|Liquids|Steel|Secondary";"Secondary Steel ";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"ISI_fec";86;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Products finishing|Steel: Products finishing - Steam|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|Steel|Secondary";"Secondary Steel ";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"ISI_fec";87;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Products finishing|Steel: Products finishing - Steam|Residual fuel oil" +"FE|Industry|Liquids|Steel|Secondary";"Secondary Steel ";"Other liquids";"JRC-IDEES-2015_Industry_";"ISI_fec";88;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Products finishing|Steel: Products finishing - Steam|Other liquids" +"FE|Industry|Gases|Steel|Secondary";"Secondary Steel ";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"ISI_fec";60;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Low enthalpy heat|Natural gas (incl. biogas)" +"FE|Industry|Gases|Steel|Secondary";"Secondary Steel ";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"ISI_fec";66;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Smelters|Natural gas (incl. biogas)" +"FE|Industry|Gases|Steel|Secondary";"Secondary Steel ";"Derived gases";"JRC-IDEES-2015_Industry_";"ISI_fec";67;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Smelters|Derived gases" +"FE|Industry|Gases|Steel|Secondary";"Secondary Steel ";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"ISI_fec";75;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Furnaces, Refining and Rolling|Steel: Furnaces, Refining and Rolling - Thermal|Natural gas (incl. biogas)" +"FE|Industry|Gases|Steel|Secondary";"Secondary Steel ";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"ISI_fec";81;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Products finishing|Steel: Products finishing - Thermal|Natural gas (incl. biogas)" +"FE|Industry|Gases|Steel|Secondary";"Secondary Steel ";"Refinery gas";"JRC-IDEES-2015_Industry_";"ISI_fec";84;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Products finishing|Steel: Products finishing - Steam|Refinery gas" +"FE|Industry|Gases|Steel|Secondary";"Secondary Steel ";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"ISI_fec";89;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Products finishing|Steel: Products finishing - Steam|Natural gas (incl. biogas)" +"FE|Industry|Gases|Steel|Secondary";"Secondary Steel ";"Derived gases";"JRC-IDEES-2015_Industry_";"ISI_fec";90;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Products finishing|Steel: Products finishing - Steam|Derived gases" +"FE|Industry|Heat|Steel|Secondary";"Secondary Steel ";"Solar and geothermal";"JRC-IDEES-2015_Industry_";"ISI_fec";61;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Low enthalpy heat|Solar and geothermal" +"FE|Industry|Heat|Steel|Secondary";"Secondary Steel ";"Steam distributed";"JRC-IDEES-2015_Industry_";"ISI_fec";92;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Products finishing|Steel: Products finishing - Steam|Steam distributed" +"FE|Industry|Solids|Steel|Secondary";"Secondary Steel ";"Solids";"JRC-IDEES-2015_Industry_";"ISI_fec";64;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Smelters|Solids" +"FE|Industry|Solids|Steel|Secondary";"Secondary Steel ";"Solids";"JRC-IDEES-2015_Industry_";"ISI_fec";83;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Products finishing|Steel: Products finishing - Steam|Solids" +"FE|Industry|Solids|Steel|Secondary";"Secondary Steel ";"Biomass";"JRC-IDEES-2015_Industry_";"ISI_fec";91;1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Products finishing|Steel: Products finishing - Steam|Biomass" +"FE|Industry|Cement";"Cement";"Cement";"JRC-IDEES-2015_Industry_";"NMM_fec";5;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement" +"Production|Industry|Cement ";"tonnes of cement produced";"Cement (kt)";"JRC-IDEES-2015_Industry_";"NMM";9;1;"Mt/yr";"kt";0.001;"Non-metallic mineral products|Physical output|Cement" +"FE|Industry|Electricity|Cement";"Cement";"Lighting";"JRC-IDEES-2015_Industry_";"NMM_fec";6;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Lighting" +"FE|Industry|Electricity|Cement";"Cement";"Air compressors";"JRC-IDEES-2015_Industry_";"NMM_fec";7;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Air compressors" +"FE|Industry|Electricity|Cement";"Cement";"Motor drives";"JRC-IDEES-2015_Industry_";"NMM_fec";8;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Motor drives" +"FE|Industry|Electricity|Cement";"Cement";"Fans and pumps";"JRC-IDEES-2015_Industry_";"NMM_fec";9;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Fans and pumps" +"FE|Industry|Electricity|Cement";"Cement";"Electricity";"JRC-IDEES-2015_Industry_";"NMM_fec";14;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Low enthalpy heat|Electricity" +"FE|Industry|Electricity|Cement";"Cement";"Cement: Grinding, milling of raw material";"JRC-IDEES-2015_Industry_";"NMM_fec";15;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Grinding, milling of raw material" +"FE|Industry|Electricity|Cement";"Cement";"Cement: Grinding, packaging";"JRC-IDEES-2015_Industry_";"NMM_fec";44;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Grinding, packaging" +"FE|Industry|Liquids|Cement";"Cement";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"NMM_fec";11;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Low enthalpy heat|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|Cement";"Cement";"LPG";"JRC-IDEES-2015_Industry_";"NMM_fec";19;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Fuel use|LPG" +"FE|Industry|Liquids|Cement";"Cement";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"NMM_fec";20;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Fuel use|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|Cement";"Cement";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"NMM_fec";21;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Fuel use|Residual fuel oil" +"FE|Industry|Liquids|Cement";"Cement";"Other liquids";"JRC-IDEES-2015_Industry_";"NMM_fec";22;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Fuel use|Other liquids" +"FE|Industry|Liquids|Cement";"Cement";"LPG";"JRC-IDEES-2015_Industry_";"NMM_fec";28;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Steam|LPG" +"FE|Industry|Liquids|Cement";"Cement";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"NMM_fec";29;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Steam|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|Cement";"Cement";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"NMM_fec";30;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Steam|Residual fuel oil" +"FE|Industry|Liquids|Cement";"Cement";"Other liquids";"JRC-IDEES-2015_Industry_";"NMM_fec";31;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Steam|Other liquids" +"FE|Industry|Liquids|Cement";"Cement";"LPG";"JRC-IDEES-2015_Industry_";"NMM_fec";38;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Clinker production (kilns)|LPG" +"FE|Industry|Liquids|Cement";"Cement";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"NMM_fec";39;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Clinker production (kilns)|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|Cement";"Cement";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"NMM_fec";40;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Clinker production (kilns)|Residual fuel oil" +"FE|Industry|Liquids|Cement";"Cement";"Other liquids";"JRC-IDEES-2015_Industry_";"NMM_fec";41;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Clinker production (kilns)|Other liquids" +"FE|Industry|Gases|Cement";"Cement";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"NMM_fec";12;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Low enthalpy heat|Natural gas (incl. biogas)" +"FE|Industry|Gases|Cement";"Cement";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"NMM_fec";23;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Fuel use|Natural gas (incl. biogas)" +"FE|Industry|Gases|Cement";"Cement";"Refinery gas";"JRC-IDEES-2015_Industry_";"NMM_fec";27;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Steam|Refinery gas" +"FE|Industry|Gases|Cement";"Cement";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"NMM_fec";32;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Steam|Natural gas (incl. biogas)" +"FE|Industry|Gases|Cement";"Cement";"Derived gases";"JRC-IDEES-2015_Industry_";"NMM_fec";33;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Steam|Derived gases" +"FE|Industry|Gases|Cement";"Cement";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"NMM_fec";42;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Clinker production (kilns)|Natural gas (incl. biogas)" +"FE|Industry|Heat|Cement";"Cement";"Solar and geothermal";"JRC-IDEES-2015_Industry_";"NMM_fec";13;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Low enthalpy heat|Solar and geothermal" +"FE|Industry|Heat|Cement";"Cement";"Steam distributed";"JRC-IDEES-2015_Industry_";"NMM_fec";35;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Steam|Steam distributed" +"FE|Industry|Solids|Cement";"Cement";"Solids";"JRC-IDEES-2015_Industry_";"NMM_fec";18;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Fuel use|Solids" +"FE|Industry|Solids|Cement";"Cement";"Biomass";"JRC-IDEES-2015_Industry_";"NMM_fec";24;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Fuel use|Biomass" +"FE|Industry|Solids|Cement";"Cement";"Solids";"JRC-IDEES-2015_Industry_";"NMM_fec";26;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Steam|Solids" +"FE|Industry|Solids|Cement";"Cement";"Biomass";"JRC-IDEES-2015_Industry_";"NMM_fec";34;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Steam|Biomass" +"FE|Industry|Solids|Cement";"Cement";"Solids";"JRC-IDEES-2015_Industry_";"NMM_fec";37;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Clinker production (kilns)|Solids" +"FE|Industry|Solids|Cement";"Cement";"Biomass";"JRC-IDEES-2015_Industry_";"NMM_fec";43;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Clinker production (kilns)|Biomass" +"FE|Industry|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Cement";"JRC-IDEES-2015_Industry_";"NMM_fec";5;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement" +"FE|Industry|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Ceramics & other NMM";"JRC-IDEES-2015_Industry_";"NMM_fec";47;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM" +"FE|Industry|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Glass production";"JRC-IDEES-2015_Industry_";"NMM_fec";97;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Glass production" +"FE|Industry|Electricity|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Lighting";"JRC-IDEES-2015_Industry_";"NMM_fec";6;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Lighting" +"FE|Industry|Electricity|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Air compressors";"JRC-IDEES-2015_Industry_";"NMM_fec";7;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Air compressors" +"FE|Industry|Electricity|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Motor drives";"JRC-IDEES-2015_Industry_";"NMM_fec";8;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Motor drives" +"FE|Industry|Electricity|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Fans and pumps";"JRC-IDEES-2015_Industry_";"NMM_fec";9;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Fans and pumps" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"NMM_fec";11;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Low enthalpy heat|Diesel oil (incl. biofuels)" +"FE|Industry|Gases|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"NMM_fec";12;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Low enthalpy heat|Natural gas (incl. biogas)" +"FE|Industry|Heat|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Solar and geothermal";"JRC-IDEES-2015_Industry_";"NMM_fec";13;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Low enthalpy heat|Solar and geothermal" +"FE|Industry|Electricity|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Electricity";"JRC-IDEES-2015_Industry_";"NMM_fec";14;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Low enthalpy heat|Electricity" +"FE|Industry|Electricity|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Cement: Grinding, milling of raw material";"JRC-IDEES-2015_Industry_";"NMM_fec";15;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Grinding, milling of raw material" +"FE|Industry|Solids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Solids";"JRC-IDEES-2015_Industry_";"NMM_fec";18;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Fuel use|Solids" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"LPG";"JRC-IDEES-2015_Industry_";"NMM_fec";19;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Fuel use|LPG" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"NMM_fec";20;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Fuel use|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"NMM_fec";21;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Fuel use|Residual fuel oil" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Other liquids";"JRC-IDEES-2015_Industry_";"NMM_fec";22;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Fuel use|Other liquids" +"FE|Industry|Gases|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"NMM_fec";23;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Fuel use|Natural gas (incl. biogas)" +"FE|Industry|Solids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Biomass";"JRC-IDEES-2015_Industry_";"NMM_fec";24;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Fuel use|Biomass" +"FE|Industry|Solids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Solids";"JRC-IDEES-2015_Industry_";"NMM_fec";26;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Steam|Solids" +"FE|Industry|Gases|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Refinery gas";"JRC-IDEES-2015_Industry_";"NMM_fec";27;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Steam|Refinery gas" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"LPG";"JRC-IDEES-2015_Industry_";"NMM_fec";28;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Steam|LPG" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"NMM_fec";29;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Steam|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"NMM_fec";30;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Steam|Residual fuel oil" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Other liquids";"JRC-IDEES-2015_Industry_";"NMM_fec";31;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Steam|Other liquids" +"FE|Industry|Gases|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"NMM_fec";32;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Steam|Natural gas (incl. biogas)" +"FE|Industry|Gases|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Derived gases";"JRC-IDEES-2015_Industry_";"NMM_fec";33;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Steam|Derived gases" +"FE|Industry|Solids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Biomass";"JRC-IDEES-2015_Industry_";"NMM_fec";34;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Steam|Biomass" +"FE|Industry|Heat|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Steam distributed";"JRC-IDEES-2015_Industry_";"NMM_fec";35;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Steam|Steam distributed" +"FE|Industry|Solids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Solids";"JRC-IDEES-2015_Industry_";"NMM_fec";37;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Clinker production (kilns)|Solids" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"LPG";"JRC-IDEES-2015_Industry_";"NMM_fec";38;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Clinker production (kilns)|LPG" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"NMM_fec";39;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Clinker production (kilns)|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"NMM_fec";40;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Clinker production (kilns)|Residual fuel oil" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Other liquids";"JRC-IDEES-2015_Industry_";"NMM_fec";41;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Clinker production (kilns)|Other liquids" +"FE|Industry|Gases|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"NMM_fec";42;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Clinker production (kilns)|Natural gas (incl. biogas)" +"FE|Industry|Solids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Biomass";"JRC-IDEES-2015_Industry_";"NMM_fec";43;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Clinker production (kilns)|Biomass" +"FE|Industry|Electricity|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Cement: Grinding, packaging";"JRC-IDEES-2015_Industry_";"NMM_fec";44;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Grinding, packaging" +"FE|Industry|Electricity|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Lighting";"JRC-IDEES-2015_Industry_";"NMM_fec";48;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Lighting" +"FE|Industry|Electricity|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Air compressors";"JRC-IDEES-2015_Industry_";"NMM_fec";49;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Air compressors" +"FE|Industry|Electricity|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Motor drives";"JRC-IDEES-2015_Industry_";"NMM_fec";50;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Motor drives" +"FE|Industry|Electricity|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Fans and pumps";"JRC-IDEES-2015_Industry_";"NMM_fec";51;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Fans and pumps" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"NMM_fec";53;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Low enthalpy heat|Diesel oil (incl. biofuels)" +"FE|Industry|Gases|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"NMM_fec";54;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Low enthalpy heat|Natural gas (incl. biogas)" +"FE|Industry|Heat|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Solar and geothermal";"JRC-IDEES-2015_Industry_";"NMM_fec";55;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Low enthalpy heat|Solar and geothermal" +"FE|Industry|Electricity|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Electricity";"JRC-IDEES-2015_Industry_";"NMM_fec";56;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Low enthalpy heat|Electricity" +"FE|Industry|Electricity|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Ceramics: Mixing of raw material";"JRC-IDEES-2015_Industry_";"NMM_fec";57;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Ceramics: Mixing of raw material" +"FE|Industry|Solids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Solids";"JRC-IDEES-2015_Industry_";"NMM_fec";60;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Ceramics: Drying and sintering of raw material|Ceramics: Thermal drying and sintering|Solids" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"LPG";"JRC-IDEES-2015_Industry_";"NMM_fec";61;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Ceramics: Drying and sintering of raw material|Ceramics: Thermal drying and sintering|LPG" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"NMM_fec";62;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Ceramics: Drying and sintering of raw material|Ceramics: Thermal drying and sintering|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"NMM_fec";63;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Ceramics: Drying and sintering of raw material|Ceramics: Thermal drying and sintering|Residual fuel oil" +"FE|Industry|Gases|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"NMM_fec";64;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Ceramics: Drying and sintering of raw material|Ceramics: Thermal drying and sintering|Natural gas (incl. biogas)" +"FE|Industry|Solids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Solids";"JRC-IDEES-2015_Industry_";"NMM_fec";66;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Ceramics: Drying and sintering of raw material|Ceramics: Steam drying and sintering|Solids" +"FE|Industry|Gases|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Refinery gas";"JRC-IDEES-2015_Industry_";"NMM_fec";67;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Ceramics: Drying and sintering of raw material|Ceramics: Steam drying and sintering|Refinery gas" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"LPG";"JRC-IDEES-2015_Industry_";"NMM_fec";68;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Ceramics: Drying and sintering of raw material|Ceramics: Steam drying and sintering|LPG" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"NMM_fec";69;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Ceramics: Drying and sintering of raw material|Ceramics: Steam drying and sintering|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"NMM_fec";70;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Ceramics: Drying and sintering of raw material|Ceramics: Steam drying and sintering|Residual fuel oil" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Other liquids";"JRC-IDEES-2015_Industry_";"NMM_fec";71;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Ceramics: Drying and sintering of raw material|Ceramics: Steam drying and sintering|Other liquids" +"FE|Industry|Gases|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"NMM_fec";72;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Ceramics: Drying and sintering of raw material|Ceramics: Steam drying and sintering|Natural gas (incl. biogas)" +"FE|Industry|Gases|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Derived gases";"JRC-IDEES-2015_Industry_";"NMM_fec";73;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Ceramics: Drying and sintering of raw material|Ceramics: Steam drying and sintering|Derived gases" +"FE|Industry|Solids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Biomass";"JRC-IDEES-2015_Industry_";"NMM_fec";74;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Ceramics: Drying and sintering of raw material|Ceramics: Steam drying and sintering|Biomass" +"FE|Industry|Heat|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Steam distributed";"JRC-IDEES-2015_Industry_";"NMM_fec";75;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Ceramics: Drying and sintering of raw material|Ceramics: Steam drying and sintering|Steam distributed" +"FE|Industry|Electricity|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Ceramics: Microwave drying and sintering";"JRC-IDEES-2015_Industry_";"NMM_fec";76;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Ceramics: Drying and sintering of raw material|Ceramics: Microwave drying and sintering" +"FE|Industry|Solids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Solids";"JRC-IDEES-2015_Industry_";"NMM_fec";79;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Ceramics: Primary production process|Ceramics: Thermal kiln|Solids" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"LPG";"JRC-IDEES-2015_Industry_";"NMM_fec";80;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Ceramics: Primary production process|Ceramics: Thermal kiln|LPG" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"NMM_fec";81;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Ceramics: Primary production process|Ceramics: Thermal kiln|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"NMM_fec";82;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Ceramics: Primary production process|Ceramics: Thermal kiln|Residual fuel oil" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Other liquids";"JRC-IDEES-2015_Industry_";"NMM_fec";83;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Ceramics: Primary production process|Ceramics: Thermal kiln|Other liquids" +"FE|Industry|Gases|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"NMM_fec";84;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Ceramics: Primary production process|Ceramics: Thermal kiln|Natural gas (incl. biogas)" +"FE|Industry|Solids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Biomass";"JRC-IDEES-2015_Industry_";"NMM_fec";85;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Ceramics: Primary production process|Ceramics: Thermal kiln|Biomass" +"FE|Industry|Electricity|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Ceramics: Electric kiln";"JRC-IDEES-2015_Industry_";"NMM_fec";86;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Ceramics: Primary production process|Ceramics: Electric kiln" +"FE|Industry|Solids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Solids";"JRC-IDEES-2015_Industry_";"NMM_fec";89;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Ceramics: Product finishing|Ceramics: Thermal furnace|Solids" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"LPG";"JRC-IDEES-2015_Industry_";"NMM_fec";90;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Ceramics: Product finishing|Ceramics: Thermal furnace|LPG" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"NMM_fec";91;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Ceramics: Product finishing|Ceramics: Thermal furnace|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"NMM_fec";92;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Ceramics: Product finishing|Ceramics: Thermal furnace|Residual fuel oil" +"FE|Industry|Gases|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"NMM_fec";93;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Ceramics: Product finishing|Ceramics: Thermal furnace|Natural gas (incl. biogas)" +"FE|Industry|Electricity|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Ceramics: Electric furnace";"JRC-IDEES-2015_Industry_";"NMM_fec";94;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Ceramics & other NMM|Ceramics: Product finishing|Ceramics: Electric furnace" +"FE|Industry|Electricity|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Lighting";"JRC-IDEES-2015_Industry_";"NMM_fec";98;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Glass production|Lighting" +"FE|Industry|Electricity|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Air compressors";"JRC-IDEES-2015_Industry_";"NMM_fec";99;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Glass production|Air compressors" +"FE|Industry|Electricity|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Motor drives";"JRC-IDEES-2015_Industry_";"NMM_fec";100;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Glass production|Motor drives" +"FE|Industry|Electricity|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Fans and pumps";"JRC-IDEES-2015_Industry_";"NMM_fec";101;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Glass production|Fans and pumps" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"NMM_fec";103;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Glass production|Low enthalpy heat|Diesel oil (incl. biofuels)" +"FE|Industry|Gases|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"NMM_fec";104;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Glass production|Low enthalpy heat|Natural gas (incl. biogas)" +"FE|Industry|Heat|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Solar and geothermal";"JRC-IDEES-2015_Industry_";"NMM_fec";105;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Glass production|Low enthalpy heat|Solar and geothermal" +"FE|Industry|Electricity|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Electricity";"JRC-IDEES-2015_Industry_";"NMM_fec";106;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Glass production|Low enthalpy heat|Electricity" +"FE|Industry|Solids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Solids";"JRC-IDEES-2015_Industry_";"NMM_fec";109;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Glass production|Glass: Melting tank|Glass: Thermal melting tank|Solids" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"LPG";"JRC-IDEES-2015_Industry_";"NMM_fec";110;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Glass production|Glass: Melting tank|Glass: Thermal melting tank|LPG" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"NMM_fec";111;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Glass production|Glass: Melting tank|Glass: Thermal melting tank|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"NMM_fec";112;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Glass production|Glass: Melting tank|Glass: Thermal melting tank|Residual fuel oil" +"FE|Industry|Gases|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"NMM_fec";113;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Glass production|Glass: Melting tank|Glass: Thermal melting tank|Natural gas (incl. biogas)" +"FE|Industry|Electricity|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Glass: Electric melting tank";"JRC-IDEES-2015_Industry_";"NMM_fec";114;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Glass production|Glass: Melting tank|Glass: Electric melting tank" +"FE|Industry|Electricity|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Glass: Forming";"JRC-IDEES-2015_Industry_";"NMM_fec";115;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Glass production|Glass: Forming" +"FE|Industry|Solids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Solids";"JRC-IDEES-2015_Industry_";"NMM_fec";118;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Glass production|Glass: Annealing|Glass: Annealing - thermal|Solids" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"LPG";"JRC-IDEES-2015_Industry_";"NMM_fec";119;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Glass production|Glass: Annealing|Glass: Annealing - thermal|LPG" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"NMM_fec";120;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Glass production|Glass: Annealing|Glass: Annealing - thermal|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"NMM_fec";121;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Glass production|Glass: Annealing|Glass: Annealing - thermal|Residual fuel oil" +"FE|Industry|Gases|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"NMM_fec";122;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Glass production|Glass: Annealing|Glass: Annealing - thermal|Natural gas (incl. biogas)" +"FE|Industry|Electricity|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Glass: Annealing - electric";"JRC-IDEES-2015_Industry_";"NMM_fec";123;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Glass production|Glass: Annealing|Glass: Annealing - electric" +"FE|Industry|Electricity|Non-metallic minerals";"Non-metallic minerals (cement + other)";"Glass: Finishing processes";"JRC-IDEES-2015_Industry_";"NMM_fec";124;1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Glass production|Glass: Finishing processes" +"FE|Industry|other";;"Non Ferrous Metals";"JRC-IDEES-2015_Industry_";"Ind_Summary";54;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Energy consumption|by sector|Non Ferrous Metals" +"FE|Industry|other";;"Ceramics & other NMM";"JRC-IDEES-2015_Industry_";"Ind_Summary";66;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Energy consumption|by sector|Non-metallic mineral products|Ceramics & other NMM" +"FE|Industry|other";;"Glass production ";"JRC-IDEES-2015_Industry_";"Ind_Summary";67;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Energy consumption|by sector|Non-metallic mineral products|Glass production" +"FE|Industry|other";;"Pulp, paper and printing";"JRC-IDEES-2015_Industry_";"Ind_Summary";68;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Energy consumption|by sector|Pulp, paper and printing" +"FE|Industry|other";;" Food, beverages and tobacco";"JRC-IDEES-2015_Industry_";"Ind_Summary";72;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Energy consumption|by sector|Food, beverages and tobacco" +"FE|Industry|other";;" Transport Equipment";"JRC-IDEES-2015_Industry_";"Ind_Summary";73;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Energy consumption|by sector|Transport Equipment" +"FE|Industry|other";;" Machinery Equipment";"JRC-IDEES-2015_Industry_";"Ind_Summary";74;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Energy consumption|by sector|Machinery Equipment" +"FE|Industry|other";;" Textiles and leather";"JRC-IDEES-2015_Industry_";"Ind_Summary";75;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Energy consumption|by sector|Textiles and leather" +"FE|Industry|other";;" Wood and wood products";"JRC-IDEES-2015_Industry_";"Ind_Summary";76;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Energy consumption|by sector|Wood and wood products" +"FE|Industry|other";;" Other Industrial Sectors";"JRC-IDEES-2015_Industry_";"Ind_Summary";77;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Energy consumption|by sector|Other Industrial Sectors" +"FE|Industry|other";;"Other industrial sectors";"JRC-IDEES-2015_Industry_";"Ind_Summary";95;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Non-energy use|by sector|Other industrial sectors" +"FE|Industry|other";;"Chemical feedstocks";"JRC-IDEES-2015_Industry_";"CHI_fec";15;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Feedstock (energy used as raw material)" +"FE|Industry|other";"Agriculture/Forestry/Fishing";"All Products";"JRC-IDEES-2015_EnergyBalance_";"cagr";2;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|All Products" +"Value Added|Industry|other";;"Non Ferrous Metals";"JRC-IDEES-2015_Industry_";"Ind_Summary";5;1;"billion US$2005/yr";"M€2010";0.00119;"Industry Summary|Value added|Non Ferrous Metals" +"Value Added|Industry|other";;"Ceramics & other NMM";"JRC-IDEES-2015_Industry_";"Ind_Summary";15;1;"billion US$2005/yr";"M€2010";0.00119;"Industry Summary|Value added|Non-metallic mineral products|Ceramics & other NMM" +"Value Added|Industry|other";;"Glass production ";"JRC-IDEES-2015_Industry_";"Ind_Summary";16;1;"billion US$2005/yr";"M€2010";0.00119;"Industry Summary|Value added|Non-metallic mineral products|Glass production" +"Value Added|Industry|other";;"Pulp, paper and printing";"JRC-IDEES-2015_Industry_";"Ind_Summary";17;1;"billion US$2005/yr";"M€2010";0.00119;"Industry Summary|Value added|Pulp, paper and printing" +"Value Added|Industry|other";;" Food, beverages and tobacco";"JRC-IDEES-2015_Industry_";"Ind_Summary";21;1;"billion US$2005/yr";"M€2010";0.00119;"Industry Summary|Value added|Food, beverages and tobacco" +"Value Added|Industry|other";;" Transport Equipment";"JRC-IDEES-2015_Industry_";"Ind_Summary";22;1;"billion US$2005/yr";"M€2010";0.00119;"Industry Summary|Value added|Transport Equipment" +"Value Added|Industry|other";;" Machinery Equipment";"JRC-IDEES-2015_Industry_";"Ind_Summary";23;1;"billion US$2005/yr";"M€2010";0.00119;"Industry Summary|Value added|Machinery Equipment" +"Value Added|Industry|other";;" Textiles and leather";"JRC-IDEES-2015_Industry_";"Ind_Summary";24;1;"billion US$2005/yr";"M€2010";0.00119;"Industry Summary|Value added|Textiles and leather" +"Value Added|Industry|other";;" Wood and wood products";"JRC-IDEES-2015_Industry_";"Ind_Summary";25;1;"billion US$2005/yr";"M€2010";0.00119;"Industry Summary|Value added|Wood and wood products" +"Value Added|Industry|other";;" Other Industrial Sectors";"JRC-IDEES-2015_Industry_";"Ind_Summary";26;1;"billion US$2005/yr";"M€2010";0.00119;"Industry Summary|Value added|Other Industrial Sectors" +"FE|Industry|Solids|other";"Energy consumption ";"Solids";"JRC-IDEES-2015_Industry_";"Ind_Summary";30;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Energy consumption|by fuel (EUROSTAT DATA)|Solids" +"FE|Industry|Solids|other";"Energy consumption ";"Biomass and wastes";"JRC-IDEES-2015_Industry_";"Ind_Summary";43;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Energy consumption|by fuel (EUROSTAT DATA)|RES and wastes|Biomass and wastes" +"FE|Industry|Solids|other";"Non-energy use";"Solids";"JRC-IDEES-2015_Industry_";"Ind_Summary";81;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Non-energy use|by fuel (EUROSTAT DATA)|Solids" +"FE|Industry|Solids|other";"Agriculture/Forestry/Fishing";"Solid Fuels";"JRC-IDEES-2015_EnergyBalance_";"cagr";3;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|Solid Fuels" +"FE|Industry|Solids|other";"Agriculture/Forestry/Fishing";"Solid biofuels (Wood & Wood waste)";"JRC-IDEES-2015_EnergyBalance_";"cagr";69;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|Solid biofuels (Wood & Wood waste)" +"FE|Industry|Solids|other";"Agriculture/Forestry/Fishing";"Charcoal";"JRC-IDEES-2015_EnergyBalance_";"cagr";70;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|Charcoal" +"FE|Industry|Solids|other";"Agriculture/Forestry/Fishing";"Municipal waste (renewable)";"JRC-IDEES-2015_EnergyBalance_";"cagr";72;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|Municipal waste (renewable)" +"FE|Industry|Solids|other";"Agriculture/Forestry/Fishing";"Wastes (non-renewable)";"JRC-IDEES-2015_EnergyBalance_";"cagr";80;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|Wastes (non-renewable)" +"FE|Industry|Solids|other";"Chemicals (including feedstocks)";"Solids";"JRC-IDEES-2015_Industry_";"CHI_fec";25;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Steam processing|Solids" +"FE|Industry|Solids|other";"Chemicals (including feedstocks)";"Biomass";"JRC-IDEES-2015_Industry_";"CHI_fec";33;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Steam processing|Biomass" +"FE|Industry|Solids|other";"Chemicals (including feedstocks)";"Solids";"JRC-IDEES-2015_Industry_";"CHI_fec";37;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Furnaces|Chemicals: Furnaces - Thermal|Solids" +"FE|Industry|Solids|other";"Chemicals (including feedstocks)";"Solids";"JRC-IDEES-2015_Industry_";"CHI_fec";46;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Solids" +"FE|Industry|Solids|other";"Chemicals (including feedstocks)";"Biomass";"JRC-IDEES-2015_Industry_";"CHI_fec";54;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Biomass" +"FE|Industry|Solids|other";"Chemicals (including feedstocks)";"Solids";"JRC-IDEES-2015_Industry_";"CHI_fec";72;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Solids" +"FE|Industry|Solids|other";"Chemicals (including feedstocks)";"Biomass";"JRC-IDEES-2015_Industry_";"CHI_fec";80;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Biomass" +"FE|Industry|Solids|other";"Chemicals (including feedstocks)";"Solids";"JRC-IDEES-2015_Industry_";"CHI_fec";85;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Furnaces|Chemicals: Furnaces - Thermal|Solids" +"FE|Industry|Solids|other";"Chemicals (including feedstocks)";"Solids";"JRC-IDEES-2015_Industry_";"CHI_fec";94;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Solids" +"FE|Industry|Solids|other";"Chemicals (including feedstocks)";"Biomass";"JRC-IDEES-2015_Industry_";"CHI_fec";102;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Biomass" +"FE|Industry|Solids|other";"Chemicals (including feedstocks)";"Biomass";"JRC-IDEES-2015_Industry_";"CHI_fec";120;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Solids " +"FE|Industry|Solids|other";"Chemicals (including feedstocks)";"Biomass";"JRC-IDEES-2015_Industry_";"CHI_fec";128;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Biomass" +"FE|Industry|Solids|other";"Chemicals (including feedstocks)";"Solids";"JRC-IDEES-2015_Industry_";"CHI_fec";133;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Furnaces|Chemicals: Furnaces - Thermal|Solids" +"FE|Industry|Solids|other";"Chemicals (including feedstocks)";"Solids";"JRC-IDEES-2015_Industry_";"CHI_fec";142;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Solids" +"FE|Industry|Solids|other";"Chemicals (including feedstocks)";"Biomass";"JRC-IDEES-2015_Industry_";"CHI_fec";150;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Biomass" +"FE|Industry|Solids|other";"Primary steel";"Solids";"JRC-IDEES-2015_Industry_";"ISI_fec";16;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Sinter/Pellet making|Solids" +"FE|Industry|Solids|other";"Primary steel";"Solids";"JRC-IDEES-2015_Industry_";"ISI_fec";22;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Blast /Basic oxygen furnace|Solids" +"FE|Industry|Solids|other";"Primary steel";"Coke";"JRC-IDEES-2015_Industry_";"ISI_fec";23;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Blast /Basic oxygen furnace|Coke" +"FE|Industry|Solids|other";"Primary steel";"Solids";"JRC-IDEES-2015_Industry_";"ISI_fec";40;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Products finishing|Steel: Products finishing - Steam|Solids" +"FE|Industry|Solids|other";"Primary steel";"Biomass";"JRC-IDEES-2015_Industry_";"ISI_fec";48;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Products finishing|Steel: Products finishing - Steam|Biomass" +"FE|Industry|Solids|other";"Secondary Steel ";"Solids";"JRC-IDEES-2015_Industry_";"ISI_fec";64;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Smelters|Solids" +"FE|Industry|Solids|other";"Secondary Steel ";"Solids";"JRC-IDEES-2015_Industry_";"ISI_fec";83;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Products finishing|Steel: Products finishing - Steam|Solids" +"FE|Industry|Solids|other";"Secondary Steel ";"Biomass";"JRC-IDEES-2015_Industry_";"ISI_fec";91;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Products finishing|Steel: Products finishing - Steam|Biomass" +"FE|Industry|Solids|other";"Cement";"Solids";"JRC-IDEES-2015_Industry_";"NMM_fec";18;-1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Fuel use|Solids" +"FE|Industry|Solids|other";"Cement";"Biomass";"JRC-IDEES-2015_Industry_";"NMM_fec";24;-1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Fuel use|Biomass" +"FE|Industry|Solids|other";"Cement";"Solids";"JRC-IDEES-2015_Industry_";"NMM_fec";26;-1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Steam|Solids" +"FE|Industry|Solids|other";"Cement";"Biomass";"JRC-IDEES-2015_Industry_";"NMM_fec";34;-1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Steam|Biomass" +"FE|Industry|Solids|other";"Cement";"Solids";"JRC-IDEES-2015_Industry_";"NMM_fec";37;-1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Clinker production (kilns)|Solids" +"FE|Industry|Solids|other";"Cement";"Biomass";"JRC-IDEES-2015_Industry_";"NMM_fec";43;-1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Clinker production (kilns)|Biomass" +"FE|Industry|Liquids|other";"Energy consumption ";"Liquids";"JRC-IDEES-2015_Industry_";"Ind_Summary";33;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Energy consumption|by fuel (EUROSTAT DATA)|Liquids" +"FE|Industry|Liquids|other";"Energy consumption ";"Liquid biofuels";"JRC-IDEES-2015_Industry_";"Ind_Summary";45;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Energy consumption|by fuel (EUROSTAT DATA)|RES and wastes|Liquid biofuels" +"FE|Industry|Liquids|other";"Non-energy use";"Liquids";"JRC-IDEES-2015_Industry_";"Ind_Summary";82;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Non-energy use|by fuel (EUROSTAT DATA)|Liquids" +"FE|Industry|Liquids|other";"Agriculture/Forestry/Fishing";"Total petroleum products (without biofuels)";"JRC-IDEES-2015_EnergyBalance_";"cagr";21;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|Total petroleum products (without biofuels)" +"FE|Industry|Liquids|other";"Agriculture/Forestry/Fishing";"Liquid biofuels";"JRC-IDEES-2015_EnergyBalance_";"cagr";73;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|Liquid biofuels" +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"CHI_fec";11;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Low enthalpy heat|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"LPG";"JRC-IDEES-2015_Industry_";"CHI_fec";27;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Steam processing|LPG" +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"CHI_fec";28;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Steam processing|Diesel oil (incl. biofuels) " +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"CHI_fec";29;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Steam processing|Residual fuel oil " +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"Other liquids";"JRC-IDEES-2015_Industry_";"CHI_fec";30;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Steam processing|Other liquids " +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"LPG";"JRC-IDEES-2015_Industry_";"CHI_fec";38;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Furnaces|Chemicals: Furnaces - Thermal|LPG" +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"CHI_fec";39;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Furnaces|Chemicals: Furnaces - Thermal|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"CHI_fec";40;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Furnaces|Chemicals: Furnaces - Thermal|Residual fuel oil " +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"LPG";"JRC-IDEES-2015_Industry_";"CHI_fec";48;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|LPG" +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"CHI_fec";49;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"CHI_fec";50;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Residual fuel oil " +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"Other liquids";"JRC-IDEES-2015_Industry_";"CHI_fec";51;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Other liquids " +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"CHI_fec";66;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Low enthalpy heat|Diesel oil (incl. biofuels) " +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"LPG";"JRC-IDEES-2015_Industry_";"CHI_fec";74;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|LPG" +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"CHI_fec";75;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"CHI_fec";76;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Residual fuel oil" +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"Other liquids";"JRC-IDEES-2015_Industry_";"CHI_fec";77;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Other liquids" +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"LPG";"JRC-IDEES-2015_Industry_";"CHI_fec";86;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Furnaces|Chemicals: Furnaces - Thermal|LPG" +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"CHI_fec";87;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Furnaces|Chemicals: Furnaces - Thermal|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"CHI_fec";88;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Furnaces|Chemicals: Furnaces - Thermal|Residual fuel oil " +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"LPG";"JRC-IDEES-2015_Industry_";"CHI_fec";96;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|LPG" +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"CHI_fec";97;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"CHI_fec";98;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Residual fuel oil " +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"Other liquids";"JRC-IDEES-2015_Industry_";"CHI_fec";99;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Other liquids " +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"CHI_fec";114;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Low enthalpy heat|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"LPG";"JRC-IDEES-2015_Industry_";"CHI_fec";122;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|LPG" +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"CHI_fec";123;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"CHI_fec";124;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Residual fuel oil" +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"Other liquids";"JRC-IDEES-2015_Industry_";"CHI_fec";125;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Other liquids" +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"LPG";"JRC-IDEES-2015_Industry_";"CHI_fec";134;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Furnaces|Chemicals: Furnaces - Thermal|LPG" +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"CHI_fec";135;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Furnaces|Chemicals: Furnaces - Thermal|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"CHI_fec";136;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Furnaces|Chemicals: Furnaces - Thermal|Residual fuel oil" +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"LPG";"JRC-IDEES-2015_Industry_";"CHI_fec";144;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Process cooling|Chemicals: Process cooling - Steam|LPG" +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"CHI_fec";145;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"CHI_fec";146;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Residual fuel oil" +"FE|Industry|Liquids|other";"Chemicals (including feedstocks)";"Other liquids";"JRC-IDEES-2015_Industry_";"CHI_fec";147;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Other liquids" +"FE|Industry|Liquids|other";"Primary steel";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"ISI_fec";11;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Low enthalpy heat|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|other";"Primary steel";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"ISI_fec";17;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Sinter/Pellet making|Residual fuel oil" +"FE|Industry|Liquids|other";"Primary steel";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"ISI_fec";24;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Blast /Basic oxygen furnace|Residual fuel oil" +"FE|Industry|Liquids|other";"Primary steel";"LPG";"JRC-IDEES-2015_Industry_";"ISI_fec";29;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Furnaces, Refining and Rolling|Steel: Furnaces, Refining and Rolling - Thermal|LPG" +"FE|Industry|Liquids|other";"Primary steel";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"ISI_fec";30;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Furnaces, Refining and Rolling|Steel: Furnaces, Refining and Rolling - Thermal|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|other";"Primary steel";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"ISI_fec";31;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Furnaces, Refining and Rolling|Steel: Furnaces, Refining and Rolling - Thermal|Residual fuel oil" +"FE|Industry|Liquids|other";"Primary steel";"LPG";"JRC-IDEES-2015_Industry_";"ISI_fec";36;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Products finishing|Steel: Products finishing - Thermal|LPG" +"FE|Industry|Liquids|other";"Primary steel";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"ISI_fec";37;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Products finishing|Steel: Products finishing - Thermal|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|other";"Primary steel";"LPG";"JRC-IDEES-2015_Industry_";"ISI_fec";42;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Products finishing|Steel: Products finishing - Steam|LPG" +"FE|Industry|Liquids|other";"Primary steel";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"ISI_fec";43;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Products finishing|Steel: Products finishing - Steam|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|other";"Primary steel";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"ISI_fec";44;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Products finishing|Steel: Products finishing - Steam|Residual fuel oil" +"FE|Industry|Liquids|other";"Primary steel";"Other liquids";"JRC-IDEES-2015_Industry_";"ISI_fec";45;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Products finishing|Steel: Products finishing - Steam|Other liquids" +"FE|Industry|Liquids|other";"Secondary Steel ";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"ISI_fec";59;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Low enthalpy heat|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|other";"Secondary Steel ";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"ISI_fec";65;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Smelters|Residual fuel oil" +"FE|Industry|Liquids|other";"Secondary Steel ";"LPG";"JRC-IDEES-2015_Industry_";"ISI_fec";72;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Furnaces, Refining and Rolling|Steel: Furnaces, Refining and Rolling - Thermal|LPG" +"FE|Industry|Liquids|other";"Secondary Steel ";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"ISI_fec";73;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Furnaces, Refining and Rolling|Steel: Furnaces, Refining and Rolling - Thermal|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|other";"Secondary Steel ";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"ISI_fec";74;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Furnaces, Refining and Rolling|Steel: Furnaces, Refining and Rolling - Thermal|Residual fuel oil" +"FE|Industry|Liquids|other";"Secondary Steel ";"LPG";"JRC-IDEES-2015_Industry_";"ISI_fec";79;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Products finishing|Steel: Products finishing - Thermal|LPG" +"FE|Industry|Liquids|other";"Secondary Steel ";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"ISI_fec";80;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Products finishing|Steel: Products finishing - Thermal|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|other";"Secondary Steel ";"LPG";"JRC-IDEES-2015_Industry_";"ISI_fec";85;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Products finishing|Steel: Products finishing - Steam|LPG" +"FE|Industry|Liquids|other";"Secondary Steel ";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"ISI_fec";86;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Products finishing|Steel: Products finishing - Steam|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|other";"Secondary Steel ";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"ISI_fec";87;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Products finishing|Steel: Products finishing - Steam|Residual fuel oil" +"FE|Industry|Liquids|other";"Secondary Steel ";"Other liquids";"JRC-IDEES-2015_Industry_";"ISI_fec";88;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Products finishing|Steel: Products finishing - Steam|Other liquids" +"FE|Industry|Liquids|other";"Cement";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"NMM_fec";11;-1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Low enthalpy heat|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|other";"Cement";"LPG";"JRC-IDEES-2015_Industry_";"NMM_fec";19;-1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Fuel use|LPG" +"FE|Industry|Liquids|other";"Cement";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"NMM_fec";20;-1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Fuel use|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|other";"Cement";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"NMM_fec";21;-1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Fuel use|Residual fuel oil" +"FE|Industry|Liquids|other";"Cement";"Other liquids";"JRC-IDEES-2015_Industry_";"NMM_fec";22;-1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Fuel use|Other liquids" +"FE|Industry|Liquids|other";"Cement";"LPG";"JRC-IDEES-2015_Industry_";"NMM_fec";28;-1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Steam|LPG" +"FE|Industry|Liquids|other";"Cement";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"NMM_fec";29;-1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Steam|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|other";"Cement";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"NMM_fec";30;-1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Steam|Residual fuel oil" +"FE|Industry|Liquids|other";"Cement";"Other liquids";"JRC-IDEES-2015_Industry_";"NMM_fec";31;-1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Steam|Other liquids" +"FE|Industry|Liquids|other";"Cement";"LPG";"JRC-IDEES-2015_Industry_";"NMM_fec";38;-1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Clinker production (kilns)|LPG" +"FE|Industry|Liquids|other";"Cement";"Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Industry_";"NMM_fec";39;-1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Clinker production (kilns)|Diesel oil (incl. biofuels)" +"FE|Industry|Liquids|other";"Cement";"Residual fuel oil";"JRC-IDEES-2015_Industry_";"NMM_fec";40;-1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Clinker production (kilns)|Residual fuel oil" +"FE|Industry|Liquids|other";"Cement";"Other liquids";"JRC-IDEES-2015_Industry_";"NMM_fec";41;-1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Clinker production (kilns)|Other liquids" +"FE|Industry|Gases|other";"Energy consumption ";"Gases";"JRC-IDEES-2015_Industry_";"Ind_Summary";39;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Energy consumption|by fuel (EUROSTAT DATA)|Gases" +"FE|Industry|Gases|other";"Energy consumption ";"Biogas";"JRC-IDEES-2015_Industry_";"Ind_Summary";44;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Energy consumption|by fuel (EUROSTAT DATA)|RES and wastes|Biogas" +"FE|Industry|Gases|other";"Non-energy use";"Gas";"JRC-IDEES-2015_Industry_";"Ind_Summary";89;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Non-energy use|by fuel (EUROSTAT DATA)|Gas" +"FE|Industry|Gases|other";"Agriculture/Forestry/Fishing";"Gases";"JRC-IDEES-2015_EnergyBalance_";"cagr";52;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|Gases" +"FE|Industry|Gases|other";"Agriculture/Forestry/Fishing";"Biogas";"JRC-IDEES-2015_EnergyBalance_";"cagr";71;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|Biogas" +"FE|Industry|Gases|other";"Chemicals (including feedstocks)";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"CHI_fec";12;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Low enthalpy heat|Natural gas (incl. biogas)" +"FE|Industry|Gases|other";"Chemicals (including feedstocks)";"Refinery gas";"JRC-IDEES-2015_Industry_";"CHI_fec";26;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Steam processing|Refinery gas" +"FE|Industry|Gases|other";"Chemicals (including feedstocks)";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"CHI_fec";31;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Steam processing|Natural gas (incl. biogas)" +"FE|Industry|Gases|other";"Chemicals (including feedstocks)";"Derived gases";"JRC-IDEES-2015_Industry_";"CHI_fec";32;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Steam processing|Derived gases " +"FE|Industry|Gases|other";"Chemicals (including feedstocks)";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"CHI_fec";41;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Furnaces|Chemicals: Furnaces - Thermal|Natural gas (incl. biogas)" +"FE|Industry|Gases|other";"Chemicals (including feedstocks)";"Chemicals: Process cooling - Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"CHI_fec";44;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Natural gas (incl. biogas)" +"FE|Industry|Gases|other";"Chemicals (including feedstocks)";"Refinery gas";"JRC-IDEES-2015_Industry_";"CHI_fec";47;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Refinery gas" +"FE|Industry|Gases|other";"Chemicals (including feedstocks)";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"CHI_fec";52;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Natural gas (incl. biogas)" +"FE|Industry|Gases|other";"Chemicals (including feedstocks)";"Derived gases";"JRC-IDEES-2015_Industry_";"CHI_fec";53;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Derived gases " +"FE|Industry|Gases|other";"Chemicals (including feedstocks)";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"CHI_fec";67;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Low enthalpy heat|Natural gas (incl. biogas)" +"FE|Industry|Gases|other";"Chemicals (including feedstocks)";"Refinery gas";"JRC-IDEES-2015_Industry_";"CHI_fec";73;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Refinery gas " +"FE|Industry|Gases|other";"Chemicals (including feedstocks)";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"CHI_fec";78;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Natural gas (incl. biogas)" +"FE|Industry|Gases|other";"Chemicals (including feedstocks)";"Derived gases";"JRC-IDEES-2015_Industry_";"CHI_fec";79;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Derived gases" +"FE|Industry|Gases|other";"Chemicals (including feedstocks)";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"CHI_fec";89;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Furnaces|Chemicals: Furnaces - Thermal|Natural gas (incl. biogas)" +"FE|Industry|Gases|other";"Chemicals (including feedstocks)";"Chemicals: Process cooling - Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"CHI_fec";92;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Natural gas (incl. biogas)" +"FE|Industry|Gases|other";"Chemicals (including feedstocks)";"Refinery gas";"JRC-IDEES-2015_Industry_";"CHI_fec";95;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Refinery gas" +"FE|Industry|Gases|other";"Chemicals (including feedstocks)";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"CHI_fec";100;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Natural gas (incl. biogas)" +"FE|Industry|Gases|other";"Chemicals (including feedstocks)";"Derived gases";"JRC-IDEES-2015_Industry_";"CHI_fec";101;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Derived gases " +"FE|Industry|Gases|other";"Chemicals (including feedstocks)";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"CHI_fec";115;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Low enthalpy heat|Natural gas (incl. biogas)" +"FE|Industry|Gases|other";"Chemicals (including feedstocks)";"Refinery gas";"JRC-IDEES-2015_Industry_";"CHI_fec";121;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Refinery gas" +"FE|Industry|Gases|other";"Chemicals (including feedstocks)";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"CHI_fec";126;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Natural gas (incl. biogas) " +"FE|Industry|Gases|other";"Chemicals (including feedstocks)";"Derived gases";"JRC-IDEES-2015_Industry_";"CHI_fec";127;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Derived gases" +"FE|Industry|Gases|other";"Chemicals (including feedstocks)";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"CHI_fec";137;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Furnaces|Chemicals: Furnaces - Thermal|Natural gas (incl. biogas)" +"FE|Industry|Gases|other";"Chemicals (including feedstocks)";"Chemicals: Process cooling - Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"CHI_fec";140;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Process cooling|Chemicals: Process cooling - Natural gas (incl. biogas) " +"FE|Industry|Gases|other";"Chemicals (including feedstocks)";"Refinery gas";"JRC-IDEES-2015_Industry_";"CHI_fec";143;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Refinery gas " +"FE|Industry|Gases|other";"Chemicals (including feedstocks)";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"CHI_fec";148;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Natural gas (incl. biogas)" +"FE|Industry|Gases|other";"Chemicals (including feedstocks)";"Derived gases";"JRC-IDEES-2015_Industry_";"CHI_fec";149;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Derived gases" +"FE|Industry|Gases|other";"Primary steel";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"ISI_fec";12;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Low enthalpy heat|Natural gas (incl. biogas)" +"FE|Industry|Gases|other";"Primary steel";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"ISI_fec";18;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Sinter/Pellet making|Natural gas (incl. biogas)" +"FE|Industry|Gases|other";"Primary steel";"Derived gases";"JRC-IDEES-2015_Industry_";"ISI_fec";19;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Sinter/Pellet making|Derived gases" +"FE|Industry|Gases|other";"Primary steel";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"ISI_fec";25;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Blast /Basic oxygen furnace|Natural gas (incl. biogas)" +"FE|Industry|Gases|other";"Primary steel";"Derived gases";"JRC-IDEES-2015_Industry_";"ISI_fec";26;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Blast /Basic oxygen furnace|Derived gases" +"FE|Industry|Gases|other";"Primary steel";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"ISI_fec";32;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Furnaces, Refining and Rolling|Steel: Furnaces, Refining and Rolling - Thermal|Natural gas (incl. biogas)" +"FE|Industry|Gases|other";"Primary steel";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"ISI_fec";38;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Products finishing|Steel: Products finishing - Thermal|Natural gas (incl. biogas)" +"FE|Industry|Gases|other";"Primary steel";"Refinery gas";"JRC-IDEES-2015_Industry_";"ISI_fec";41;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Products finishing|Steel: Products finishing - Steam|Refinery gas" +"FE|Industry|Gases|other";"Primary steel";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"ISI_fec";46;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Products finishing|Steel: Products finishing - Steam|Natural gas (incl. biogas)" +"FE|Industry|Gases|other";"Primary steel";"Derived gases";"JRC-IDEES-2015_Industry_";"ISI_fec";47;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Products finishing|Steel: Products finishing - Steam|Derived gases" +"FE|Industry|Gases|other";"Secondary Steel ";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"ISI_fec";60;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Low enthalpy heat|Natural gas (incl. biogas)" +"FE|Industry|Gases|other";"Secondary Steel ";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"ISI_fec";66;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Smelters|Natural gas (incl. biogas)" +"FE|Industry|Gases|other";"Secondary Steel ";"Derived gases";"JRC-IDEES-2015_Industry_";"ISI_fec";67;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Smelters|Derived gases" +"FE|Industry|Gases|other";"Secondary Steel ";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"ISI_fec";75;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Furnaces, Refining and Rolling|Steel: Furnaces, Refining and Rolling - Thermal|Natural gas (incl. biogas)" +"FE|Industry|Gases|other";"Secondary Steel ";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"ISI_fec";81;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Products finishing|Steel: Products finishing - Thermal|Natural gas (incl. biogas)" +"FE|Industry|Gases|other";"Secondary Steel ";"Refinery gas";"JRC-IDEES-2015_Industry_";"ISI_fec";84;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Products finishing|Steel: Products finishing - Steam|Refinery gas" +"FE|Industry|Gases|other";"Secondary Steel ";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"ISI_fec";89;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Products finishing|Steel: Products finishing - Steam|Natural gas (incl. biogas)" +"FE|Industry|Gases|other";"Secondary Steel ";"Derived gases";"JRC-IDEES-2015_Industry_";"ISI_fec";90;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Products finishing|Steel: Products finishing - Steam|Derived gases" +"FE|Industry|Gases|other";"Cement";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"NMM_fec";12;-1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Low enthalpy heat|Natural gas (incl. biogas)" +"FE|Industry|Gases|other";"Cement";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"NMM_fec";23;-1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Fuel use|Natural gas (incl. biogas)" +"FE|Industry|Gases|other";"Cement";"Refinery gas";"JRC-IDEES-2015_Industry_";"NMM_fec";27;-1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Steam|Refinery gas" +"FE|Industry|Gases|other";"Cement";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"NMM_fec";32;-1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Steam|Natural gas (incl. biogas)" +"FE|Industry|Gases|other";"Cement";"Derived gases";"JRC-IDEES-2015_Industry_";"NMM_fec";33;-1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Steam|Derived gases" +"FE|Industry|Gases|other";"Cement";"Natural gas (incl. biogas)";"JRC-IDEES-2015_Industry_";"NMM_fec";42;-1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Clinker production (kilns)|Natural gas (incl. biogas)" +"FE|Industry|Heat|other";"Energy consumption ";"Solar";"JRC-IDEES-2015_Industry_";"Ind_Summary";46;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Energy consumption|by fuel (EUROSTAT DATA)|RES and wastes|Solar" +"FE|Industry|Heat|other";"Energy consumption ";"Geothermal";"JRC-IDEES-2015_Industry_";"Ind_Summary";47;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Energy consumption|by fuel (EUROSTAT DATA)|RES and wastes|Geothermal" +"FE|Industry|Heat|other";"Energy consumption ";"Steam distributed";"JRC-IDEES-2015_Industry_";"Ind_Summary";48;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Energy consumption|by fuel (EUROSTAT DATA)|Steam distributed" +"FE|Industry|Heat|other";"Agriculture/Forestry/Fishing";"Nuclear heat";"JRC-IDEES-2015_EnergyBalance_";"cagr";59;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|Nuclear heat" +"FE|Industry|Heat|other";"Agriculture/Forestry/Fishing";"Derived heat";"JRC-IDEES-2015_EnergyBalance_";"cagr";60;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|Derived heat" +"FE|Industry|Heat|other";"Agriculture/Forestry/Fishing";"Hydro power";"JRC-IDEES-2015_EnergyBalance_";"cagr";62;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|Hydro power" +"FE|Industry|Heat|other";"Agriculture/Forestry/Fishing";"Wind Power";"JRC-IDEES-2015_EnergyBalance_";"cagr";63;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|Wind Power" +"FE|Industry|Heat|other";"Agriculture/Forestry/Fishing";"Solar energy";"JRC-IDEES-2015_EnergyBalance_";"cagr";64;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|Solar energy" +"FE|Industry|Heat|other";"Agriculture/Forestry/Fishing";"Tide, Wave and Ocean";"JRC-IDEES-2015_EnergyBalance_";"cagr";67;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|Tide, Wave and Ocean" +"FE|Industry|Heat|other";"Agriculture/Forestry/Fishing";"Geothermal";"JRC-IDEES-2015_EnergyBalance_";"cagr";78;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|Geothermal" +"FE|Industry|Heat|other";"Chemicals (including feedstocks)";"Solar and geothermal";"JRC-IDEES-2015_Industry_";"CHI_fec";13;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Low enthalpy heat|Solar and geothermal" +"FE|Industry|Heat|other";"Chemicals (including feedstocks)";"Steam distributed";"JRC-IDEES-2015_Industry_";"CHI_fec";34;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Steam processing|Steam distributed " +"FE|Industry|Heat|other";"Chemicals (including feedstocks)";"Steam distributed";"JRC-IDEES-2015_Industry_";"CHI_fec";55;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Steam distributed " +"FE|Industry|Heat|other";"Chemicals (including feedstocks)";"Solar and geothermal";"JRC-IDEES-2015_Industry_";"CHI_fec";68;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Low enthalpy heat|Solar and geothermal" +"FE|Industry|Heat|other";"Chemicals (including feedstocks)";"Steam distributed";"JRC-IDEES-2015_Industry_";"CHI_fec";81;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Steam distributed" +"FE|Industry|Heat|other";"Chemicals (including feedstocks)";"Steam distributed";"JRC-IDEES-2015_Industry_";"CHI_fec";103;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Steam distributed " +"FE|Industry|Heat|other";"Chemicals (including feedstocks)";"Solar and geothermal";"JRC-IDEES-2015_Industry_";"CHI_fec";116;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Low enthalpy heat|Solar and geothermal " +"FE|Industry|Heat|other";"Chemicals (including feedstocks)";"Steam distributed";"JRC-IDEES-2015_Industry_";"CHI_fec";129;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Steam|Steam distributed" +"FE|Industry|Heat|other";"Chemicals (including feedstocks)";"Steam distributed";"JRC-IDEES-2015_Industry_";"CHI_fec";151;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Process cooling|Chemicals: Process cooling - Steam|Steam distributed" +"FE|Industry|Heat|other";"Primary steel";"Solar and geothermal";"JRC-IDEES-2015_Industry_";"ISI_fec";13;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Low enthalpy heat|Solar and geothermal" +"FE|Industry|Heat|other";"Primary steel";"Steam distributed";"JRC-IDEES-2015_Industry_";"ISI_fec";49;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Products finishing|Steel: Products finishing - Steam|Steam distributed" +"FE|Industry|Heat|other";"Secondary Steel ";"Solar and geothermal";"JRC-IDEES-2015_Industry_";"ISI_fec";61;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Low enthalpy heat|Solar and geothermal" +"FE|Industry|Heat|other";"Secondary Steel ";"Steam distributed";"JRC-IDEES-2015_Industry_";"ISI_fec";92;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Products finishing|Steel: Products finishing - Steam|Steam distributed" +"FE|Industry|Heat|other";"Cement";"Solar and geothermal";"JRC-IDEES-2015_Industry_";"NMM_fec";13;-1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Low enthalpy heat|Solar and geothermal" +"FE|Industry|Heat|other";"Cement";"Steam distributed";"JRC-IDEES-2015_Industry_";"NMM_fec";35;-1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Pre-heating and pre-calcination|Cement: pre-processing - Steam|Steam distributed" +"FE|Industry|Electricity|other";"Energy consumption ";"Electricity";"JRC-IDEES-2015_Industry_";"Ind_Summary";49;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Energy consumption|by fuel (EUROSTAT DATA)|Electricity" +"FE|Industry|Electricity|other";"Agriculture/Forestry/Fishing";"Electricity";"JRC-IDEES-2015_EnergyBalance_";"cagr";79;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|Electricity" +"FE|Industry|Electricity|other";"Chemicals (including feedstocks)";"Lighting";"JRC-IDEES-2015_Industry_";"CHI_fec";6;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Lighting" +"FE|Industry|Electricity|other";"Chemicals (including feedstocks)";"Air compressors";"JRC-IDEES-2015_Industry_";"CHI_fec";7;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Air compressors" +"FE|Industry|Electricity|other";"Chemicals (including feedstocks)";"Motor drives";"JRC-IDEES-2015_Industry_";"CHI_fec";8;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Motor drives" +"FE|Industry|Electricity|other";"Chemicals (including feedstocks)";"Fans and pumps";"JRC-IDEES-2015_Industry_";"CHI_fec";9;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Fans and pumps" +"FE|Industry|Electricity|other";"Chemicals (including feedstocks)";"Electricity";"JRC-IDEES-2015_Industry_";"CHI_fec";14;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Low enthalpy heat|Electricity " +"FE|Industry|Electricity|other";"Chemicals (including feedstocks)";"Chemicals: Furnaces - Electric";"JRC-IDEES-2015_Industry_";"CHI_fec";42;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Furnaces|Chemicals: Furnaces - Electric" +"FE|Industry|Electricity|other";"Chemicals (including feedstocks)";"Chemicals: Process cooling - Electric";"JRC-IDEES-2015_Industry_";"CHI_fec";56;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Electric" +"FE|Industry|Electricity|other";"Chemicals (including feedstocks)";"Chemicals: Generic electric process";"JRC-IDEES-2015_Industry_";"CHI_fec";57;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Generic electric process" +"FE|Industry|Electricity|other";"Chemicals (including feedstocks)";"Lighting";"JRC-IDEES-2015_Industry_";"CHI_fec";61;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Lighting" +"FE|Industry|Electricity|other";"Chemicals (including feedstocks)";"Air compressors";"JRC-IDEES-2015_Industry_";"CHI_fec";62;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Air compressors" +"FE|Industry|Electricity|other";"Chemicals (including feedstocks)";"Motor drives";"JRC-IDEES-2015_Industry_";"CHI_fec";63;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Motor drives" +"FE|Industry|Electricity|other";"Chemicals (including feedstocks)";"Fans and pumps";"JRC-IDEES-2015_Industry_";"CHI_fec";64;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Fans and pumps" +"FE|Industry|Electricity|other";"Chemicals (including feedstocks)";"Electricity";"JRC-IDEES-2015_Industry_";"CHI_fec";69;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Low enthalpy heat|Electricity " +"FE|Industry|Electricity|other";"Chemicals (including feedstocks)";"High enthalpy heat processing - Electric (microwave)";"JRC-IDEES-2015_Industry_";"CHI_fec";82;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Electric (microwave)" +"FE|Industry|Electricity|other";"Chemicals (including feedstocks)";"Chemicals: Furnaces - Electric";"JRC-IDEES-2015_Industry_";"CHI_fec";90;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Furnaces|Chemicals: Furnaces - Electric" +"FE|Industry|Electricity|other";"Chemicals (including feedstocks)";"Chemicals: Process cooling - Electric";"JRC-IDEES-2015_Industry_";"CHI_fec";104;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Process cooling|Chemicals: Process cooling - Electric" +"FE|Industry|Electricity|other";"Chemicals (including feedstocks)";"Chemicals: Generic electric process";"JRC-IDEES-2015_Industry_";"CHI_fec";105;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals|Chemicals: Generic electric process" +"FE|Industry|Electricity|other";"Chemicals (including feedstocks)";"Lighting";"JRC-IDEES-2015_Industry_";"CHI_fec";109;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Lighting " +"FE|Industry|Electricity|other";"Chemicals (including feedstocks)";"Air compressors";"JRC-IDEES-2015_Industry_";"CHI_fec";110;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Air compressors" +"FE|Industry|Electricity|other";"Chemicals (including feedstocks)";"Motor drives";"JRC-IDEES-2015_Industry_";"CHI_fec";111;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Motor drives " +"FE|Industry|Electricity|other";"Chemicals (including feedstocks)";"Fans and pumps";"JRC-IDEES-2015_Industry_";"CHI_fec";112;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Fans and pumps" +"FE|Industry|Electricity|other";"Chemicals (including feedstocks)";"Electricity";"JRC-IDEES-2015_Industry_";"CHI_fec";117;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Low enthalpy heat|Electricity" +"FE|Industry|Electricity|other";"Chemicals (including feedstocks)";"High enthalpy heat processing - Electric (microwave)";"JRC-IDEES-2015_Industry_";"CHI_fec";130;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: High enthalpy heat processing|High enthalpy heat processing - Electric (microwave) " +"FE|Industry|Electricity|other";"Chemicals (including feedstocks)";"Chemicals: Furnaces - Electric";"JRC-IDEES-2015_Industry_";"CHI_fec";138;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Furnaces|Chemicals: Furnaces - Electric " +"FE|Industry|Electricity|other";"Chemicals (including feedstocks)";"Chemicals: Process cooling - Electric";"JRC-IDEES-2015_Industry_";"CHI_fec";152;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Process cooling|Chemicals: Process cooling - Electric" +"FE|Industry|Electricity|other";"Chemicals (including feedstocks)";"Chemicals: Generic electric process";"JRC-IDEES-2015_Industry_";"CHI_fec";153;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc.|Chemicals: Generic electric process " +"FE|Industry|Electricity|other";"Primary steel";"Lighting";"JRC-IDEES-2015_Industry_";"ISI_fec";6;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Lighting" +"FE|Industry|Electricity|other";"Primary steel";"Air compressors";"JRC-IDEES-2015_Industry_";"ISI_fec";7;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Air compressors" +"FE|Industry|Electricity|other";"Primary steel";"Motor drives";"JRC-IDEES-2015_Industry_";"ISI_fec";8;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Motor drives" +"FE|Industry|Electricity|other";"Primary steel";"Fans and pumps";"JRC-IDEES-2015_Industry_";"ISI_fec";9;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Fans and pumps" +"FE|Industry|Electricity|other";"Primary steel";"Electricity";"JRC-IDEES-2015_Industry_";"ISI_fec";14;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Low enthalpy heat|Electricity" +"FE|Industry|Electricity|other";"Primary steel";"Electricity";"JRC-IDEES-2015_Industry_";"ISI_fec";20;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Sinter/Pellet making|Electricity" +"FE|Industry|Electricity|other";"Primary steel";"Steel: Furnaces, Refining and Rolling - Electric";"JRC-IDEES-2015_Industry_";"ISI_fec";33;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Furnaces, Refining and Rolling|Steel: Furnaces, Refining and Rolling - Electric" +"FE|Industry|Electricity|other";"Primary steel";"Steel: Products finishing - Electric";"JRC-IDEES-2015_Industry_";"ISI_fec";50;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Integrated steelworks|Steel: Products finishing|Steel: Products finishing - Electric" +"FE|Industry|Electricity|other";"Secondary Steel ";"Lighting";"JRC-IDEES-2015_Industry_";"ISI_fec";54;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Lighting" +"FE|Industry|Electricity|other";"Secondary Steel ";"Air compressors";"JRC-IDEES-2015_Industry_";"ISI_fec";55;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Air compressors" +"FE|Industry|Electricity|other";"Secondary Steel ";"Motor drives";"JRC-IDEES-2015_Industry_";"ISI_fec";56;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Motor drives" +"FE|Industry|Electricity|other";"Secondary Steel ";"Fans and pumps";"JRC-IDEES-2015_Industry_";"ISI_fec";57;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Fans and pumps" +"FE|Industry|Electricity|other";"Secondary Steel ";"Electricity";"JRC-IDEES-2015_Industry_";"ISI_fec";62;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Low enthalpy heat|Electricity" +"FE|Industry|Electricity|other";"Secondary Steel ";"Electricity";"JRC-IDEES-2015_Industry_";"ISI_fec";68;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Smelters|Electricity" +"FE|Industry|Electricity|other";"Secondary Steel ";"Steel: Electric arc";"JRC-IDEES-2015_Industry_";"ISI_fec";69;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Electric arc" +"FE|Industry|Electricity|other";"Secondary Steel ";"Steel: Furnaces, Refining and Rolling - Electric";"JRC-IDEES-2015_Industry_";"ISI_fec";76;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Furnaces, Refining and Rolling|Steel: Furnaces, Refining and Rolling - Electric" +"FE|Industry|Electricity|other";"Secondary Steel ";"Steel: Products finishing - Electric";"JRC-IDEES-2015_Industry_";"ISI_fec";93;-1;"EJ/yr";"ktoe";4.1868E-05;"Iron and Steel|Final Energy Consumption|Electric arc|Steel: Products finishing|Steel: Products finishing - Electric" +"FE|Industry|Electricity|other";"Cement";"Lighting";"JRC-IDEES-2015_Industry_";"NMM_fec";6;-1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Lighting" +"FE|Industry|Electricity|other";"Cement";"Air compressors";"JRC-IDEES-2015_Industry_";"NMM_fec";7;-1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Air compressors" +"FE|Industry|Electricity|other";"Cement";"Motor drives";"JRC-IDEES-2015_Industry_";"NMM_fec";8;-1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Motor drives" +"FE|Industry|Electricity|other";"Cement";"Fans and pumps";"JRC-IDEES-2015_Industry_";"NMM_fec";9;-1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Fans and pumps" +"FE|Industry|Electricity|other";"Cement";"Electricity";"JRC-IDEES-2015_Industry_";"NMM_fec";14;-1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Low enthalpy heat|Electricity" +"FE|Industry|Electricity|other";"Cement";"Cement: Grinding, milling of raw material";"JRC-IDEES-2015_Industry_";"NMM_fec";15;-1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Grinding, milling of raw material" +"FE|Industry|Electricity|other";"Cement";"Cement: Grinding, packaging";"JRC-IDEES-2015_Industry_";"NMM_fec";44;-1;"EJ/yr";"ktoe";4.1868E-05;"Non-metallic mineral products|Final Energy Consumption|Cement|Cement: Grinding, packaging" +"Emi|CO2|Industry|Direct";"total co2 emissions from fuel combustions";"CO2 emissions (kt of CO2)";"JRC-IDEES-2015_Industry_";"Ind_Summary";97;1;"Mt CO2/yr";"kt of CO2";0.001;"Industry Summary|CO2 emissions" +"Emi|CO2|Industry|Direct";"total co2 emissions from fuel combustions";"CO2 emissions (kt of CO2)";"JRC-IDEES-2015_Industry_";"Ind_Summary_emi";37;-1;"Mt CO2/yr";"kt of CO2";0.001;"Industry Summary|CO2 Emissions|All Industrial Sectors|Process emissions " +"Emi|CO2|Industry|Direct";"total co2 emissions from fuel combustions";"All Products";"JRC-IDEES-2015_EmissionBalance_";"cagr";2;1;"Mt CO2/yr";"kt of CO2";0.001;"Emissions|Agriculture+Forestry+Fishing|All Products" +"Emi|CO2|Industry|Direct";"total co2 emissions from fuel combustions";"All Products";"JRC-IDEES-2015_EmissionBalance_";"cenck";2;1;"Mt CO2/yr";"kt of CO2";0.001;"Emissions|Coke Ovens|All Products" +"Emi|CO2|Energy|Demand|Industry";"total co2 emissions from fuel combustions";"CO2 emissions (kt of CO2)";"JRC-IDEES-2015_Industry_";"Ind_Summary";97;1;"Mt CO2/yr";"kt of CO2";0.001;"Industry Summary|CO2 emissions" +"Emi|CO2|Energy|Demand|Industry";"total co2 emissions from fuel combustions";"CO2 emissions (kt of CO2)";"JRC-IDEES-2015_Industry_";"Ind_Summary_emi";37;-1;"Mt CO2/yr";"kt of CO2";0.001;"Industry Summary|CO2 Emissions|All Industrial Sectors|Process emissions " +"Emi|CO2|Energy|Demand|Industry";"total co2 emissions from fuel combustions";"All Products";"JRC-IDEES-2015_EmissionBalance_";"cagr";2;1;"Mt CO2/yr";"kt of CO2";0.001;"Emissions|Agriculture+Forestry+Fishing|All Products" +"Emi|CO2|Energy|Demand|Industry";"total co2 emissions from fuel combustions";"All Products";"JRC-IDEES-2015_EmissionBalance_";"cenck";2;1;"Mt CO2/yr";"kt of CO2";0.001;"Emissions|Coke Ovens|All Products" +"Emi|CO2|Industry|Direct|BeforeTradBiomassCorr";"total co2 emissions from fuel combustions";"CO2 emissions (kt of CO2)";"JRC-IDEES-2015_Industry_";"Ind_Summary";97;1;"Mt CO2/yr";"kt of CO2";0.001;"Industry Summary|CO2 emissions" +"Emi|CO2|Industry|Direct|BeforeTradBiomassCorr";"total co2 emissions from fuel combustions";"CO2 emissions (kt of CO2)";"JRC-IDEES-2015_Industry_";"Ind_Summary_emi";37;-1;"Mt CO2/yr";"kt of CO2";0.001;"Industry Summary|CO2 Emissions|All Industrial Sectors|Process emissions " +"Emi|CO2|Industry|Direct|BeforeTradBiomassCorr";"total co2 emissions from fuel combustions";"All Products";"JRC-IDEES-2015_EmissionBalance_";"cagr";2;1;"Mt CO2/yr";"kt of CO2";0.001;"Emissions|Agriculture+Forestry+Fishing|All Products" +"Emi|CO2|Industry|Direct|BeforeTradBiomassCorr";"total co2 emissions from fuel combustions";"All Products";"JRC-IDEES-2015_EmissionBalance_";"cenck";2;1;"Mt CO2/yr";"kt of CO2";0.001;"Emissions|Coke Ovens|All Products" +"Emi|CO2|Fossil Fuels and Industry|Cement process";"process co2 emissions from cement";"Process emissions";"JRC-IDEES-2015_Industry_";"NMM_emi";45;1;"Mt CO2/yr";"kt of CO2";0.001;"Non-metallic mineral products|CO2 Emissions|Cement|Process emissions" +"Emi|CO2|FFaI|Industry|Cement|Process";"process co2 emissions from cement";"Process emissions";"JRC-IDEES-2015_Industry_";"NMM_emi";45;1;"Mt CO2/yr";"kt of CO2";0.001;"Non-metallic mineral products|CO2 Emissions|Cement|Process emissions" +"Emi|CO2|FFaI|Industry|Process";"total process CO2 emissions";"Process emissions";"JRC-IDEES-2015_Industry_";"Ind_Summary_emi";37;1;"Mt CO2/yr";"kt of CO2";0.001;"Industry Summary|CO2 Emissions|All Industrial Sectors|Process emissions " +"Emissions|CO2|Industrial Processes";"total process CO2 emissions";"Process emissions";"JRC-IDEES-2015_Industry_";"Ind_Summary_emi";37;1;"Mt CO2/yr";"kt of CO2";0.001;"Industry Summary|CO2 Emissions|All Industrial Sectors|Process emissions " +"Emi|CO2|Industry|Chemicals process ";"process co2 emissions from chemicals";"Process emissions";"JRC-IDEES-2015_Industry_";"CHI_emi";58;1;"Mt CO2/yr";"kt of CO2";0.001;"Chemicals Industry|CO2 Emissions|Basic chemicals|Process emissions" +"Emi|CO2|Industry|Chemicals process ";"process co2 emissions from chemicals";"Process emissions";"JRC-IDEES-2015_Industry_";"CHI_emi";106;1;"Mt CO2/yr";"kt of CO2";0.001;"Chemicals Industry|CO2 Emissions|Other chemicals|Chemicals: Process emissions" +"Emi|CO2|Industry|Steel process ";"process co2 emissions from steel";"Process emissions";"JRC-IDEES-2015_Industry_";"ISI_emi";51;1;"Mt CO2/yr";"kt of CO2";0.001;"Iron and Steel|CO2 Emissions|Integrated steelworks|Process emissions" +"Emi|CO2|Industry|Steel process ";"process co2 emissions from steel";"Process emissions";"JRC-IDEES-2015_Industry_";"ISI_emi";94;1;"Mt CO2/yr";"kt of CO2";0.001;"Iron and Steel|CO2 Emissions|Electric arc|Process emissions" +"Emi|CO2|Industry|Non-ferrous metals process ";"process co2 emissions non-ferrous metals";"Process emissions";"JRC-IDEES-2015_Industry_";"Ind_Summary_emi";39;1;"Mt CO2/yr";"kt of CO2";0.001;"Industry Summary|CO2 Emissions|All Industrial Sectors|Process emissions|Non-Ferrous Metals" +"Emi|CO2|Industry|Non-metallic minerals process ";"process co2 emissions from non-metallic minerals";"Process emissions";"JRC-IDEES-2015_Industry_";"Ind_Summary_emi";41;1;"Mt CO2/yr";"kt of CO2";0.001;"Industry Summary|CO2 Emissions|All Industrial Sectors|Process emissions|Non-Metallic Minerals" +"Emi|CO2|Industry|other process ";"process co2 solvent and other";"Process emissions";"JRC-IDEES-2015_Industry_";"Ind_Summary_emi";42;1;"Mt CO2/yr";"kt of CO2";0.001;"Industry Summary|CO2 Emissions|All Industrial Sectors|Process emissions|Solvent use and other process" diff --git a/inst/extdata/reportingVariables/Mapping_JRC_IDEES_REMIND_ResCom.csv b/inst/extdata/reportingVariables/Mapping_JRC_IDEES_REMIND_ResCom.csv new file mode 100755 index 00000000..c1463c9f --- /dev/null +++ b/inst/extdata/reportingVariables/Mapping_JRC_IDEES_REMIND_ResCom.csv @@ -0,0 +1,7 @@ +REMIND_variable;JRC_complete;JRC_Excel;JRC_spreadsheet;Weight;Unit_REMIND;Unit_JRC;Factor +Emi|CO2|Energy|Demand|Buildings;Residential|CO2 emissions;JRC-IDEES-2015_Residential_;RES_hh_emi;1;Mt CO2/yr;kt of CO2;0.001 +Emi|CO2|Energy|Demand|Buildings;Tertiary|CO2 emissions;JRC-IDEES-2015_Tertiary_;SER_hh_emi;1;Mt CO2/yr;kt of CO2;0.001 +FE|Buildings;Residential|Final energy consumption|Thermal uses;JRC-IDEES-2015_Residential_;RES_hh_fec;1;EJ/yr;ktoe;4.19E-05 +FE|Buildings;Tertiary|Final energy consumption|Thermal uses;JRC-IDEES-2015_Tertiary_;SER_hh_fec;1;EJ/yr;ktoe;4.19E-05 +FE|Buildings;Residential|Final energy consumption|Specific electric uses in services;JRC-IDEES-2015_Residential_;RES_se-appl;1;EJ/yr;ktoe;4.19E-05 +FE|Buildings;Tertiary|Final energy consumption|Specific electric uses in services;JRC-IDEES-2015_Tertiary_;SER_se-appl;1;EJ/yr;ktoe;4.19E-05 diff --git a/inst/extdata/reportingVariables/Mapping_JRC_IDEES_REMIND_Transport.csv b/inst/extdata/reportingVariables/Mapping_JRC_IDEES_REMIND_Transport.csv new file mode 100755 index 00000000..44dbe25b --- /dev/null +++ b/inst/extdata/reportingVariables/Mapping_JRC_IDEES_REMIND_Transport.csv @@ -0,0 +1,1827 @@ +"REMIND_variable";"JRC_complete";"JRC_Excel";"JRC_spreadsheet";"Weight";"Unit_REMIND";"Unit_JRC";"Factor" +"Emi|CO2|Transport";"Transport|CO2 emissions|Passenger transport|Road transport|Powered 2-wheelers";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport";"Transport|CO2 emissions|Passenger transport|Road transport|Passenger cars";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport";"Transport|CO2 emissions|Passenger transport|Road transport|Motor coaches, buses and trolley buses";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport";"Transport|CO2 emissions|Passenger transport|Rail, metro and tram|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport";"Transport|CO2 emissions|Passenger transport|Rail, metro and tram|Conventional passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport";"Transport|CO2 emissions|Passenger transport|Rail, metro and tram|High speed passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport";"Transport|CO2 emissions|Passenger transport|Aviation|Domestic";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport";"Transport|CO2 emissions|Passenger transport|Aviation|International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport";"Transport|CO2 emissions|Passenger transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport";"Transport|CO2 emissions|Freight transport|Road transport|Light duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport";"Transport|CO2 emissions|Freight transport|Road transport|Heavy duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport";"Transport|CO2 emissions|Freight transport|Rail transport";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport";"Transport|CO2 emissions|Freight transport|Aviation|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport";"Transport|CO2 emissions|Freight transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport";"Transport|CO2 emissions|Freight transport|Coastal shipping and inland waterways|Domestic coastal shipping";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport";"Transport|CO2 emissions|Freight transport|Coastal shipping and inland waterways|Inland waterways";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"FE|Transport";"Transport|Energy consumption|Passenger transport|Road transport|Powered 2-wheelers";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport";"Transport|Energy consumption|Passenger transport|Road transport|Passenger cars";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport";"Transport|Energy consumption|Passenger transport|Road transport|Motor coaches, buses and trolley buses";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport";"Transport|Energy consumption|Passenger transport|Rail, metro and tram|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport";"Transport|Energy consumption|Passenger transport|Rail, metro and tram|Conventional passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport";"Transport|Energy consumption|Passenger transport|Rail, metro and tram|High speed passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport";"Transport|Energy consumption|Passenger transport|Aviation|Domestic";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport";"Transport|Energy consumption|Passenger transport|Aviation|International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport";"Transport|Energy consumption|Passenger transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport";"Transport|Energy consumption|Freight transport|Road transport|Light duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport";"Transport|Energy consumption|Freight transport|Road transport|Heavy duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport";"Transport|Energy consumption|Freight transport|Rail transport";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport";"Transport|Energy consumption|Freight transport|Aviation|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport";"Transport|Energy consumption|Freight transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport";"Transport|Energy consumption|Freight transport|Coastal shipping and inland waterways|Domestic coastal shipping";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport";"Transport|Energy consumption|Freight transport|Coastal shipping and inland waterways|Inland waterways";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport";"Maritime Bunkers|Energy Consumption|Total energy consumption|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport";"Maritime Bunkers|Energy Consumption|Total energy consumption|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"Emi|CO2|Transport|w/o Bunkers";"Transport|CO2 emissions|Passenger transport|Road transport|Powered 2-wheelers";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers";"Transport|CO2 emissions|Passenger transport|Road transport|Passenger cars";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers";"Transport|CO2 emissions|Passenger transport|Road transport|Motor coaches, buses and trolley buses";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers";"Transport|CO2 emissions|Passenger transport|Rail, metro and tram|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers";"Transport|CO2 emissions|Passenger transport|Rail, metro and tram|Conventional passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers";"Transport|CO2 emissions|Passenger transport|Rail, metro and tram|High speed passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers";"Transport|CO2 emissions|Passenger transport|Aviation|Domestic";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers";"Transport|CO2 emissions|Passenger transport|Aviation|International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Bunkers";"Transport|CO2 emissions|Passenger transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers";"Transport|CO2 emissions|Freight transport|Road transport|Light duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers";"Transport|CO2 emissions|Freight transport|Road transport|Heavy duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers";"Transport|CO2 emissions|Freight transport|Rail transport";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers";"Transport|CO2 emissions|Freight transport|Aviation|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Bunkers";"Transport|CO2 emissions|Freight transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Bunkers";"Transport|CO2 emissions|Freight transport|Coastal shipping and inland waterways|Domestic coastal shipping";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Bunkers";"Transport|CO2 emissions|Freight transport|Coastal shipping and inland waterways|Inland waterways";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Bunkers";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Bunkers";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"FE|Transport|w/o Bunkers";"Transport|Energy consumption|Passenger transport|Road transport|Powered 2-wheelers";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers";"Transport|Energy consumption|Passenger transport|Road transport|Passenger cars";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers";"Transport|Energy consumption|Passenger transport|Road transport|Motor coaches, buses and trolley buses";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers";"Transport|Energy consumption|Passenger transport|Rail, metro and tram|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers";"Transport|Energy consumption|Passenger transport|Rail, metro and tram|Conventional passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers";"Transport|Energy consumption|Passenger transport|Rail, metro and tram|High speed passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers";"Transport|Energy consumption|Passenger transport|Aviation|Domestic";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers";"Transport|Energy consumption|Passenger transport|Aviation|International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Bunkers";"Transport|Energy consumption|Passenger transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers";"Transport|Energy consumption|Freight transport|Road transport|Light duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers";"Transport|Energy consumption|Freight transport|Road transport|Heavy duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers";"Transport|Energy consumption|Freight transport|Rail transport";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers";"Transport|Energy consumption|Freight transport|Aviation|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Bunkers";"Transport|Energy consumption|Freight transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Bunkers";"Transport|Energy consumption|Freight transport|Coastal shipping and inland waterways|Domestic coastal shipping";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Bunkers";"Transport|Energy consumption|Freight transport|Coastal shipping and inland waterways|Inland waterways";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Bunkers";"Maritime Bunkers|Energy Consumption|Total energy consumption|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Bunkers";"Maritime Bunkers|Energy Consumption|Total energy consumption|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"Emi|CO2|Transport|Pass";"Transport|CO2 emissions|Passenger transport|Road transport|Powered 2-wheelers";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass";"Transport|CO2 emissions|Passenger transport|Road transport|Passenger cars";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass";"Transport|CO2 emissions|Passenger transport|Road transport|Motor coaches, buses and trolley buses";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass";"Transport|CO2 emissions|Passenger transport|Rail, metro and tram|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass";"Transport|CO2 emissions|Passenger transport|Rail, metro and tram|Conventional passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass";"Transport|CO2 emissions|Passenger transport|Rail, metro and tram|High speed passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass";"Transport|CO2 emissions|Passenger transport|Aviation|Domestic";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass";"Transport|CO2 emissions|Passenger transport|Aviation|International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass";"Transport|CO2 emissions|Passenger transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight";"Transport|CO2 emissions|Freight transport|Road transport|Light duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight";"Transport|CO2 emissions|Freight transport|Road transport|Heavy duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight";"Transport|CO2 emissions|Freight transport|Rail transport";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight";"Transport|CO2 emissions|Freight transport|Aviation|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight";"Transport|CO2 emissions|Freight transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight";"Transport|CO2 emissions|Freight transport|Coastal shipping and inland waterways|Domestic coastal shipping";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight";"Transport|CO2 emissions|Freight transport|Coastal shipping and inland waterways|Inland waterways";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"FE|Transport|Pass";"Transport|Energy consumption|Passenger transport|Road transport|Powered 2-wheelers";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass";"Transport|Energy consumption|Passenger transport|Road transport|Passenger cars";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass";"Transport|Energy consumption|Passenger transport|Road transport|Motor coaches, buses and trolley buses";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass";"Transport|Energy consumption|Passenger transport|Rail, metro and tram|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass";"Transport|Energy consumption|Passenger transport|Rail, metro and tram|Conventional passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass";"Transport|Energy consumption|Passenger transport|Rail, metro and tram|High speed passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass";"Transport|Energy consumption|Passenger transport|Aviation|Domestic";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass";"Transport|Energy consumption|Passenger transport|Aviation|International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass";"Transport|Energy consumption|Passenger transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight";"Transport|Energy consumption|Freight transport|Road transport|Light duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight";"Transport|Energy consumption|Freight transport|Road transport|Heavy duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight";"Transport|Energy consumption|Freight transport|Rail transport";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight";"Transport|Energy consumption|Freight transport|Aviation|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight";"Transport|Energy consumption|Freight transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight";"Transport|Energy consumption|Freight transport|Coastal shipping and inland waterways|Domestic coastal shipping";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight";"Transport|Energy consumption|Freight transport|Coastal shipping and inland waterways|Inland waterways";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight";"Maritime Bunkers|Energy Consumption|Total energy consumption|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight";"Maritime Bunkers|Energy Consumption|Total energy consumption|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"Emi|CO2|Transport|Pass|w/o Bunkers";"Transport|CO2 emissions|Passenger transport|Road transport|Powered 2-wheelers";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|w/o Bunkers";"Transport|CO2 emissions|Passenger transport|Road transport|Passenger cars";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|w/o Bunkers";"Transport|CO2 emissions|Passenger transport|Road transport|Motor coaches, buses and trolley buses";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|w/o Bunkers";"Transport|CO2 emissions|Passenger transport|Rail, metro and tram|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|w/o Bunkers";"Transport|CO2 emissions|Passenger transport|Rail, metro and tram|Conventional passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|w/o Bunkers";"Transport|CO2 emissions|Passenger transport|Rail, metro and tram|High speed passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|w/o Bunkers";"Transport|CO2 emissions|Passenger transport|Aviation|Domestic";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|w/o Bunkers";"Transport|CO2 emissions|Passenger transport|Aviation|International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Bunkers";"Transport|CO2 emissions|Passenger transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|w/o Bunkers";"Transport|CO2 emissions|Freight transport|Road transport|Light duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|w/o Bunkers";"Transport|CO2 emissions|Freight transport|Road transport|Heavy duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|w/o Bunkers";"Transport|CO2 emissions|Freight transport|Rail transport";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|w/o Bunkers";"Transport|CO2 emissions|Freight transport|Aviation|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Bunkers";"Transport|CO2 emissions|Freight transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Bunkers";"Transport|CO2 emissions|Freight transport|Coastal shipping and inland waterways|Domestic coastal shipping";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Bunkers";"Transport|CO2 emissions|Freight transport|Coastal shipping and inland waterways|Inland waterways";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Bunkers";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Bunkers";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"FE|Transport|Pass|w/o Bunkers";"Transport|Energy consumption|Passenger transport|Road transport|Powered 2-wheelers";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers";"Transport|Energy consumption|Passenger transport|Road transport|Passenger cars";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers";"Transport|Energy consumption|Passenger transport|Road transport|Motor coaches, buses and trolley buses";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers";"Transport|Energy consumption|Passenger transport|Rail, metro and tram|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers";"Transport|Energy consumption|Passenger transport|Rail, metro and tram|Conventional passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers";"Transport|Energy consumption|Passenger transport|Rail, metro and tram|High speed passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers";"Transport|Energy consumption|Passenger transport|Aviation|Domestic";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers";"Transport|Energy consumption|Passenger transport|Aviation|International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Bunkers";"Transport|Energy consumption|Passenger transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|w/o Bunkers";"Transport|Energy consumption|Freight transport|Road transport|Light duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|w/o Bunkers";"Transport|Energy consumption|Freight transport|Road transport|Heavy duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|w/o Bunkers";"Transport|Energy consumption|Freight transport|Rail transport";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|w/o Bunkers";"Transport|Energy consumption|Freight transport|Aviation|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Bunkers";"Transport|Energy consumption|Freight transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Bunkers";"Transport|Energy consumption|Freight transport|Coastal shipping and inland waterways|Domestic coastal shipping";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Bunkers";"Transport|Energy consumption|Freight transport|Coastal shipping and inland waterways|Inland waterways";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Bunkers";"Maritime Bunkers|Energy Consumption|Total energy consumption|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Bunkers";"Maritime Bunkers|Energy Consumption|Total energy consumption|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"Emi|CO2|Transport|Pass|Road";"Transport|CO2 emissions|Passenger transport|Road transport|Powered 2-wheelers";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Road";"Transport|CO2 emissions|Passenger transport|Road transport|Passenger cars";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Road";"Transport|CO2 emissions|Passenger transport|Road transport|Motor coaches, buses and trolley buses";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Train";"Transport|CO2 emissions|Passenger transport|Rail, metro and tram|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Train";"Transport|CO2 emissions|Passenger transport|Rail, metro and tram|Conventional passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Train";"Transport|CO2 emissions|Passenger transport|Rail, metro and tram|High speed passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Aviation";"Transport|CO2 emissions|Passenger transport|Aviation|Domestic";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Aviation";"Transport|CO2 emissions|Passenger transport|Aviation|International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Aviation";"Transport|CO2 emissions|Passenger transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Road";"Transport|CO2 emissions|Freight transport|Road transport|Light duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Road";"Transport|CO2 emissions|Freight transport|Road transport|Heavy duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Train";"Transport|CO2 emissions|Freight transport|Rail transport";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Aviation";"Transport|CO2 emissions|Freight transport|Aviation|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Aviation";"Transport|CO2 emissions|Freight transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Shipping";"Transport|CO2 emissions|Freight transport|Coastal shipping and inland waterways|Domestic coastal shipping";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Shipping";"Transport|CO2 emissions|Freight transport|Coastal shipping and inland waterways|Inland waterways";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Shipping";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Shipping";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"FE|Transport|Pass|Road";"Transport|Energy consumption|Passenger transport|Road transport|Powered 2-wheelers";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road";"Transport|Energy consumption|Passenger transport|Road transport|Passenger cars";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road";"Transport|Energy consumption|Passenger transport|Road transport|Motor coaches, buses and trolley buses";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Train";"Transport|Energy consumption|Passenger transport|Rail, metro and tram|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Train";"Transport|Energy consumption|Passenger transport|Rail, metro and tram|Conventional passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Train";"Transport|Energy consumption|Passenger transport|Rail, metro and tram|High speed passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Aviation";"Transport|Energy consumption|Passenger transport|Aviation|Domestic";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Aviation";"Transport|Energy consumption|Passenger transport|Aviation|International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Aviation";"Transport|Energy consumption|Passenger transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road";"Transport|Energy consumption|Freight transport|Road transport|Light duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road";"Transport|Energy consumption|Freight transport|Road transport|Heavy duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Train";"Transport|Energy consumption|Freight transport|Rail transport";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Aviation";"Transport|Energy consumption|Freight transport|Aviation|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Aviation";"Transport|Energy consumption|Freight transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping";"Transport|Energy consumption|Freight transport|Coastal shipping and inland waterways|Domestic coastal shipping";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping";"Transport|Energy consumption|Freight transport|Coastal shipping and inland waterways|Inland waterways";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping";"Maritime Bunkers|Energy Consumption|Total energy consumption|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping";"Maritime Bunkers|Energy Consumption|Total energy consumption|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"Emi|CO2|Transport|Pass|Road|LDV";"Transport|CO2 emissions|Passenger transport|Road transport|Powered 2-wheelers";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Road|LDV";"Transport|CO2 emissions|Passenger transport|Road transport|Passenger cars";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Road|non-LDV";"Transport|CO2 emissions|Passenger transport|Road transport|Motor coaches, buses and trolley buses";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Train|Urban";"Transport|CO2 emissions|Passenger transport|Rail, metro and tram|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Train|Low Speed";"Transport|CO2 emissions|Passenger transport|Rail, metro and tram|Conventional passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Train|High Speed";"Transport|CO2 emissions|Passenger transport|Rail, metro and tram|High speed passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Aviation|Domestic";"Transport|CO2 emissions|Passenger transport|Aviation|Domestic";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Aviation|within EU";"Transport|CO2 emissions|Passenger transport|Aviation|International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Aviation|extra EU";"Transport|CO2 emissions|Passenger transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Road|LDV";"Transport|CO2 emissions|Freight transport|Road transport|Light duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Road|non-LDV";"Transport|CO2 emissions|Freight transport|Road transport|Heavy duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Train|Conventional";"Transport|CO2 emissions|Freight transport|Rail transport";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Aviation|within EU";"Transport|CO2 emissions|Freight transport|Aviation|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Aviation|extra EU";"Transport|CO2 emissions|Freight transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Shipping|Domestic";"Transport|CO2 emissions|Freight transport|Coastal shipping and inland waterways|Domestic coastal shipping";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Shipping|Domestic";"Transport|CO2 emissions|Freight transport|Coastal shipping and inland waterways|Inland waterways";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Shipping|within EU";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Shipping|extra EU";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"FE|Transport|Pass|Road|LDV";"Transport|Energy consumption|Passenger transport|Road transport|Powered 2-wheelers";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|LDV";"Transport|Energy consumption|Passenger transport|Road transport|Passenger cars";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|non-LDV";"Transport|Energy consumption|Passenger transport|Road transport|Motor coaches, buses and trolley buses";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Train|Urban";"Transport|Energy consumption|Passenger transport|Rail, metro and tram|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Train|Low Speed";"Transport|Energy consumption|Passenger transport|Rail, metro and tram|Conventional passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Train|High Speed";"Transport|Energy consumption|Passenger transport|Rail, metro and tram|High speed passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Aviation|Domestic";"Transport|Energy consumption|Passenger transport|Aviation|Domestic";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Aviation|within EU";"Transport|Energy consumption|Passenger transport|Aviation|International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Aviation|extra EU";"Transport|Energy consumption|Passenger transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|LDV";"Transport|Energy consumption|Freight transport|Road transport|Light duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|non-LDV";"Transport|Energy consumption|Freight transport|Road transport|Heavy duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Train|Conventional";"Transport|Energy consumption|Freight transport|Rail transport";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Aviation|within EU";"Transport|Energy consumption|Freight transport|Aviation|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Aviation|extra EU";"Transport|Energy consumption|Freight transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|Domestic";"Transport|Energy consumption|Freight transport|Coastal shipping and inland waterways|Domestic coastal shipping";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|Domestic";"Transport|Energy consumption|Freight transport|Coastal shipping and inland waterways|Inland waterways";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|within EU";"Maritime Bunkers|Energy Consumption|Total energy consumption|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|extra EU";"Maritime Bunkers|Energy Consumption|Total energy consumption|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"Emi|CO2|Transport|LDV";"Transport|CO2 emissions|Passenger transport|Road transport|Powered 2-wheelers";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV";"Transport|CO2 emissions|Passenger transport|Road transport|Passenger cars";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV";"Transport|CO2 emissions|Passenger transport|Road transport|Motor coaches, buses and trolley buses";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV";"Transport|CO2 emissions|Passenger transport|Rail, metro and tram|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV";"Transport|CO2 emissions|Passenger transport|Rail, metro and tram|Conventional passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV";"Transport|CO2 emissions|Passenger transport|Rail, metro and tram|High speed passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV";"Transport|CO2 emissions|Passenger transport|Aviation|Domestic";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV";"Transport|CO2 emissions|Passenger transport|Aviation|International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV";"Transport|CO2 emissions|Passenger transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV";"Transport|CO2 emissions|Freight transport|Road transport|Light duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV";"Transport|CO2 emissions|Freight transport|Road transport|Heavy duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV";"Transport|CO2 emissions|Freight transport|Rail transport";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV";"Transport|CO2 emissions|Freight transport|Aviation|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV";"Transport|CO2 emissions|Freight transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV";"Transport|CO2 emissions|Freight transport|Coastal shipping and inland waterways|Domestic coastal shipping";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV";"Transport|CO2 emissions|Freight transport|Coastal shipping and inland waterways|Inland waterways";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"FE|Transport|LDV";"Transport|Energy consumption|Passenger transport|Road transport|Powered 2-wheelers";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV";"Transport|Energy consumption|Passenger transport|Road transport|Passenger cars";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV";"Transport|Energy consumption|Passenger transport|Road transport|Motor coaches, buses and trolley buses";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV";"Transport|Energy consumption|Passenger transport|Rail, metro and tram|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV";"Transport|Energy consumption|Passenger transport|Rail, metro and tram|Conventional passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV";"Transport|Energy consumption|Passenger transport|Rail, metro and tram|High speed passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV";"Transport|Energy consumption|Passenger transport|Aviation|Domestic";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV";"Transport|Energy consumption|Passenger transport|Aviation|International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV";"Transport|Energy consumption|Passenger transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV";"Transport|Energy consumption|Freight transport|Road transport|Light duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV";"Transport|Energy consumption|Freight transport|Road transport|Heavy duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV";"Transport|Energy consumption|Freight transport|Rail transport";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV";"Transport|Energy consumption|Freight transport|Aviation|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV";"Transport|Energy consumption|Freight transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV";"Transport|Energy consumption|Freight transport|Coastal shipping and inland waterways|Domestic coastal shipping";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV";"Transport|Energy consumption|Freight transport|Coastal shipping and inland waterways|Inland waterways";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV";"Maritime Bunkers|Energy Consumption|Total energy consumption|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV";"Maritime Bunkers|Energy Consumption|Total energy consumption|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"Emi|CO2|Transport|LDV|w/o Bunkers";"Transport|CO2 emissions|Passenger transport|Road transport|Powered 2-wheelers";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|w/o Bunkers";"Transport|CO2 emissions|Passenger transport|Road transport|Passenger cars";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|w/o Bunkers";"Transport|CO2 emissions|Passenger transport|Road transport|Motor coaches, buses and trolley buses";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|w/o Bunkers";"Transport|CO2 emissions|Passenger transport|Rail, metro and tram|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|w/o Bunkers";"Transport|CO2 emissions|Passenger transport|Rail, metro and tram|Conventional passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|w/o Bunkers";"Transport|CO2 emissions|Passenger transport|Rail, metro and tram|High speed passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|w/o Bunkers";"Transport|CO2 emissions|Passenger transport|Aviation|Domestic";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|w/o Bunkers";"Transport|CO2 emissions|Passenger transport|Aviation|International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Bunkers";"Transport|CO2 emissions|Passenger transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|w/o Bunkers";"Transport|CO2 emissions|Freight transport|Road transport|Light duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|w/o Bunkers";"Transport|CO2 emissions|Freight transport|Road transport|Heavy duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|w/o Bunkers";"Transport|CO2 emissions|Freight transport|Rail transport";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|w/o Bunkers";"Transport|CO2 emissions|Freight transport|Aviation|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Bunkers";"Transport|CO2 emissions|Freight transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Bunkers";"Transport|CO2 emissions|Freight transport|Coastal shipping and inland waterways|Domestic coastal shipping";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Bunkers";"Transport|CO2 emissions|Freight transport|Coastal shipping and inland waterways|Inland waterways";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Bunkers";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Bunkers";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"FE|Transport|LDV|w/o Bunkers";"Transport|Energy consumption|Passenger transport|Road transport|Powered 2-wheelers";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers";"Transport|Energy consumption|Passenger transport|Road transport|Passenger cars";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers";"Transport|Energy consumption|Passenger transport|Road transport|Motor coaches, buses and trolley buses";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers";"Transport|Energy consumption|Passenger transport|Rail, metro and tram|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers";"Transport|Energy consumption|Passenger transport|Rail, metro and tram|Conventional passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers";"Transport|Energy consumption|Passenger transport|Rail, metro and tram|High speed passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers";"Transport|Energy consumption|Passenger transport|Aviation|Domestic";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers";"Transport|Energy consumption|Passenger transport|Aviation|International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Bunkers";"Transport|Energy consumption|Passenger transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers";"Transport|Energy consumption|Freight transport|Road transport|Light duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers";"Transport|Energy consumption|Freight transport|Road transport|Heavy duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers";"Transport|Energy consumption|Freight transport|Rail transport";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers";"Transport|Energy consumption|Freight transport|Aviation|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Bunkers";"Transport|Energy consumption|Freight transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Bunkers";"Transport|Energy consumption|Freight transport|Coastal shipping and inland waterways|Domestic coastal shipping";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Bunkers";"Transport|Energy consumption|Freight transport|Coastal shipping and inland waterways|Inland waterways";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Bunkers";"Maritime Bunkers|Energy Consumption|Total energy consumption|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Bunkers";"Maritime Bunkers|Energy Consumption|Total energy consumption|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"Emi|CO2|Transport|ESD";"Transport|CO2 emissions|Passenger transport|Road transport|Powered 2-wheelers";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD";"Transport|CO2 emissions|Passenger transport|Road transport|Passenger cars";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD";"Transport|CO2 emissions|Passenger transport|Road transport|Motor coaches, buses and trolley buses";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD";"Transport|CO2 emissions|Passenger transport|Rail, metro and tram|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD";"Transport|CO2 emissions|Passenger transport|Rail, metro and tram|Conventional passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD";"Transport|CO2 emissions|Passenger transport|Rail, metro and tram|High speed passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD";"Transport|CO2 emissions|Passenger transport|Aviation|Domestic";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD";"Transport|CO2 emissions|Passenger transport|Aviation|International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Other";"Transport|CO2 emissions|Passenger transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD";"Transport|CO2 emissions|Freight transport|Road transport|Light duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD";"Transport|CO2 emissions|Freight transport|Road transport|Heavy duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD";"Transport|CO2 emissions|Freight transport|Rail transport";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD";"Transport|CO2 emissions|Freight transport|Aviation|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Other";"Transport|CO2 emissions|Freight transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Other";"Transport|CO2 emissions|Freight transport|Coastal shipping and inland waterways|Domestic coastal shipping";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Other";"Transport|CO2 emissions|Freight transport|Coastal shipping and inland waterways|Inland waterways";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Other";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Other";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"FE|Transport|ESD";"Transport|Energy consumption|Passenger transport|Road transport|Powered 2-wheelers";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD";"Transport|Energy consumption|Passenger transport|Road transport|Passenger cars";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD";"Transport|Energy consumption|Passenger transport|Road transport|Motor coaches, buses and trolley buses";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD";"Transport|Energy consumption|Passenger transport|Rail, metro and tram|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD";"Transport|Energy consumption|Passenger transport|Rail, metro and tram|Conventional passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD";"Transport|Energy consumption|Passenger transport|Rail, metro and tram|High speed passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ETS";"Transport|Energy consumption|Passenger transport|Aviation|Domestic";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ETS";"Transport|Energy consumption|Passenger transport|Aviation|International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Other";"Transport|Energy consumption|Passenger transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD";"Transport|Energy consumption|Freight transport|Road transport|Light duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD";"Transport|Energy consumption|Freight transport|Road transport|Heavy duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD";"Transport|Energy consumption|Freight transport|Rail transport";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ETS";"Transport|Energy consumption|Freight transport|Aviation|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Other";"Transport|Energy consumption|Freight transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Other";"Transport|Energy consumption|Freight transport|Coastal shipping and inland waterways|Domestic coastal shipping";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Other";"Transport|Energy consumption|Freight transport|Coastal shipping and inland waterways|Inland waterways";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Other";"Maritime Bunkers|Energy Consumption|Total energy consumption|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Other";"Maritime Bunkers|Energy Consumption|Total energy consumption|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"Emi|CO2|Transport|LDV|ESD";"Transport|CO2 emissions|Passenger transport|Road transport|Powered 2-wheelers";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|ESD";"Transport|CO2 emissions|Passenger transport|Road transport|Passenger cars";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|ESD";"Transport|CO2 emissions|Passenger transport|Road transport|Motor coaches, buses and trolley buses";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|ESD";"Transport|CO2 emissions|Passenger transport|Rail, metro and tram|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|ESD";"Transport|CO2 emissions|Passenger transport|Rail, metro and tram|Conventional passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|ESD";"Transport|CO2 emissions|Passenger transport|Rail, metro and tram|High speed passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|ESD";"Transport|CO2 emissions|Passenger transport|Aviation|Domestic";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|ESD";"Transport|CO2 emissions|Passenger transport|Aviation|International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Other";"Transport|CO2 emissions|Passenger transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|ESD";"Transport|CO2 emissions|Freight transport|Road transport|Light duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|ESD";"Transport|CO2 emissions|Freight transport|Road transport|Heavy duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|ESD";"Transport|CO2 emissions|Freight transport|Rail transport";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|ESD";"Transport|CO2 emissions|Freight transport|Aviation|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Other";"Transport|CO2 emissions|Freight transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Other";"Transport|CO2 emissions|Freight transport|Coastal shipping and inland waterways|Domestic coastal shipping";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Other";"Transport|CO2 emissions|Freight transport|Coastal shipping and inland waterways|Inland waterways";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Other";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Other";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"FE|Transport|LDV|ESD";"Transport|Energy consumption|Passenger transport|Road transport|Powered 2-wheelers";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD";"Transport|Energy consumption|Passenger transport|Road transport|Passenger cars";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD";"Transport|Energy consumption|Passenger transport|Road transport|Motor coaches, buses and trolley buses";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD";"Transport|Energy consumption|Passenger transport|Rail, metro and tram|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD";"Transport|Energy consumption|Passenger transport|Rail, metro and tram|Conventional passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD";"Transport|Energy consumption|Passenger transport|Rail, metro and tram|High speed passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ETS";"Transport|Energy consumption|Passenger transport|Aviation|Domestic";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ETS";"Transport|Energy consumption|Passenger transport|Aviation|International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Other";"Transport|Energy consumption|Passenger transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD";"Transport|Energy consumption|Freight transport|Road transport|Light duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD";"Transport|Energy consumption|Freight transport|Road transport|Heavy duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD";"Transport|Energy consumption|Freight transport|Rail transport";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ETS";"Transport|Energy consumption|Freight transport|Aviation|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Other";"Transport|Energy consumption|Freight transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Other";"Transport|Energy consumption|Freight transport|Coastal shipping and inland waterways|Domestic coastal shipping";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Other";"Transport|Energy consumption|Freight transport|Coastal shipping and inland waterways|Inland waterways";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Other";"Maritime Bunkers|Energy Consumption|Total energy consumption|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Other";"Maritime Bunkers|Energy Consumption|Total energy consumption|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"Emi|CO2|Transport|Pass|ESD";"Transport|CO2 emissions|Passenger transport|Road transport|Powered 2-wheelers";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|ESD";"Transport|CO2 emissions|Passenger transport|Road transport|Passenger cars";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|ESD";"Transport|CO2 emissions|Passenger transport|Road transport|Motor coaches, buses and trolley buses";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|ESD";"Transport|CO2 emissions|Passenger transport|Rail, metro and tram|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|ESD";"Transport|CO2 emissions|Passenger transport|Rail, metro and tram|Conventional passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|ESD";"Transport|CO2 emissions|Passenger transport|Rail, metro and tram|High speed passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|ESD";"Transport|CO2 emissions|Passenger transport|Aviation|Domestic";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|ESD";"Transport|CO2 emissions|Passenger transport|Aviation|International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Other";"Transport|CO2 emissions|Passenger transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|ESD";"Transport|CO2 emissions|Freight transport|Road transport|Light duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|ESD";"Transport|CO2 emissions|Freight transport|Road transport|Heavy duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|ESD";"Transport|CO2 emissions|Freight transport|Rail transport";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|ESD";"Transport|CO2 emissions|Freight transport|Aviation|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Other";"Transport|CO2 emissions|Freight transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Other";"Transport|CO2 emissions|Freight transport|Coastal shipping and inland waterways|Domestic coastal shipping";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Other";"Transport|CO2 emissions|Freight transport|Coastal shipping and inland waterways|Inland waterways";"JRC-IDEES-2015_Transport_";"Transport";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Other";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Other";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"FE|Transport|Pass|ESD";"Transport|Energy consumption|Passenger transport|Road transport|Powered 2-wheelers";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD";"Transport|Energy consumption|Passenger transport|Road transport|Passenger cars";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD";"Transport|Energy consumption|Passenger transport|Road transport|Motor coaches, buses and trolley buses";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD";"Transport|Energy consumption|Passenger transport|Rail, metro and tram|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD";"Transport|Energy consumption|Passenger transport|Rail, metro and tram|Conventional passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD";"Transport|Energy consumption|Passenger transport|Rail, metro and tram|High speed passenger trains";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ETS";"Transport|Energy consumption|Passenger transport|Aviation|Domestic";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ETS";"Transport|Energy consumption|Passenger transport|Aviation|International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Other";"Transport|Energy consumption|Passenger transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|ESD";"Transport|Energy consumption|Freight transport|Road transport|Light duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|ESD";"Transport|Energy consumption|Freight transport|Road transport|Heavy duty vehicles";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|ESD";"Transport|Energy consumption|Freight transport|Rail transport";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|ETS";"Transport|Energy consumption|Freight transport|Aviation|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Other";"Transport|Energy consumption|Freight transport|Aviation|International - Extra-EU";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Other";"Transport|Energy consumption|Freight transport|Coastal shipping and inland waterways|Domestic coastal shipping";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Other";"Transport|Energy consumption|Freight transport|Coastal shipping and inland waterways|Inland waterways";"JRC-IDEES-2015_Transport_";"Transport";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Other";"Maritime Bunkers|Energy Consumption|Total energy consumption|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Other";"Maritime Bunkers|Energy Consumption|Total energy consumption|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"Emi|CO2|Transport|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Powered 2-wheelers";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Plug-in hybrid electric";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Electricity";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Electricity";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Electricity";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Heavy duty vehicles|Domestic";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Heavy duty vehicles|International";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Liquids";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|Conventional passenger trains|Diesel oil";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|Conventional passenger trains|Electric";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|High speed passenger trains";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Liquids";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Freight transport|Diesel oil";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Freight transport|Electric";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Passenger transport|Domestic";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Passenger transport|International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Passenger transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Freight transport|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Freight transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Liquids";"Transport|Navigation|CO2 Emissions|by fuel|Liquids";"JRC-IDEES-2015_Transport_";"TrNavi_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Liquids";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Liquids";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Powered 2-wheelers";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Plug-in hybrid electric";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers|Electricity";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers|Electricity";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers|Electricity";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Heavy duty vehicles|Domestic";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Heavy duty vehicles|International";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers|Liquids";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|Conventional passenger trains|Diesel oil";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|Conventional passenger trains|Electric";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|High speed passenger trains";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers|Liquids";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Freight transport|Diesel oil";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Freight transport|Electric";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Passenger transport|Domestic";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Passenger transport|International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Bunkers|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Passenger transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|w/o Bunkers|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Freight transport|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Bunkers|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Freight transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Bunkers|Liquids";"Transport|Navigation|CO2 Emissions|by fuel|Liquids";"JRC-IDEES-2015_Transport_";"TrNavi_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Bunkers|Liquids";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Bunkers|Liquids";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Powered 2-wheelers";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Plug-in hybrid electric";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Electricity";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Electricity";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Electricity";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Heavy duty vehicles|Domestic";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Heavy duty vehicles|International";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Liquids";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|Conventional passenger trains|Diesel oil";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|Conventional passenger trains|Electric";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|High speed passenger trains";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Liquids";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Freight transport|Diesel oil";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Freight transport|Electric";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Passenger transport|Domestic";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Passenger transport|International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Passenger transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Freight transport|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Freight transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Liquids";"Transport|Navigation|CO2 Emissions|by fuel|Liquids";"JRC-IDEES-2015_Transport_";"TrNavi_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Liquids";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Liquids";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Powered 2-wheelers";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|w/o Bunkers|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Plug-in hybrid electric";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|w/o Bunkers|Electricity";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|w/o Bunkers|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|w/o Bunkers|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|w/o Bunkers|Electricity";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|w/o Bunkers|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|w/o Bunkers|Electricity";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Heavy duty vehicles|Domestic";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Heavy duty vehicles|International";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|w/o Bunkers|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|w/o Bunkers|Liquids";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|Conventional passenger trains|Diesel oil";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|w/o Bunkers|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|Conventional passenger trains|Electric";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|w/o Bunkers|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|High speed passenger trains";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|w/o Bunkers|Liquids";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Freight transport|Diesel oil";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|w/o Bunkers|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Freight transport|Electric";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|w/o Bunkers|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Passenger transport|Domestic";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|w/o Bunkers|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Passenger transport|International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Bunkers|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Passenger transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|w/o Bunkers|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Freight transport|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Bunkers|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Freight transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Bunkers|Liquids";"Transport|Navigation|CO2 Emissions|by fuel|Liquids";"JRC-IDEES-2015_Transport_";"TrNavi_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Bunkers|Liquids";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Bunkers|Liquids";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Road|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Powered 2-wheelers";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Road|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Road|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Road|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Road|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Road|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Plug-in hybrid electric";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Road|Electricity";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Road|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Road|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Road|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Road|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Road|Electricity";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Road|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Road|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Road|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Road|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Road|Electricity";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Road|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Heavy duty vehicles|Domestic";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Road|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Heavy duty vehicles|International";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Train|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Train|Liquids";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|Conventional passenger trains|Diesel oil";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Train|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|Conventional passenger trains|Electric";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Train|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|High speed passenger trains";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Train|Liquids";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Freight transport|Diesel oil";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Train|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Freight transport|Electric";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Aviation|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Passenger transport|Domestic";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Aviation|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Passenger transport|International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Aviation|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Passenger transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Aviation|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Freight transport|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Aviation|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Freight transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Shipping|Liquids";"Transport|Navigation|CO2 Emissions|by fuel|Liquids";"JRC-IDEES-2015_Transport_";"TrNavi_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Shipping|Liquids";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Shipping|Liquids";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Road|LDV|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Powered 2-wheelers";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Road|LDV|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Road|LDV|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Road|LDV|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Road|LDV|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Road|LDV|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Plug-in hybrid electric";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Road|LDV|Electricity";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Road|non-LDV|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Road|non-LDV|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Road|non-LDV|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Road|non-LDV|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Road|non-LDV|Electricity";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Road|LDV|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Road|LDV|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Road|LDV|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Road|LDV|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Road|LDV|Electricity";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Road|non-LDV|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Heavy duty vehicles|Domestic";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Road|non-LDV|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Heavy duty vehicles|International";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Train|Urban|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Train|Low Speed|Liquids";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|Conventional passenger trains|Diesel oil";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Train|Low Speed|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|Conventional passenger trains|Electric";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Train|High Speed|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|High speed passenger trains";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Train|Conventional|Liquids";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Freight transport|Diesel oil";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Train|Conventional|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Freight transport|Electric";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Aviation|Domestic|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Passenger transport|Domestic";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Aviation|within EU|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Passenger transport|International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Aviation|extra EU|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Passenger transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Aviation|within EU|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Freight transport|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Aviation|extra EU|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Freight transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Shipping|Domestic|Liquids";"Transport|Navigation|CO2 Emissions|by fuel|Liquids";"JRC-IDEES-2015_Transport_";"TrNavi_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Shipping|within EU|Liquids";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Shipping|extra EU|Liquids";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Powered 2-wheelers";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Plug-in hybrid electric";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|Electricity";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Electricity";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|Electricity";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Heavy duty vehicles|Domestic";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Heavy duty vehicles|International";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Liquids";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|Conventional passenger trains|Diesel oil";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|Conventional passenger trains|Electric";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|High speed passenger trains";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Liquids";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Freight transport|Diesel oil";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Freight transport|Electric";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Passenger transport|Domestic";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Passenger transport|International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Passenger transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Freight transport|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Freight transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Liquids";"Transport|Navigation|CO2 Emissions|by fuel|Liquids";"JRC-IDEES-2015_Transport_";"TrNavi_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Liquids";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Liquids";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Powered 2-wheelers";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|w/o Bunkers|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Plug-in hybrid electric";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|w/o Bunkers|Electricity";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|w/o Bunkers|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|w/o Bunkers|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|w/o Bunkers|Electricity";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|w/o Bunkers|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|w/o Bunkers|Electricity";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Heavy duty vehicles|Domestic";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|w/o Bunkers|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Heavy duty vehicles|International";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|w/o Bunkers|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|w/o Bunkers|Liquids";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|Conventional passenger trains|Diesel oil";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|w/o Bunkers|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|Conventional passenger trains|Electric";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|w/o Bunkers|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|High speed passenger trains";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|w/o Bunkers|Liquids";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Freight transport|Diesel oil";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|w/o Bunkers|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Freight transport|Electric";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|w/o Bunkers|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Passenger transport|Domestic";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|w/o Bunkers|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Passenger transport|International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Bunkers|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Passenger transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|w/o Bunkers|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Freight transport|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Bunkers|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Freight transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Bunkers|Liquids";"Transport|Navigation|CO2 Emissions|by fuel|Liquids";"JRC-IDEES-2015_Transport_";"TrNavi_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Bunkers|Liquids";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Bunkers|Liquids";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Powered 2-wheelers";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Plug-in hybrid electric";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD|Electricity";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD|Electricity";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD|Electricity";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Heavy duty vehicles|Domestic";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Heavy duty vehicles|International";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD|Liquids";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|Conventional passenger trains|Diesel oil";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|Conventional passenger trains|Electric";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|High speed passenger trains";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD|Liquids";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Freight transport|Diesel oil";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ESD|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Freight transport|Electric";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ETS|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Passenger transport|Domestic";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ETS|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Passenger transport|International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Other|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Passenger transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|ETS|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Freight transport|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Other|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Freight transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Other|Liquids";"Transport|Navigation|CO2 Emissions|by fuel|Liquids";"JRC-IDEES-2015_Transport_";"TrNavi_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Other|Liquids";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Other|Liquids";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Powered 2-wheelers";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|ESD|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Plug-in hybrid electric";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|ESD|Electricity";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|ESD|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|ESD|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|ESD|Electricity";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|ESD|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|LDV|ESD|Electricity";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Heavy duty vehicles|Domestic";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Heavy duty vehicles|International";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|ESD|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|ESD|Liquids";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|Conventional passenger trains|Diesel oil";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|ESD|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|Conventional passenger trains|Electric";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|ESD|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|High speed passenger trains";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|ESD|Liquids";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Freight transport|Diesel oil";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|ESD|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Freight transport|Electric";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|ETS|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Passenger transport|Domestic";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|ETS|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Passenger transport|International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Other|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Passenger transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|ETS|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Freight transport|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Other|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Freight transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|non-LDV|Other|Liquids";"Transport|Navigation|CO2 Emissions|by fuel|Liquids";"JRC-IDEES-2015_Transport_";"TrNavi_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Other|Liquids";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Other|Liquids";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Powered 2-wheelers";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|ESD|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Plug-in hybrid electric";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|ESD|Electricity";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Passenger cars|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|ESD|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|ESD|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|ESD|Electricity";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Passenger transport|Motor coaches, buses and trolley buses|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|ESD|Gases";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|ESD|Electricity";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Light duty vehicles|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Heavy duty vehicles|Domestic";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|ESD|Liquids";"Transport|Road|CO2 Emissions|Split of CO2 emissions|Freight transport|Heavy duty vehicles|International";"JRC-IDEES-2015_Transport_";"TrRoad_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|ESD|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|ESD|Liquids";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|Conventional passenger trains|Diesel oil";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|ESD|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|Conventional passenger trains|Electric";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|ESD|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Passenger transport|High speed passenger trains";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|ESD|Liquids";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Freight transport|Diesel oil";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|ESD|Electricity";"Transport|Rail|CO2 Emissions|Split of CO2 emissions|Freight transport|Electric";"JRC-IDEES-2015_Transport_";"TrRail_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|ETS|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Passenger transport|Domestic";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|ETS|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Passenger transport|International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Pass|Other|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Passenger transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|ETS|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Freight transport|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Other|Liquids";"Transport|Aviation|CO2 Emissions|Split of CO2 emissions|Freight transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Freight|Other|Liquids";"Transport|Navigation|CO2 Emissions|by fuel|Liquids";"JRC-IDEES-2015_Transport_";"TrNavi_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Other|Liquids";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"Emi|CO2|Transport|Other|Liquids";"Maritime Bunkers|CO2 Emissions|Split of CO2 emissions|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_emi";1;"Mt CO2/yr";"kt of CO2";0.001 +"FE|Transport|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Gases|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which electricity";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Electricity";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Gases|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Electricity";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Gases|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Electricity";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Conventional passenger trains|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Conventional passenger trains|Electric";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|High speed passenger trains";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids";"Transport|Rail|Energy Consumption|Total energy consumption|Freight transport|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Freight transport|Electric";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|Domestic";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Liquids (Petroleum products)";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Gases";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Natural gas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Gases";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogasoline";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biodiesel";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Other biofuels";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids";"Maritime Bunkers|Energy Consumption|Total energy consumption|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids";"Maritime Bunkers|Energy Consumption|Total energy consumption|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which electricity";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Fossil";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Conventional passenger trains|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Fossil";"Transport|Rail|Energy Consumption|Total energy consumption|Freight transport|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|Domestic";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Fossil";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Liquids (Petroleum products)";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Gases|Fossil";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Natural gas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Gases|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogasoline";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biodiesel";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Other biofuels";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Fossil";"Maritime Bunkers|Energy Consumption|Total energy consumption|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Liquids|Fossil";"Maritime Bunkers|Energy Consumption|Total energy consumption|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Gases|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which electricity";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Electricity";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Gases|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Electricity";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Gases|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Electricity";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Conventional passenger trains|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Conventional passenger trains|Electric";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|High speed passenger trains";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids";"Transport|Rail|Energy Consumption|Total energy consumption|Freight transport|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Freight transport|Electric";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|Domestic";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Bunkers|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Bunkers|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Bunkers|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Liquids (Petroleum products)";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Bunkers|Gases";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Natural gas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Bunkers|Gases";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Bunkers|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogasoline";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Bunkers|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biodiesel";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Bunkers|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Other biofuels";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Bunkers|Liquids";"Maritime Bunkers|Energy Consumption|Total energy consumption|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Bunkers|Liquids";"Maritime Bunkers|Energy Consumption|Total energy consumption|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which electricity";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Fossil";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Conventional passenger trains|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Fossil";"Transport|Rail|Energy Consumption|Total energy consumption|Freight transport|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|Domestic";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Bunkers|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|w/o Bunkers|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Bunkers|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Bunkers|Liquids|Fossil";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Liquids (Petroleum products)";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Bunkers|Gases|Fossil";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Natural gas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Bunkers|Gases|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Bunkers|Liquids|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogasoline";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Bunkers|Liquids|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biodiesel";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Bunkers|Liquids|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Other biofuels";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Bunkers|Liquids|Fossil";"Maritime Bunkers|Energy Consumption|Total energy consumption|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Bunkers|Liquids|Fossil";"Maritime Bunkers|Energy Consumption|Total energy consumption|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Gases|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which electricity";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Electricity";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Gases|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Electricity";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Gases|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Electricity";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Conventional passenger trains|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Conventional passenger trains|Electric";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|High speed passenger trains";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids";"Transport|Rail|Energy Consumption|Total energy consumption|Freight transport|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Freight transport|Electric";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|Domestic";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Liquids (Petroleum products)";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Gases";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Natural gas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Gases";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogasoline";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biodiesel";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Other biofuels";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids";"Maritime Bunkers|Energy Consumption|Total energy consumption|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids";"Maritime Bunkers|Energy Consumption|Total energy consumption|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which electricity";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids|Fossil";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Conventional passenger trains|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids|Fossil";"Transport|Rail|Energy Consumption|Total energy consumption|Freight transport|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|Domestic";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids|Fossil";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Liquids (Petroleum products)";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Gases|Fossil";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Natural gas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Gases|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogasoline";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biodiesel";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Other biofuels";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids|Fossil";"Maritime Bunkers|Energy Consumption|Total energy consumption|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Liquids|Fossil";"Maritime Bunkers|Energy Consumption|Total energy consumption|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Gases|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which electricity";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Electricity";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Gases|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Electricity";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|w/o Bunkers|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|w/o Bunkers|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|w/o Bunkers|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|w/o Bunkers|Gases|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|w/o Bunkers|Electricity";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|w/o Bunkers|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|w/o Bunkers|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Liquids";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Conventional passenger trains|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Conventional passenger trains|Electric";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|High speed passenger trains";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|w/o Bunkers|Liquids";"Transport|Rail|Energy Consumption|Total energy consumption|Freight transport|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|w/o Bunkers|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Freight transport|Electric";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|Domestic";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Bunkers|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|w/o Bunkers|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Bunkers|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Bunkers|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Liquids (Petroleum products)";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Bunkers|Gases";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Natural gas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Bunkers|Gases";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Bunkers|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogasoline";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Bunkers|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biodiesel";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Bunkers|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Other biofuels";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Bunkers|Liquids";"Maritime Bunkers|Energy Consumption|Total energy consumption|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Bunkers|Liquids";"Maritime Bunkers|Energy Consumption|Total energy consumption|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which electricity";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|w/o Bunkers|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|w/o Bunkers|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Liquids|Fossil";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Conventional passenger trains|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|w/o Bunkers|Liquids|Fossil";"Transport|Rail|Energy Consumption|Total energy consumption|Freight transport|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|Domestic";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|w/o Bunkers|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Bunkers|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|w/o Bunkers|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Bunkers|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Bunkers|Liquids|Fossil";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Liquids (Petroleum products)";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Bunkers|Gases|Fossil";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Natural gas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Bunkers|Gases|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Bunkers|Liquids|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogasoline";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Bunkers|Liquids|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biodiesel";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Bunkers|Liquids|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Other biofuels";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Bunkers|Liquids|Fossil";"Maritime Bunkers|Energy Consumption|Total energy consumption|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Bunkers|Liquids|Fossil";"Maritime Bunkers|Energy Consumption|Total energy consumption|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Gases|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which electricity";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Electricity";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Gases|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Electricity";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|Gases|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|Electricity";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Train|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Train|Liquids";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Conventional passenger trains|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Train|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Conventional passenger trains|Electric";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Train|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|High speed passenger trains";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Train|Liquids";"Transport|Rail|Energy Consumption|Total energy consumption|Freight transport|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Train|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Freight transport|Electric";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Aviation|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|Domestic";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Aviation|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Aviation|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Aviation|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Aviation|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Liquids (Petroleum products)";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|Gases";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Natural gas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|Gases";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogasoline";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biodiesel";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Other biofuels";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|Liquids";"Maritime Bunkers|Energy Consumption|Total energy consumption|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|Liquids";"Maritime Bunkers|Energy Consumption|Total energy consumption|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which electricity";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Train|Liquids|Fossil";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Conventional passenger trains|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Train|Liquids|Fossil";"Transport|Rail|Energy Consumption|Total energy consumption|Freight transport|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Aviation|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|Domestic";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Aviation|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Aviation|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Aviation|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Aviation|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|Liquids|Fossil";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Liquids (Petroleum products)";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|Gases|Fossil";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Natural gas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|Gases|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|Liquids|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogasoline";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|Liquids|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biodiesel";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|Liquids|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Other biofuels";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|Liquids|Fossil";"Maritime Bunkers|Energy Consumption|Total energy consumption|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|Liquids|Fossil";"Maritime Bunkers|Energy Consumption|Total energy consumption|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|LDV|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|LDV|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|LDV|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|LDV|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|LDV|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|LDV|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|LDV|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|LDV|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|LDV|Gases|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|LDV|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|LDV|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|LDV|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which electricity";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|LDV|Electricity";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|non-LDV|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|non-LDV|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|non-LDV|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|non-LDV|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|non-LDV|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|non-LDV|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|non-LDV|Gases|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|non-LDV|Electricity";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|LDV|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|LDV|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|LDV|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|LDV|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|LDV|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|LDV|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|LDV|Gases|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|LDV|Electricity";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|non-LDV|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|non-LDV|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|non-LDV|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|non-LDV|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Train|Urban|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Train|Low Speed|Liquids";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Conventional passenger trains|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Train|Low Speed|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Conventional passenger trains|Electric";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Train|High Speed|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|High speed passenger trains";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Train|Conventional|Liquids";"Transport|Rail|Energy Consumption|Total energy consumption|Freight transport|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Train|Conventional|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Freight transport|Electric";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Aviation|Domestic|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|Domestic";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Aviation|within EU|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Aviation|extra EU|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Aviation|within EU|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Aviation|extra EU|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|Domestic|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Liquids (Petroleum products)";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|Domestic|Gases";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Natural gas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|Domestic|Gases";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|Domestic|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogasoline";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|Domestic|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biodiesel";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|Domestic|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Other biofuels";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|within EU|Liquids";"Maritime Bunkers|Energy Consumption|Total energy consumption|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|extra EU|Liquids";"Maritime Bunkers|Energy Consumption|Total energy consumption|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|LDV|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|LDV|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which electricity";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|non-LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|non-LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|non-LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|non-LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|non-LDV|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|non-LDV|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Road|non-LDV|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|LDV|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|LDV|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|non-LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|non-LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|non-LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Road|non-LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Train|Low Speed|Liquids|Fossil";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Conventional passenger trains|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Train|Conventional|Liquids|Fossil";"Transport|Rail|Energy Consumption|Total energy consumption|Freight transport|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Aviation|Domestic|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|Domestic";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Aviation|within EU|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Aviation|extra EU|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Aviation|within EU|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Aviation|extra EU|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|Domestic|Liquids|Fossil";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Liquids (Petroleum products)";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|Domestic|Gases|Fossil";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Natural gas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|Domestic|Gases|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|Domestic|Liquids|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogasoline";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|Domestic|Liquids|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biodiesel";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|Domestic|Liquids|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Other biofuels";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|within EU|Liquids|Fossil";"Maritime Bunkers|Energy Consumption|Total energy consumption|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Shipping|extra EU|Liquids|Fossil";"Maritime Bunkers|Energy Consumption|Total energy consumption|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Gases|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which electricity";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Electricity";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Gases|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Electricity";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Gases|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Electricity";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Conventional passenger trains|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Conventional passenger trains|Electric";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|High speed passenger trains";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids";"Transport|Rail|Energy Consumption|Total energy consumption|Freight transport|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Freight transport|Electric";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|Domestic";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Liquids (Petroleum products)";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Gases";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Natural gas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Gases";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogasoline";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biodiesel";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Other biofuels";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids";"Maritime Bunkers|Energy Consumption|Total energy consumption|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids";"Maritime Bunkers|Energy Consumption|Total energy consumption|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which electricity";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids|Fossil";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Conventional passenger trains|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids|Fossil";"Transport|Rail|Energy Consumption|Total energy consumption|Freight transport|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|Domestic";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids|Fossil";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Liquids (Petroleum products)";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Gases|Fossil";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Natural gas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Gases|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogasoline";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biodiesel";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Other biofuels";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids|Fossil";"Maritime Bunkers|Energy Consumption|Total energy consumption|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Liquids|Fossil";"Maritime Bunkers|Energy Consumption|Total energy consumption|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Gases|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which electricity";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Electricity";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Gases|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Electricity";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Gases|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Electricity";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Liquids";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Conventional passenger trains|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Conventional passenger trains|Electric";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|High speed passenger trains";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Liquids";"Transport|Rail|Energy Consumption|Total energy consumption|Freight transport|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Freight transport|Electric";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|Domestic";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Bunkers|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Bunkers|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Bunkers|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Liquids (Petroleum products)";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Bunkers|Gases";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Natural gas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Bunkers|Gases";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Bunkers|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogasoline";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Bunkers|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biodiesel";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Bunkers|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Other biofuels";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Bunkers|Liquids";"Maritime Bunkers|Energy Consumption|Total energy consumption|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Bunkers|Liquids";"Maritime Bunkers|Energy Consumption|Total energy consumption|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which electricity";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|w/o Bunkers|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Liquids|Fossil";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Conventional passenger trains|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Liquids|Fossil";"Transport|Rail|Energy Consumption|Total energy consumption|Freight transport|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|Domestic";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Bunkers|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|w/o Bunkers|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Bunkers|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Bunkers|Liquids|Fossil";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Liquids (Petroleum products)";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Bunkers|Gases|Fossil";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Natural gas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Bunkers|Gases|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Bunkers|Liquids|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogasoline";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Bunkers|Liquids|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biodiesel";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Bunkers|Liquids|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Other biofuels";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Bunkers|Liquids|Fossil";"Maritime Bunkers|Energy Consumption|Total energy consumption|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Bunkers|Liquids|Fossil";"Maritime Bunkers|Energy Consumption|Total energy consumption|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Gases|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which electricity";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Electricity";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Gases|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Electricity";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Gases|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Electricity";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Conventional passenger trains|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Conventional passenger trains|Electric";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|High speed passenger trains";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids";"Transport|Rail|Energy Consumption|Total energy consumption|Freight transport|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Freight transport|Electric";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ETS|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|Domestic";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ETS|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Other|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ETS|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Other|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Other|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Liquids (Petroleum products)";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Other|Gases";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Natural gas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Other|Gases";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Other|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogasoline";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Other|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biodiesel";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Other|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Other biofuels";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Other|Liquids";"Maritime Bunkers|Energy Consumption|Total energy consumption|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Other|Liquids";"Maritime Bunkers|Energy Consumption|Total energy consumption|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which electricity";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Fossil";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Conventional passenger trains|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ESD|Liquids|Fossil";"Transport|Rail|Energy Consumption|Total energy consumption|Freight transport|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ETS|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|Domestic";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ETS|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Other|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|ETS|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Other|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Other|Liquids|Fossil";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Liquids (Petroleum products)";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Other|Gases|Fossil";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Natural gas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Other|Gases|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Other|Liquids|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogasoline";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Other|Liquids|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biodiesel";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Other|Liquids|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Other biofuels";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Other|Liquids|Fossil";"Maritime Bunkers|Energy Consumption|Total energy consumption|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Other|Liquids|Fossil";"Maritime Bunkers|Energy Consumption|Total energy consumption|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Gases|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which electricity";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Electricity";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD|Gases|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD|Electricity";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Gases|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Electricity";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD|Liquids";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Conventional passenger trains|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Conventional passenger trains|Electric";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|High speed passenger trains";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD|Liquids";"Transport|Rail|Energy Consumption|Total energy consumption|Freight transport|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Freight transport|Electric";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ETS|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|Domestic";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ETS|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Other|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ETS|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Other|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Other|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Liquids (Petroleum products)";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Other|Gases";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Natural gas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Other|Gases";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Other|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogasoline";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Other|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biodiesel";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Other|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Other biofuels";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Other|Liquids";"Maritime Bunkers|Energy Consumption|Total energy consumption|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Other|Liquids";"Maritime Bunkers|Energy Consumption|Total energy consumption|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which electricity";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|LDV|ESD|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD|Liquids|Fossil";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Conventional passenger trains|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ESD|Liquids|Fossil";"Transport|Rail|Energy Consumption|Total energy consumption|Freight transport|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ETS|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|Domestic";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ETS|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Other|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|ETS|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Other|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Other|Liquids|Fossil";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Liquids (Petroleum products)";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Other|Gases|Fossil";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Natural gas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Other|Gases|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Other|Liquids|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogasoline";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Other|Liquids|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biodiesel";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|non-LDV|Other|Liquids|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Other biofuels";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Other|Liquids|Fossil";"Maritime Bunkers|Energy Consumption|Total energy consumption|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Other|Liquids|Fossil";"Maritime Bunkers|Energy Consumption|Total energy consumption|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Gases|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which electricity";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Electricity";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Gases|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Electricity";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|ESD|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|ESD|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|ESD|Gases";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|ESD|Gases|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|ESD|Electricity";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Battery electric vehicles";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|ESD|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|ESD|Liquids";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|ESD|Liquids|Biomass";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Metro and tram, urban light rail";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Liquids";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Conventional passenger trains|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Conventional passenger trains|Electric";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|High speed passenger trains";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|ESD|Liquids";"Transport|Rail|Energy Consumption|Total energy consumption|Freight transport|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|ESD|Electricity";"Transport|Rail|Energy Consumption|Total energy consumption|Freight transport|Electric";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ETS|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|Domestic";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ETS|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Other|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|ETS|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Other|Liquids";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Other|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Liquids (Petroleum products)";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Other|Gases";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Natural gas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Other|Gases";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Other|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogasoline";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Other|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biodiesel";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Other|Liquids";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Other biofuels";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Other|Liquids";"Maritime Bunkers|Energy Consumption|Total energy consumption|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Other|Liquids";"Maritime Bunkers|Energy Consumption|Total energy consumption|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Powered 2-wheelers (Gasoline)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Passenger cars|Plug-in hybrid electric (Gasoline and electricity)|of which electricity";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Passenger transport|Motor coaches, buses and trolley buses|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Gasoline engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Diesel oil engine|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|LPG engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|ESD|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|ESD|Gases|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Light duty vehicles|Natural gas engine|of which biogas";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|Domestic|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International";"JRC-IDEES-2015_Transport_";"TrRoad_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|ESD|Liquids|Fossil";"Transport|Road|Energy Consumption|Total energy consumption|Freight transport|Heavy duty vehicles (Diesel oil incl. biofuels)|International|of which biofuels";"JRC-IDEES-2015_Transport_";"TrRoad_ene";-1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ESD|Liquids|Fossil";"Transport|Rail|Energy Consumption|Total energy consumption|Passenger transport|Conventional passenger trains|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|ESD|Liquids|Fossil";"Transport|Rail|Energy Consumption|Total energy consumption|Freight transport|Diesel oil (incl. biofuels)";"JRC-IDEES-2015_Transport_";"TrRail_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ETS|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|Domestic";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|ETS|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Pass|Other|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Passenger transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|ETS|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|Domestic and International - Intra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Other|Liquids|Fossil";"Transport|Aviation|Energy Consumption|Total energy consumption|Freight transport|International - Extra-EU";"JRC-IDEES-2015_Transport_";"TrAvia_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Other|Liquids|Fossil";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Liquids (Petroleum products)";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Other|Gases|Fossil";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Natural gas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Other|Gases|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogas";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Other|Liquids|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biogasoline";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Other|Liquids|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Biodiesel";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Freight|Other|Liquids|Biomass";"Transport|Navigation|Energy Consumption|by fuel (EUROSTAT DATA)|Renewable energies and wastes|Other biofuels";"JRC-IDEES-2015_Transport_";"TrNavi_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Other|Liquids|Fossil";"Maritime Bunkers|Energy Consumption|Total energy consumption|Intra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 +"FE|Transport|Other|Liquids|Fossil";"Maritime Bunkers|Energy Consumption|Total energy consumption|Extra-EU";"JRC-IDEES-2015_MBunkers_";"MBunk_ene";1;"EJ/yr";"ktoe";4.19E-05 From 4166c09d1063cbdbe3de05b6d273ac5a1f59560d Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Fri, 19 Jul 2024 15:35:53 +0200 Subject: [PATCH 14/42] connvert currency units in calcJRC_IDEES --- R/calcJRC_IDEES.R | 17 +++++++++++++- .../Mapping_JRC_IDEES_REMIND_Industry.csv | 22 +++++++++---------- 2 files changed, 27 insertions(+), 12 deletions(-) diff --git a/R/calcJRC_IDEES.R b/R/calcJRC_IDEES.R index c1f00e07..a9520a7e 100644 --- a/R/calcJRC_IDEES.R +++ b/R/calcJRC_IDEES.R @@ -73,7 +73,22 @@ calcJRC_IDEES <- function(subtype) { toolCountryFill(fill = NA, verbosity = 2) %>% toolFillEU34Countries() + # convert currency units from €2010 to $2017 + if (subtype == "Industry") { + tmp <- x[, , "EUR2010", pmatch = TRUE] + x <- x[, , getNames(tmp), invert = TRUE] + getNames(tmp) <- gsub("EUR2010", "US$2017", getNames(tmp)) + + tmp <- GDPuc::convertGDP( + gdp = tmp, + unit_in = "constant 2010 €", + unit_out = "constant 2017 Int$PPP", + replace_NAs = "with_USA" + ) + x <- mbind(x, tmp) + } + return(list(x = x, weight = NULL, - unit = "billion US$2005/yr, EJ/yr, Mt CO2/yr, Mt/yr", + unit = "billion US$2017/yr, EJ/yr, Mt CO2/yr, Mt/yr", description = "Historical JRC IDEES values as REMIND variables")) } diff --git a/inst/extdata/reportingVariables/Mapping_JRC_IDEES_REMIND_Industry.csv b/inst/extdata/reportingVariables/Mapping_JRC_IDEES_REMIND_Industry.csv index b26c1e50..5dd9694b 100755 --- a/inst/extdata/reportingVariables/Mapping_JRC_IDEES_REMIND_Industry.csv +++ b/inst/extdata/reportingVariables/Mapping_JRC_IDEES_REMIND_Industry.csv @@ -152,7 +152,7 @@ "FE|Industry|Chemicals ";"Chemicals (excluding feedstocks)";"Other chemicals";"JRC-IDEES-2015_Industry_";"CHI_fec";60;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Other chemicals" "FE|Industry|Chemicals ";"Chemicals (excluding feedstocks)";"Pharmaceutical products etc.";"JRC-IDEES-2015_Industry_";"CHI_fec";108;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Pharmaceutical products etc." "FE|Industry|Chemicals ";"Chemicals (excluding feedstocks)";"Feedstocks to be excluded";"JRC-IDEES-2015_Industry_";"CHI_fec";15;-1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Feedstock (energy used as raw material)" -"Value Added|Industry|Chemicals";"Value added chemicals";"Chemicals Industry";"JRC-IDEES-2015_Industry_";"Ind_Summary";9;1;"billion US$2005/yr";"M€2010";0.00119;"Industry Summary|Value added|Chemicals Industry" +"Value Added|Industry|Chemicals";"Value added chemicals";"Chemicals Industry";"JRC-IDEES-2015_Industry_";"Ind_Summary";9;1;"billion EUR2010/yr";"M€2010";0.001;"Industry Summary|Value added|Chemicals Industry" "FE|Industry|Chemicals|Feedstocks";"chemical feedstocks only ";"Chemicals: Feedstock (energy used as raw material)";"JRC-IDEES-2015_Industry_";"CHI_fec";15;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Feedstock (energy used as raw material)" "FE|Industry|Solids|Chemicals";"Solids";"Solids";"JRC-IDEES-2015_Industry_";"CHI_fec";25;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Steam processing|Solids" "FE|Industry|Solids|Chemicals";"Solids";"Biomass";"JRC-IDEES-2015_Industry_";"CHI_fec";33;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Steam processing|Biomass" @@ -604,16 +604,16 @@ "FE|Industry|other";;"Other industrial sectors";"JRC-IDEES-2015_Industry_";"Ind_Summary";95;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Non-energy use|by sector|Other industrial sectors" "FE|Industry|other";;"Chemical feedstocks";"JRC-IDEES-2015_Industry_";"CHI_fec";15;1;"EJ/yr";"ktoe";4.1868E-05;"Chemicals Industry|Final Energy Consumption|Basic chemicals|Chemicals: Feedstock (energy used as raw material)" "FE|Industry|other";"Agriculture/Forestry/Fishing";"All Products";"JRC-IDEES-2015_EnergyBalance_";"cagr";2;1;"EJ/yr";"ktoe";4.1868E-05;"Energy|Agriculture+Forestry+Fishing|All Products" -"Value Added|Industry|other";;"Non Ferrous Metals";"JRC-IDEES-2015_Industry_";"Ind_Summary";5;1;"billion US$2005/yr";"M€2010";0.00119;"Industry Summary|Value added|Non Ferrous Metals" -"Value Added|Industry|other";;"Ceramics & other NMM";"JRC-IDEES-2015_Industry_";"Ind_Summary";15;1;"billion US$2005/yr";"M€2010";0.00119;"Industry Summary|Value added|Non-metallic mineral products|Ceramics & other NMM" -"Value Added|Industry|other";;"Glass production ";"JRC-IDEES-2015_Industry_";"Ind_Summary";16;1;"billion US$2005/yr";"M€2010";0.00119;"Industry Summary|Value added|Non-metallic mineral products|Glass production" -"Value Added|Industry|other";;"Pulp, paper and printing";"JRC-IDEES-2015_Industry_";"Ind_Summary";17;1;"billion US$2005/yr";"M€2010";0.00119;"Industry Summary|Value added|Pulp, paper and printing" -"Value Added|Industry|other";;" Food, beverages and tobacco";"JRC-IDEES-2015_Industry_";"Ind_Summary";21;1;"billion US$2005/yr";"M€2010";0.00119;"Industry Summary|Value added|Food, beverages and tobacco" -"Value Added|Industry|other";;" Transport Equipment";"JRC-IDEES-2015_Industry_";"Ind_Summary";22;1;"billion US$2005/yr";"M€2010";0.00119;"Industry Summary|Value added|Transport Equipment" -"Value Added|Industry|other";;" Machinery Equipment";"JRC-IDEES-2015_Industry_";"Ind_Summary";23;1;"billion US$2005/yr";"M€2010";0.00119;"Industry Summary|Value added|Machinery Equipment" -"Value Added|Industry|other";;" Textiles and leather";"JRC-IDEES-2015_Industry_";"Ind_Summary";24;1;"billion US$2005/yr";"M€2010";0.00119;"Industry Summary|Value added|Textiles and leather" -"Value Added|Industry|other";;" Wood and wood products";"JRC-IDEES-2015_Industry_";"Ind_Summary";25;1;"billion US$2005/yr";"M€2010";0.00119;"Industry Summary|Value added|Wood and wood products" -"Value Added|Industry|other";;" Other Industrial Sectors";"JRC-IDEES-2015_Industry_";"Ind_Summary";26;1;"billion US$2005/yr";"M€2010";0.00119;"Industry Summary|Value added|Other Industrial Sectors" +"Value Added|Industry|other";;"Non Ferrous Metals";"JRC-IDEES-2015_Industry_";"Ind_Summary";5;1;"billion EUR2010/yr";"M€2010";0.001;"Industry Summary|Value added|Non Ferrous Metals" +"Value Added|Industry|other";;"Ceramics & other NMM";"JRC-IDEES-2015_Industry_";"Ind_Summary";15;1;"billion EUR2010/yr";"M€2010";0.001;"Industry Summary|Value added|Non-metallic mineral products|Ceramics & other NMM" +"Value Added|Industry|other";;"Glass production ";"JRC-IDEES-2015_Industry_";"Ind_Summary";16;1;"billion EUR2010/yr";"M€2010";0.001;"Industry Summary|Value added|Non-metallic mineral products|Glass production" +"Value Added|Industry|other";;"Pulp, paper and printing";"JRC-IDEES-2015_Industry_";"Ind_Summary";17;1;"billion EUR2010/yr";"M€2010";0.001;"Industry Summary|Value added|Pulp, paper and printing" +"Value Added|Industry|other";;" Food, beverages and tobacco";"JRC-IDEES-2015_Industry_";"Ind_Summary";21;1;"billion EUR2010/yr";"M€2010";0.001;"Industry Summary|Value added|Food, beverages and tobacco" +"Value Added|Industry|other";;" Transport Equipment";"JRC-IDEES-2015_Industry_";"Ind_Summary";22;1;"billion EUR2010/yr";"M€2010";0.001;"Industry Summary|Value added|Transport Equipment" +"Value Added|Industry|other";;" Machinery Equipment";"JRC-IDEES-2015_Industry_";"Ind_Summary";23;1;"billion EUR2010/yr";"M€2010";0.001;"Industry Summary|Value added|Machinery Equipment" +"Value Added|Industry|other";;" Textiles and leather";"JRC-IDEES-2015_Industry_";"Ind_Summary";24;1;"billion EUR2010/yr";"M€2010";0.001;"Industry Summary|Value added|Textiles and leather" +"Value Added|Industry|other";;" Wood and wood products";"JRC-IDEES-2015_Industry_";"Ind_Summary";25;1;"billion EUR2010/yr";"M€2010";0.001;"Industry Summary|Value added|Wood and wood products" +"Value Added|Industry|other";;" Other Industrial Sectors";"JRC-IDEES-2015_Industry_";"Ind_Summary";26;1;"billion EUR2010/yr";"M€2010";0.001;"Industry Summary|Value added|Other Industrial Sectors" "FE|Industry|Solids|other";"Energy consumption ";"Solids";"JRC-IDEES-2015_Industry_";"Ind_Summary";30;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Energy consumption|by fuel (EUROSTAT DATA)|Solids" "FE|Industry|Solids|other";"Energy consumption ";"Biomass and wastes";"JRC-IDEES-2015_Industry_";"Ind_Summary";43;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Energy consumption|by fuel (EUROSTAT DATA)|RES and wastes|Biomass and wastes" "FE|Industry|Solids|other";"Non-energy use";"Solids";"JRC-IDEES-2015_Industry_";"Ind_Summary";81;1;"EJ/yr";"ktoe";4.1868E-05;"Industry Summary|Non-energy use|by fuel (EUROSTAT DATA)|Solids" From e2769c14d0c033760bf47d797bef3d3fc0bdb46d Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Fri, 19 Jul 2024 15:55:15 +0200 Subject: [PATCH 15/42] convert currency in calcTaxConvergence --- R/calcTaxConvergence.R | 18 +++++++++++++++--- 1 file changed, 15 insertions(+), 3 deletions(-) diff --git a/R/calcTaxConvergence.R b/R/calcTaxConvergence.R index c595216e..1dfce479 100644 --- a/R/calcTaxConvergence.R +++ b/R/calcTaxConvergence.R @@ -9,13 +9,25 @@ #' } #' calcTaxConvergence <- function() { + # Read tax convergence levels at specific year and final energy type taxConvergence <- readSource("REMIND_11Regi", subtype = "taxConvergence") + # average weight - w <- new.magpie(getRegions(taxConvergence), getYears(taxConvergence), getNames(taxConvergence), fill = 1) - # Return tax convergence levels aggregated to selected REMIND regions + w <- taxConvergence + w[, , ] <- 1 + + # convert data from $2005 to $2017 + taxConvergence <- GDPuc::convertGDP( + gdp = taxConvergence, + unit_in = "constant 2005 Int$PPP", + unit_out = "constant 2017 Int$PPP", + replace_NAs = "with_USA" + ) + return(list( - x = taxConvergence, weight = w, + x = taxConvergence, + weight = w, unit = "$/GJ", description = "Tax convergence level for specific regions, year and final energy type" )) From 00686e749861eb2d1ba0644cbb9baa5938b127b3 Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Fri, 19 Jul 2024 16:27:23 +0200 Subject: [PATCH 16/42] convert currency in calcTaxLimits --- R/calcTaxLimits.R | 9 ++++++++- 1 file changed, 8 insertions(+), 1 deletion(-) diff --git a/R/calcTaxLimits.R b/R/calcTaxLimits.R index b1cc8808..254e8d5b 100644 --- a/R/calcTaxLimits.R +++ b/R/calcTaxLimits.R @@ -43,7 +43,14 @@ calcTaxLimits <- function(subtype) { weight <- new.magpie(getItems(output, dim = 1), getYears(output), getNames(output), fill = 1) } + # convert data from $2005 to $2017 + output <- GDPuc::convertGDP( + gdp = output, + unit_in = "constant 2005 Int$PPP", + unit_out = "constant 2017 Int$PPP", + replace_NAs = "with_USA" + ) + # Return tax convergence levels aggregated to selected REMIND regions return(list(x = output, weight = weight, unit = "$/GJ", description = description)) - } From 8db99f27734bc02aa3855ec0a8284037f738e99e Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Fri, 19 Jul 2024 16:34:52 +0200 Subject: [PATCH 17/42] convert currency in calcTaxXport --- R/calcTaxLimits.R | 3 ++- R/calcTaxXport.R | 20 +++++++++++++++++--- 2 files changed, 19 insertions(+), 4 deletions(-) diff --git a/R/calcTaxLimits.R b/R/calcTaxLimits.R index 254e8d5b..0c0ac8a2 100644 --- a/R/calcTaxLimits.R +++ b/R/calcTaxLimits.R @@ -31,7 +31,8 @@ calcTaxLimits <- function(subtype) { } else if (subtype == "maxPeSubsidy") { # Read max primary energy subsidy levels output <- readSource("REMIND_11Regi", subtype = "maxPeSubsidy") - description <- "maximum primary energy subsidy levels (in $/Gj) to provide plausible upper bound: 40$/barrel ~ 8 $/GJ" + description <- paste0("maximum primary energy subsidy levels (in $/Gj) to ", + "provide plausible upper bound: 40$/barrel ~ 8 $/GJ") # using primary energy to weight the max subsidy levels weight <- calcOutput("PE", aggregate = FALSE)[, 2005, "PE (EJ/yr)"] } else if (subtype == "propFeSubsidy") { diff --git a/R/calcTaxXport.R b/R/calcTaxXport.R index b662553e..5b63d880 100644 --- a/R/calcTaxXport.R +++ b/R/calcTaxXport.R @@ -1,12 +1,26 @@ calcTaxXport <- function() { + x <- readSource("REMIND_11Regi", subtype = "xpres_tax") - weight <- new.magpie(getRegions(x), getYears(x), getNames(x), fill = 1) # or use export, from IEA? + # average weight + weight <- x + weight[, , ] <- 1 + + # convert data from $2005 to $2017 + x <- GDPuc::convertGDP( + gdp = x, + unit_in = "constant 2005 Int$PPP", + unit_out = "constant 2017 Int$PPP", + replace_NAs = "with_USA" + ) - x <- time_interpolate(x, c(seq(2010, 2150, 5)), extrapolation_type = "constant", integrate_interpolated_years = TRUE) + x <- time_interpolate(x, c(seq(2010, 2150, 5)), + extrapolation_type = "constant", + integrate_interpolated_years = TRUE) return(list( - x = x, weight = weight, + x = x, + weight = weight, unit = "$/GJ", description = "resource export taxes, not used in default settings." )) From 5065918431f4647a0c888ee83751cd4b06b392b9 Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Mon, 22 Jul 2024 11:00:17 +0200 Subject: [PATCH 18/42] remove := operator from mutate --- R/calcAGEB.R | 6 +++--- R/calcEuropeanEnergyDatasheets.R | 2 +- R/calcIEA_ETP.R | 10 +++++----- R/calcUBA.R | 4 +--- R/convertEuropeanEnergyDatasheets.R | 6 ++---- R/convertMueller.R | 2 +- R/readAGEB.R | 12 ++++++------ R/readEuropeanEnergyDatasheets.R | 6 +++--- R/readGlobalEnergyMonitor.R | 10 +++++----- R/readIEA_ETP.R | 4 ++-- R/readIRENA.R | 2 +- R/readUNFCCC.R | 4 ++-- R/toolFillEU34Countries.R | 2 +- 13 files changed, 33 insertions(+), 37 deletions(-) diff --git a/R/calcAGEB.R b/R/calcAGEB.R index c4e3d1e9..c3dd65ff 100644 --- a/R/calcAGEB.R +++ b/R/calcAGEB.R @@ -15,7 +15,7 @@ calcAGEB <- function(subtype = "balances") { ageb <- readSource("AGEB", subtype = subtype) mapping <- toolGetMapping("Mapping_AGEB_REMIND.csv", type = "reportingVariables", where = "mappingfolder") %>% - mutate(!!sym("conversion") := as.numeric(!!sym("Factor")) * !!sym("Weight")) %>% + mutate("conversion" = as.numeric(!!sym("Factor")) * !!sym("Weight")) %>% select("variable" = "AGEB_variable", "REMIND_variable", "conversion", "unit" = "Unit_AGEB", "Unit_REMIND") %>% filter(!!sym("REMIND_variable") != "") @@ -32,8 +32,8 @@ calcAGEB <- function(subtype = "balances") { by = "variable" ) %>% mutate( - !!sym("value") := !!sym("value") * !!sym("conversion"), - !!sym("REMIND_variable") := paste0(!!sym("REMIND_variable"), " (", !!sym("Unit_REMIND"), ")") + "value" = !!sym("value") * !!sym("conversion"), + "REMIND_variable" = paste0(!!sym("REMIND_variable"), " (", !!sym("Unit_REMIND"), ")") ) %>% select("variable" = "REMIND_variable", "region", "year", "value") diff --git a/R/calcEuropeanEnergyDatasheets.R b/R/calcEuropeanEnergyDatasheets.R index 8d8d2fbe..d8ac018e 100644 --- a/R/calcEuropeanEnergyDatasheets.R +++ b/R/calcEuropeanEnergyDatasheets.R @@ -28,7 +28,7 @@ calcEuropeanEnergyDatasheets <- function(subtype) { mapping <- toolGetMapping("Mapping_EuropeanEnergyDatasheets.csv", type = "reportingVariables", where = "mrremind") %>% filter(!is.na(!!sym("REMIND")), !!sym("REMIND") != "") %>% - mutate(!!sym("Conversion") := as.numeric(!!sym("Conversion"))) %>% + mutate("Conversion" = as.numeric(.data$Conversion)) %>% select("variable" = "EED", "REMIND", "Conversion") mapping$variable <- trimws(mapping$variable) diff --git a/R/calcIEA_ETP.R b/R/calcIEA_ETP.R index 96f1607e..a3ef5a5b 100644 --- a/R/calcIEA_ETP.R +++ b/R/calcIEA_ETP.R @@ -14,7 +14,7 @@ calcIEA_ETP <- function() { mapping <- toolGetMapping("Mapping_IEA_ETP.csv", type = "reportingVariables", where = "mrremind") %>% filter(!is.na(!!sym("REMIND")), !!sym("REMIND") != "") %>% - mutate(!!sym("Conversion") := as.numeric(!!sym("Conversion"))) %>% + mutate("Conversion" = as.numeric(!!sym("Conversion"))) %>% select("variable" = "IEA_ETP", "REMIND", "Conversion", "Unit_REMIND") mapping$variable <- trimws(mapping$variable) @@ -42,10 +42,10 @@ calcIEA_ETP <- function() { ) %>% filter(!!sym("REMIND") != "") %>% mutate( - !!sym("value") := !!sym("value") * !!sym("Conversion"), - !!sym("REMIND") := paste0(!!sym("REMIND"), " (", !!sym("Unit_REMIND"), ")"), - !!sym("model") := paste0("IEA ETP ", !!sym("scenario")), - !!sym("year") := as.numeric(as.character(!!sym("year"))) + "value" = !!sym("value") * !!sym("Conversion"), + "REMIND" = paste0(!!sym("REMIND"), " (", !!sym("Unit_REMIND"), ")"), + "model" = paste0("IEA ETP ", !!sym("scenario")), + "year" = as.numeric(as.character(!!sym("year"))) ) %>% select("region", "year", "model", "variable" = "REMIND", "value") diff --git a/R/calcUBA.R b/R/calcUBA.R index 2c74bb48..adbaa15e 100644 --- a/R/calcUBA.R +++ b/R/calcUBA.R @@ -28,9 +28,7 @@ calcUBA <- function() { mapping, by = "variable" ) %>% - mutate( - !!sym("REMIND_variable") := paste0(!!sym("REMIND_variable"), " (", !!sym("Unit_REMIND"), ")") - ) %>% + mutate("REMIND_variable" = paste0(!!sym("REMIND_variable"), " (", !!sym("Unit_REMIND"), ")")) %>% select("variable" = "REMIND_variable", "region", "year", "value") x <- aggregate(value ~ variable + region + year, x, sum) %>% diff --git a/R/convertEuropeanEnergyDatasheets.R b/R/convertEuropeanEnergyDatasheets.R index 88008376..9633ea4b 100644 --- a/R/convertEuropeanEnergyDatasheets.R +++ b/R/convertEuropeanEnergyDatasheets.R @@ -17,10 +17,8 @@ convertEuropeanEnergyDatasheets <- function(x, subtype) { getItems(x, dim = 1) <- sapply(getRegions(x), function(y) iso3[which(iso3[, 1] == y), 2]) # fill up zero countries - x <- toolCountryFill(x, fill = NA, verbosity = 2) - - # fill smaller EU-countries with 0s to allow for aggregation of EU-region - x[c("ALA", "FRO", "GIB", "GGY", "IMN", "JEY"), , ] <- 0 + x <- toolCountryFill(x, fill = NA, verbosity = 2) %>% + toolFillEU34Countries() # in never mapping, this is handled directly in mapping if (subtype == "EU28") { diff --git a/R/convertMueller.R b/R/convertMueller.R index 3f061977..de02b905 100644 --- a/R/convertMueller.R +++ b/R/convertMueller.R @@ -22,7 +22,7 @@ convertMueller <- function(x, subtype) { if (subtype == "stocks") { x %>% madrat_mule() %>% - mutate(!!sym("variable") := paste0("Steel stock per-capita|", !!sym("estimate"), " (t)")) %>% + mutate("variable" = paste0("Steel stock per-capita|", !!sym("estimate"), " (t)")) %>% select("region" = "iso3c", "period" = "year", "variable", "value" = "steel.stock.per.capita") %>% as.magpie() %>% toolCountryFill(fill = 0, verbosity = 2, no_remove_warning = c("ANT")) %>% diff --git a/R/readAGEB.R b/R/readAGEB.R index 7a9dc386..16a06395 100644 --- a/R/readAGEB.R +++ b/R/readAGEB.R @@ -66,7 +66,7 @@ readAGEB <- function(subtype = "balances") { ) ) %>% filter(!is.na(!!sym("Einheit"))) %>% - mutate(!!sym("Energietraeger") := paste0(sheets[["name"]][[i]], "|", !!sym("Energietr\u00E4ger"))) %>% + mutate("Energietraeger" = paste0(sheets[["name"]][[i]], "|", !!sym("Energietr\u00E4ger"))) %>% select(-1) data <- bind_rows(data, tmp) @@ -87,13 +87,13 @@ readAGEB <- function(subtype = "balances") { col_types = c("text", rep("numeric", 32)), range = "B3:AH17", .name_repair = "minimal", na = c("k.A.") ) %>% - mutate(!!sym("TWh") := gsub(", darunter:", "", !!sym("TWh"))) %>% - mutate(!!sym("TWh") := gsub("- ", "", !!sym("TWh"))) %>% - mutate(!!sym("TWh") := gsub("[0-9])", "", !!sym("TWh"))) %>% - mutate(!!sym("variable") := paste0("9 Bruttostromerzeugung|", !!sym("TWh"))) %>% + mutate("TWh" = gsub(", darunter:", "", !!sym("TWh"))) %>% + mutate("TWh" = gsub("- ", "", !!sym("TWh"))) %>% + mutate("TWh" = gsub("[0-9])", "", !!sym("TWh"))) %>% + mutate("variable" = paste0("9 Bruttostromerzeugung|", !!sym("TWh"))) %>% select(-1) %>% reshape2::melt(id.vars = c("variable"), variable.name = "period", value.name = "value") %>% - mutate(!!sym("region") := "DEU", !!sym("unit") := "TWh") %>% + mutate("region" = "DEU", "unit" = "TWh") %>% select("region", "period", "variable", "unit", "value") %>% as.magpie() %>% return() diff --git a/R/readEuropeanEnergyDatasheets.R b/R/readEuropeanEnergyDatasheets.R index 7d737329..5fa229bf 100644 --- a/R/readEuropeanEnergyDatasheets.R +++ b/R/readEuropeanEnergyDatasheets.R @@ -654,9 +654,9 @@ readEuropeanEnergyDatasheets <- function(subtype) { select(-1) %>% reshape2::melt(id.vars = c("variable", "unit"), variable.name = "year") %>% mutate( - "year" := as.numeric(as.character(.data$year)), - "region" := sheet, - "value" := suppressWarnings(as.numeric(.data$value)) + "year" = as.numeric(as.character(.data$year)), + "region" = sheet, + "value" = suppressWarnings(as.numeric(.data$value)) ) ) } diff --git a/R/readGlobalEnergyMonitor.R b/R/readGlobalEnergyMonitor.R index d9fb086e..8767f7da 100644 --- a/R/readGlobalEnergyMonitor.R +++ b/R/readGlobalEnergyMonitor.R @@ -76,9 +76,9 @@ readGlobalEnergyMonitor <- function() { ) %>% select(all_of(cols)) %>% mutate( - !!sym("value") := as.numeric(!!sym("value")), - !!sym("start") := as.numeric(!!sym("start")), - !!sym("end") := as.numeric(!!sym("end")) + "value" = as.numeric(!!sym("value")), + "start" = as.numeric(!!sym("start")), + "end" = as.numeric(!!sym("end")) ) if (!is.null(nb$typeCol)) { @@ -102,7 +102,7 @@ readGlobalEnergyMonitor <- function() { !is.na(!!sym("start")), is.na(!!sym("end")), !!sym("status") %in% status ) %>% - mutate(!!sym("end") := 2050) + mutate("end" = 2050) production <- rbind(completed, ongoing) tmp <- NULL @@ -114,7 +114,7 @@ readGlobalEnergyMonitor <- function() { tmp <- rbind(tmp, d) } cap <- aggregate(value ~ region + period, data = tmp, FUN = sum) %>% - mutate(!!sym("variable") := nb$variable) %>% + mutate("variable" = nb$variable) %>% select("region", "period", "variable", "value") out <- rbind(out, cap) diff --git a/R/readIEA_ETP.R b/R/readIEA_ETP.R index 52b6aacd..ee3adbc2 100644 --- a/R/readIEA_ETP.R +++ b/R/readIEA_ETP.R @@ -546,12 +546,12 @@ readIEA_ETP <- function(subtype) { # drop rownames from worksheet select(-1) %>% # add variable prefix - mutate(variable = paste0(subtypes[[subtype]]$prefix, "|", !!sym("variable"))) %>% + mutate("variable" = paste0(subtypes[[subtype]]$prefix, "|", !!sym("variable"))) %>% pivot_longer( cols = c(-"variable", -"unit"), names_to = "year", names_transform = list("year" = as.integer) ) %>% - mutate(region := sheet, scenario := scenario) + mutate("region" = sheet, "scenario" = scenario) ) } } diff --git a/R/readIRENA.R b/R/readIRENA.R index ce565fd2..3c12b00a 100644 --- a/R/readIRENA.R +++ b/R/readIRENA.R @@ -31,7 +31,7 @@ readIRENA <- function(subtype) { id.vars = c(1, 2), variable.name = "years", value.name = "value" ) %>% - mutate(!!sym("value") := as.numeric(!!sym("value"))) %>% + mutate("value" = as.numeric(!!sym("value"))) %>% suppressWarnings() # rearrange column order to more readable format: year, country, tech, value (capacity or generation) diff --git a/R/readUNFCCC.R b/R/readUNFCCC.R index 1de284df..33314ab8 100644 --- a/R/readUNFCCC.R +++ b/R/readUNFCCC.R @@ -486,8 +486,8 @@ readUNFCCC <- function() { filter(!is.na(!!sym("name"))) %>% reshape2::melt(id.vars = c("name", "region", "year")) %>% mutate( - !!sym("value") := suppressWarnings(as.double(!!sym("value"))), - !!sym("name") := paste0(sub("\\.", "_", i), "|", !!sym("name"), "|", sub(".+ ", "", !!sym("variable"))) + "value" = suppressWarnings(as.double(!!sym("value"))), + "name" = paste0(sub("\\.", "_", i), "|", !!sym("name"), "|", sub(".+ ", "", !!sym("variable"))) ) %>% select(-"name", "unit" = "variable", "variable" = "name") %>% filter(!is.na(!!sym("value"))) diff --git a/R/toolFillEU34Countries.R b/R/toolFillEU34Countries.R index b101423b..43122cd2 100644 --- a/R/toolFillEU34Countries.R +++ b/R/toolFillEU34Countries.R @@ -1,5 +1,5 @@ #' Sets values for 6 EU countries not belonging to EU 28 but EU 34 to zero if -#' they are NA. Used to avoid EUR region not yielding NA because of these countries. +#' they are NA. Used to avoid EUR region yielding NA because of these countries. #' #' @param x magpie object with 249 ISO country codes in the spatial dimension #' @author Falk Benke From c73a8f97d9ea7e9198c3b2c311a91301be6b95f3 Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Mon, 22 Jul 2024 17:07:08 +0200 Subject: [PATCH 19/42] convert currency units in convertUNIDO --- R/UNIDO.R | 15 ++++++++++----- R/calcBiomassPrices.R | 25 ++++++++++++------------- 2 files changed, 22 insertions(+), 18 deletions(-) diff --git a/R/UNIDO.R b/R/UNIDO.R index 64f929ba..e2257018 100644 --- a/R/UNIDO.R +++ b/R/UNIDO.R @@ -258,11 +258,16 @@ convertUNIDO <- function(x, subtype = 'INDSTAT2') # the maximum summarise(value = max(.data$value), .groups = 'drop') - # return ---- + # convert from $2005 to $2017 and return ---- x %>% - as.magpie(spatial = 1, temporal = 3, data = ncol(.)) %>% - toolCountryFill(verbosity = 2) %>% - return() + as.magpie(spatial = 1, temporal = 3, data = ncol(.)) %>% + toolCountryFill(verbosity = 2) %>% + GDPuc::convertGDP( + unit_in = "constant 2005 Int$PPP", + unit_out = "constant 2017 Int$PPP", + replace_NAs = "with_USA" + ) %>% + return() } ) @@ -307,7 +312,7 @@ calcUNIDO <- function(subtype = 'INDSTAT2') return(list(x = x, weight = NULL, - unit = 'billion US$2005/yr', + unit = 'billion US$2017/yr', description = 'industry subsector value added')) } ) diff --git a/R/calcBiomassPrices.R b/R/calcBiomassPrices.R index 41a2bd04..10990e31 100644 --- a/R/calcBiomassPrices.R +++ b/R/calcBiomassPrices.R @@ -1,32 +1,31 @@ #' read biomass supply curves from Magpie emulator #' @return Magpie object with two parameters determining linear biomass supply curve -#' @import mrcommons -calcBiomassPrices <- function(){ - +calcBiomassPrices <- function() { + x <- readSource("MAgPIE", subtype = "supplyCurve_magpie_40") # rename the rcp-scenarios to cm_rcp_scen switches used in REMIND - getNames(x) <- gsub("NDC-nocc_hist-PkBudg650", "rcp20", getNames(x)) + getNames(x) <- gsub("NDC-nocc_hist-PkBudg650", "rcp20", getNames(x)) getNames(x) <- gsub("NDC-nocc_hist-PkBudg1050", "rcp26", getNames(x)) getNames(x) <- gsub("NDC-nocc_hist-NDC", "rcp45", getNames(x)) - getNames(x) <- gsub("NPI-nocc_hist-Base", "none" , getNames(x)) - + getNames(x) <- gsub("NPI-nocc_hist-Base", "none", getNames(x)) + # rename SSP-scenarios to cm_LU_emi_scen switches used in REMIND getNames(x) <- gsub("SSP2EU", "SSP2", getNames(x)) getNames(x) <- gsub("SDP-MC", "SDP", getNames(x)) - + # Introduce new SSP/SDP dimension by replacing "-" with "." - getNames(x) <- gsub("(SSP[0-9]|SDP)-","\\1.",getNames(x)) - + getNames(x) <- gsub("(SSP[0-9]|SDP)-", "\\1.", getNames(x)) + # if fit coefficients of a country are NA for all years (there is no supplycurve at all for this country) # generate artificial supplycurve with VERY high prices - x[,,"a"][is.na(x[,,"a"])] <- 1 - x[,,"b"][is.na(x[,,"b"])] <- 0.1 + x[, , "a"][is.na(x[, , "a"])] <- 1 + x[, , "b"][is.na(x[, , "b"])] <- 0.1 return(list(x = x, - weight = calcOutput("FAOLand", aggregate = F)[,,"6610",pmatch=TRUE][,"y2010",], + weight = calcOutput("FAOLand", aggregate = FALSE)[, , "6610", pmatch = TRUE][, "y2010", ], unit = "none", description = "coefficients for the bioenergy supplycurve", - aggregationFunction=toolBiomassSupplyAggregate)) + aggregationFunction = toolBiomassSupplyAggregate)) } From b55e9b4e03c03621c98fa1e2c83e9861f8221ce7 Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Tue, 23 Jul 2024 14:50:30 +0200 Subject: [PATCH 20/42] apply autoformat --- R/calcCostsTradePeFinancial.R | 25 +++++---- R/calcGEA2012.R | 97 +++++++++++++++++------------------ 2 files changed, 59 insertions(+), 63 deletions(-) diff --git a/R/calcCostsTradePeFinancial.R b/R/calcCostsTradePeFinancial.R index 699fbe50..a717bfe6 100644 --- a/R/calcCostsTradePeFinancial.R +++ b/R/calcCostsTradePeFinancial.R @@ -1,23 +1,22 @@ #' Calculate Trade Cost -#' +#' #' Provides REMIND data for PE trade cost (energy losses on import, export and #' use). -#' -#' +#' +#' #' @author Regina Brecha, Lavinia Baumstark #' @seealso \code{\link{calcOutput}}, \code{\link{readSource}} #' @examples -#' -#' \dontrun{ +#' \dontrun{ #' calcOutput("CostsTradePeFinancial") #' } -#' +#' calcCostsTradePeFinancial <- function() { - - data <- readSource("ExpertGuess", subtype="costsTradePeFinancial") - w <- calcOutput("GDP",aggregate=FALSE)[,2005,"gdp_SSP2"] - - return(list(x=data,weight=w, - unit="TW and ratio", - description="PE tradecosts (financial costs on import, export and use)")) + + data <- readSource("ExpertGuess", subtype = "costsTradePeFinancial") + w <- calcOutput("GDP", aggregate = FALSE)[, 2005, "gdp_SSP2"] + + return(list(x = data, weight = w, + unit = "TW and ratio", + description = "PE tradecosts (financial costs on import, export and use)")) } diff --git a/R/calcGEA2012.R b/R/calcGEA2012.R index 9885032e..da496a14 100644 --- a/R/calcGEA2012.R +++ b/R/calcGEA2012.R @@ -6,73 +6,70 @@ #' @author Stephen Bi #' @seealso \code{\link{calcOutput}} #' @examples -#' -#' \dontrun{ a <- calcOutput("GEA2012") +#' \dontrun{ +#' a <- calcOutput("GEA2012") #' } -#' +#' +calcGEA2012 <- function(subtype, datatype) { -calcGEA2012 <- function(subtype,datatype) { - - mapping <- toolGetMapping(getConfig("regionmapping"),type="regional", where = "mappingfolder") + mapping <- toolGetMapping(getConfig("regionmapping"), type = "regional", where = "mappingfolder") regionNames <- unique(mapping$RegionCode) ts1 <- 5 ts2 <- 10 - ttot <- c(seq(2005,2055,ts1),seq(2060,2100,ts2)) - EJ_2_TWyr <- 1/31.536 + ttot <- c(seq(2005, 2055, ts1), seq(2060, 2100, ts2)) + EJ_2_TWyr <- 1 / 31.536 ngrades <- 7 - scens <- c("low","med","high") + scens <- c("low", "med", "high") nscen <- length(scens) - - if (subtype=='coal') { - x <- readSource("GEA2012",subtype=subtype) - #x <- dimOrder(x,c(1,3,2)) - w <- new.magpie(getRegions(x),getYears(x),getNames(x),fill=1) - w[,,"xi3"] <- NA + + if (subtype == "coal") { + x <- readSource("GEA2012", subtype = subtype) + w <- new.magpie(getRegions(x), getYears(x), getNames(x), fill = 1) + w[, , "xi3"] <- NA mixed <- TRUE unit <- "mixed" - }else if (subtype %in% c('oil','gas')) { - x <- readSource("GEA2012",subtype=subtype) - #x <- dimOrder(x,c(1,3,2)) - w <- new.magpie(getRegions(x),getYears(x),getNames(x),fill=1) - w[,,"xi3"] <- NA + } else if (subtype %in% c("oil", "gas")) { + x <- readSource("GEA2012", subtype = subtype) + w <- new.magpie(getRegions(x), getYears(x), getNames(x), fill = 1) + w[, , "xi3"] <- NA mixed <- TRUE unit <- "mixed" - }else if (subtype=="bounds") { - #This subtype is used to define region-specific bounds found in the GAMS code of the previous implementation of timeDepGrades - if (datatype=="exportbound") { + } else if (subtype == "bounds") { + # This subtype is used to define region-specific bounds found in the GAMS code of the previous implementation of timeDepGrades + if (datatype == "exportbound") { xport2005MEA <- 1.4876897061 - x <- new.magpie(regionNames,ttot,names=paste(rep("peoil",nscen),scens,sep="."),fill=NA) - x["MEA","y2020","peoil"][,,c("low","med")] <- xport2005MEA*1.2877 - x["MEA","y2025","peoil"][,,c("low","med")] <- xport2005MEA*1.40094 - x["MEA","y2030","peoil"][,,c("low","med")] <- xport2005MEA*1.52414 - x["MEA","y2035","peoil"][,,c("low","med")] <- xport2005MEA*1.65817 - x["MEA","y2020","peoil"][,,"high"] <- xport2005MEA*1.2877*1.25 - x["MEA","y2025","peoil"][,,"high"] <- xport2005MEA*1.40094*1.3 - x <- toolNAreplace(x,replaceby = 0)[[1]] + x <- new.magpie(regionNames, ttot, names = paste(rep("peoil", nscen), scens, sep = "."), fill = NA) + x["MEA", "y2020", "peoil"][, , c("low", "med")] <- xport2005MEA * 1.2877 + x["MEA", "y2025", "peoil"][, , c("low", "med")] <- xport2005MEA * 1.40094 + x["MEA", "y2030", "peoil"][, , c("low", "med")] <- xport2005MEA * 1.52414 + x["MEA", "y2035", "peoil"][, , c("low", "med")] <- xport2005MEA * 1.65817 + x["MEA", "y2020", "peoil"][, , "high"] <- xport2005MEA * 1.2877 * 1.25 + x["MEA", "y2025", "peoil"][, , "high"] <- xport2005MEA * 1.40094 * 1.3 + x <- toolNAreplace(x, replaceby = 0)[[1]] unit <- "TWyr" - }else if (datatype=="decoffset") { - #SB 031720 This "decline offset" parameter is taken from the initial implementation of 31_fossil/timeDepGrades pre-moinput by NB & JH - #Comment from *NB, IM* The parameter values are based on World Energy Outlook (2008, 2009) and further assumptions/approximations - x <- new.magpie(regionNames,NULL,names=paste(rep(c("peoil","pegas","pecoal"),each=ngrades),c(1:ngrades),sep="."),fill=-2e-4) - x[c("REF","MEA"),,c("peoil","pegas")] <- -2e-5 + } else if (datatype == "decoffset") { + # SB 031720 This "decline offset" parameter is taken from the initial implementation of 31_fossil/timeDepGrades pre-moinput by NB & JH + # Comment from *NB, IM* The parameter values are based on World Energy Outlook (2008, 2009) and further assumptions/approximations + x <- new.magpie(regionNames, NULL, names = paste(rep(c("peoil", "pegas", "pecoal"), each = ngrades), c(1:ngrades), sep = "."), fill = -2e-4) + x[c("REF", "MEA"), , c("peoil", "pegas")] <- -2e-5 unit <- "TWyr" - }else if (datatype=="extraseed") { - x <- new.magpie(regionNames,ttot,names=paste(rep(c("peoil","pegas"),each=ngrades),c(1:ngrades),sep="."),fill=0) - x["USA","y2010","pegas"] [,,"2"] <- 2*EJ_2_TWyr + } else if (datatype == "extraseed") { + x <- new.magpie(regionNames, ttot, names = paste(rep(c("peoil", "pegas"), each = ngrades), c(1:ngrades), sep = "."), fill = 0) + x["USA", "y2010", "pegas"] [, , "2"] <- 2 * EJ_2_TWyr unit <- "TWyr" } - x <- toolAggregate(x,mapping,weight=NULL) - w <- new.magpie(getRegions(x),getYears(x),getNames(x),fill=1) + x <- toolAggregate(x, mapping, weight = NULL) + w <- new.magpie(getRegions(x), getYears(x), getNames(x), fill = 1) mixed <- FALSE - }else { + } else { stop("Invalid subtype. Please choose oil, gas, coal, or bounds.") } - - return(list(x=x, - weight=w, - unit=unit, - description=paste("Cost grades and quantities of",subtype), - note=c("Data from the IIASA Global Energy Assessment 2012"), - mixed_aggregation=mixed)) - + + return(list(x = x, + weight = w, + unit = unit, + description = paste("Cost grades and quantities of", subtype), + note = c("Data from the IIASA Global Energy Assessment 2012"), + mixed_aggregation = mixed)) + } From 58fd7c5c1cf88ee929a140e6f3db6cd8c57330b9 Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Wed, 24 Jul 2024 10:15:02 +0200 Subject: [PATCH 21/42] convert unit in calcCostsTrandePeFinancial --- R/calcCostsTradePeFinancial.R | 24 ++++++++++++++++-------- 1 file changed, 16 insertions(+), 8 deletions(-) diff --git a/R/calcCostsTradePeFinancial.R b/R/calcCostsTradePeFinancial.R index a717bfe6..7ff1b8c3 100644 --- a/R/calcCostsTradePeFinancial.R +++ b/R/calcCostsTradePeFinancial.R @@ -1,8 +1,6 @@ #' Calculate Trade Cost #' -#' Provides REMIND data for PE trade cost (energy losses on import, export and -#' use). -#' +#' Provides REMIND data for PE trade cost (energy losses on import, export and use). #' #' @author Regina Brecha, Lavinia Baumstark #' @seealso \code{\link{calcOutput}}, \code{\link{readSource}} @@ -12,11 +10,21 @@ #' } #' calcCostsTradePeFinancial <- function() { - data <- readSource("ExpertGuess", subtype = "costsTradePeFinancial") - w <- calcOutput("GDP", aggregate = FALSE)[, 2005, "gdp_SSP2"] - return(list(x = data, weight = w, - unit = "TW and ratio", - description = "PE tradecosts (financial costs on import, export and use)")) + data <- GDPuc::convertGDP( + gdp = data, + unit_in = "constant 2005 Int$PPP", + unit_out = "constant 2017 Int$PPP", + replace_NAs = "with_USA" + ) + + w <- calcOutput("GDP", aggregate = FALSE)[, 2005, "gdp_SSP2"] + + return(list( + x = data, + weight = w, + unit = "T US$2017/TWa", + description = "PE tradecosts (financial costs on import, export and use)" + )) } From 53e9506091bf92628f4516524d430f73d1e6c0ad Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Wed, 24 Jul 2024 12:11:58 +0200 Subject: [PATCH 22/42] convert costs in convertGEA2021 --- R/calcGEA2012.R | 14 +++++--------- R/convertGEA2012.R | 16 ++++++++++++++++ 2 files changed, 21 insertions(+), 9 deletions(-) diff --git a/R/calcGEA2012.R b/R/calcGEA2012.R index da496a14..7e4f400c 100644 --- a/R/calcGEA2012.R +++ b/R/calcGEA2012.R @@ -22,18 +22,14 @@ calcGEA2012 <- function(subtype, datatype) { scens <- c("low", "med", "high") nscen <- length(scens) - if (subtype == "coal") { + if (subtype %in% c("oil", "gas", "coal")) { x <- readSource("GEA2012", subtype = subtype) w <- new.magpie(getRegions(x), getYears(x), getNames(x), fill = 1) w[, , "xi3"] <- NA mixed <- TRUE - unit <- "mixed" - } else if (subtype %in% c("oil", "gas")) { - x <- readSource("GEA2012", subtype = subtype) - w <- new.magpie(getRegions(x), getYears(x), getNames(x), fill = 1) - w[, , "xi3"] <- NA - mixed <- TRUE - unit <- "mixed" + # TODO: confirm the unit for cost grades, as it is merely an educated guess + unit <- "cost grades (xi1 and xi2) in T US$2017/TWa; quantities (xi3) in TWa" + } else if (subtype == "bounds") { # This subtype is used to define region-specific bounds found in the GAMS code of the previous implementation of timeDepGrades if (datatype == "exportbound") { @@ -68,7 +64,7 @@ calcGEA2012 <- function(subtype, datatype) { return(list(x = x, weight = w, unit = unit, - description = paste("Cost grades and quantities of", subtype), + description = paste("Cost grades and quantities of ", subtype), note = c("Data from the IIASA Global Energy Assessment 2012"), mixed_aggregation = mixed)) diff --git a/R/convertGEA2012.R b/R/convertGEA2012.R index 606d6926..96a24d03 100644 --- a/R/convertGEA2012.R +++ b/R/convertGEA2012.R @@ -56,5 +56,21 @@ convertGEA2012 <- function(x, subtype) { out <- mbind(out, toolAggregate(x[, , c("xi1", "xi2", "dec")], mapping, weight = NULL)) } + if (subtype %in% c("oil", "coal", "gas")) { + + # convert T US$2005/TWa -> T US$2017/TWa for cost factors xi1 and xi2 + tmp <- GDPuc::convertGDP( + gdp = out[, , c("xi1", "xi2")], + unit_in = "constant 2005 Int$PPP", + unit_out = "constant 2017 Int$PPP", + replace_NAs = "with_USA" + ) + + out <- mbind(tmp, out[, , c("xi1", "xi2"), invert = TRUE]) + + } else { + out <- x + } + return(out) } From 6d0a8ab523bc1dc2e5422502402ee4eebe7aebc2 Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Thu, 25 Jul 2024 12:02:58 +0200 Subject: [PATCH 23/42] specify parameters to calcMACCsCH4 and calcMACCsN2O explicitly --- R/calcMACCsCO2.R | 14 ++++++-------- R/fullREMIND.R | 4 ++-- 2 files changed, 8 insertions(+), 10 deletions(-) diff --git a/R/calcMACCsCO2.R b/R/calcMACCsCO2.R index 60d9ed52..b4ffe0f5 100644 --- a/R/calcMACCsCO2.R +++ b/R/calcMACCsCO2.R @@ -1,19 +1,17 @@ #' Read in abatement potential for CO2 land-use change derived from MAgPIE -#' +#' #' Rrange of possible abatement between maximum and minimum emission level in a year -#' +#' #' @return MAgPIE object #' @author David Klein #' @examples -#' -#' \dontrun{ +#' \dontrun{ #' calcOutput("MACCsCO2") -#' #' } calcMACCsCO2 <- function() { - - x <- readSource("MAgPIE", subtype = "abatparam_co2",convert=FALSE) - + + x <- readSource("MAgPIE", subtype = "abatparam_co2", convert = FALSE) + # No weight for aggregation needed since data is global return(list(x = x, diff --git a/R/fullREMIND.R b/R/fullREMIND.R index f133efa3..0cd2851e 100644 --- a/R/fullREMIND.R +++ b/R/fullREMIND.R @@ -79,8 +79,8 @@ fullREMIND <- function() { calcOutput("EmiMac", round = 5, file = "p_macBase2005.cs4r") calcOutput("EmiMac1990", round = 5, file = "p_macBase1990.cs4r") calcOutput("MACCbaseN2O", round = 5, file = "p_macBaseVanv.cs4r") - calcOutput("MACCsCH4", round = 6, file = "p_abatparam_CH4.cs4r") - calcOutput("MACCsN2O", round = 6, file = "p_abatparam_N2O.cs4r") + calcOutput("MACCsCH4", source = "ImageMacc", round = 6, file = "p_abatparam_CH4.cs4r") + calcOutput("MACCsN2O", source = "ImageMacc", round = 6, file = "p_abatparam_N2O.cs4r") calcOutput("FGas", round = 6, file = "f_emiFgas.cs4r") calcOutput("EmiFossilFuelExtr", round = 6, file = "p_emiFossilFuelExtr.cs4r") calcOutput("Region2MAGICC", round = 6, file = "p_regi_2_MAGICC_regions.cs3r") From 7d3047509ae0e5a9bea76b638ac3ac88d66dd7ef Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Thu, 25 Jul 2024 15:53:52 +0200 Subject: [PATCH 24/42] convert GDP in calcBiomassPrices --- R/calcBiomassPrices.R | 9 +++++++++ 1 file changed, 9 insertions(+) diff --git a/R/calcBiomassPrices.R b/R/calcBiomassPrices.R index 10990e31..07a2746c 100644 --- a/R/calcBiomassPrices.R +++ b/R/calcBiomassPrices.R @@ -23,6 +23,15 @@ calcBiomassPrices <- function() { x[, , "a"][is.na(x[, , "a"])] <- 1 x[, , "b"][is.na(x[, , "b"])] <- 0.1 + # apply conversion from US$2005 to US$2017 to "a" and "b", so that the price + # calculated with these coefficients will be in US$2017 + x <- GDPuc::convertGDP( + gdp = x, + unit_in = "constant 2005 US$MER", + unit_out = "constant 2017 Int$PPP", + replace_NAs = "with_USA" + ) + return(list(x = x, weight = calcOutput("FAOLand", aggregate = FALSE)[, , "6610", pmatch = TRUE][, "y2010", ], unit = "none", From 856ed5c5c57499d83ee577f783c396a7881cdd44 Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Fri, 26 Jul 2024 16:02:54 +0200 Subject: [PATCH 25/42] convert prices in calcBP --- R/calcBP.R | 35 +++++++++++++++++-- .../extdata/reportingVariables/Mapping_BP.csv | 9 ++--- 2 files changed, 36 insertions(+), 8 deletions(-) diff --git a/R/calcBP.R b/R/calcBP.R index 591288a4..db195e75 100644 --- a/R/calcBP.R +++ b/R/calcBP.R @@ -139,15 +139,46 @@ calcBP <- function() { to = "to", verbosity = 2 ) + # convert price units ---- + + # should be from US$2023, but 'convertGDP' currently returns NA + poil <- GDPuc::convertGDP( + gdp = x[, , "Price|Primary Energy|Oil (US$2023/GJ)"], + unit_in = "constant 2022 US$MER", + unit_out = "constant 2017 Int$PPP", + replace_NAs = "with_USA" + ) + + getNames(poil) <- gsub("\\$2023", "\\$2017", getNames(poil)) + + # assume these units are in current MER + pcoalgas <- GDPuc::convertGDP( + gdp = x[, , c("Price|Primary Energy|Gas (US$/GJ)", "Price|Primary Energy|Coal (US$/GJ)")], + unit_in = "current US$MER", + unit_out = "constant 2017 Int$PPP", + replace_NAs = "with_USA" + ) + + getNames(pcoalgas) <- gsub("\\$", "\\$2017", getNames(pcoalgas)) + + + x <- x[, , c("Price|Primary Energy|Oil (US$2023/GJ)", + "Price|Primary Energy|Gas (US$/GJ)", + "Price|Primary Energy|Coal (US$/GJ)"), invert = TRUE] + + x <- mbind(x, poil, pcoalgas) + + # set weights ---- + weights <- x weights[, , ] <- NA - weights[, , "US$2005/GJ", pmatch = TRUE] <- 1 + weights[, , "US$2017/GJ", pmatch = TRUE] <- 1 return(list( x = x, weight = weights, mixed_aggregation = TRUE, - unit = c("Mt CO2/yr", "GW", "EJ/yr", "US$2005/GJ"), + unit = c("Mt CO2/yr", "GW", "EJ/yr", "US$2017/GJ"), description = "Historical World Energy Statistics values as REMIND variables" )) } diff --git a/inst/extdata/reportingVariables/Mapping_BP.csv b/inst/extdata/reportingVariables/Mapping_BP.csv index b396b7c5..f959709e 100755 --- a/inst/extdata/reportingVariables/Mapping_BP.csv +++ b/inst/extdata/reportingVariables/Mapping_BP.csv @@ -36,10 +36,7 @@ Trade|Export|Coal,EJ,1,EJ/yr,Trade|Exports|Coal,, Trade|Import|Coal,EJ,1,EJ/yr,Trade|Imports|Coal,, Net Trade|Coal,EJ,1,EJ/yr,Trade|Coal,, Price|Crude Oil,$2023/bbl,0.163425396306586,US$2023/GJ,Price|Primary Energy|Oil,"source: 1 barrel of oil equivalent (boe) = 6.119 million kJ -Conversion: 1 / 6.119 -TODO: consider unit conversion to US$2017", -Price|Natural Gas,$/mbtu,1.05,US$/GJ,Price|Primary Energy|Gas,"source: 1 trillion British thermal units = 1.050 petajoules NG -TODO: consider unit conversion to US$2017", -Price|Coal,$/t,0.025,US$/GJ,Price|Primary Energy|Coal,"source: 1EJ = 40 million tonnes of hard coal -TODO: consider unit conversion to US$2017", +Conversion: 1 / 6.119", +Price|Natural Gas,$/mbtu,1.05,US$/GJ,Price|Primary Energy|Gas,source: 1 trillion British thermal units = 1.050 petajoules NG, +Price|Coal,$/t,0.025,US$/GJ,Price|Primary Energy|Coal,source: 1EJ = 40 million tonnes of hard coal, Emi|CO2,Mt CO2,1,Mt CO2/yr,Emi|CO2|Energy,, From f4c93db521d919124e61319b4351a526291854b2 Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Mon, 29 Jul 2024 14:23:57 +0200 Subject: [PATCH 26/42] increment version (dev) --- .buildlibrary | 2 +- CITATION.cff | 4 ++-- DESCRIPTION | 4 ++-- README.md | 6 +++--- man/calcCostsTradePeFinancial.Rd | 6 ++---- man/calcCostsWeathering.Rd | 1 - man/calcDiffInvestCosts.Rd | 9 +++++---- man/calcEconometricEmiParameter.Rd | 4 ++-- man/calcFETaxes.Rd | 2 -- man/calcGEA2012.Rd | 4 ++-- man/calcMACCsCO2.Rd | 4 +--- man/calcPETaxes.Rd | 2 -- man/convertIEA_PVPS.Rd | 4 +--- man/convertIIASA_subs_taxes.Rd | 11 ++++++++--- man/readIEA_PVPS.Rd | 5 +---- man/readIIASA_subs_taxes.Rd | 2 +- 16 files changed, 31 insertions(+), 39 deletions(-) diff --git a/.buildlibrary b/.buildlibrary index 667fcb6d..28d5f976 100644 --- a/.buildlibrary +++ b/.buildlibrary @@ -1,4 +1,4 @@ -ValidationKey: '36687448' +ValidationKey: '367145946933' 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 c0448e62..ddf05dc9 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.184.1 -date-released: '2024-07-24' +version: 0.184.1.9001 +date-released: '2024-07-29' abstract: The mrremind packages contains data preprocessing for the REMIND model. authors: - family-names: Baumstark diff --git a/DESCRIPTION b/DESCRIPTION index 98a0e686..da11313a 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -1,8 +1,8 @@ Type: Package Package: mrremind Title: MadRat REMIND Input Data Package -Version: 0.184.1 -Date: 2024-07-24 +Version: 0.184.1.9001 +Date: 2024-07-29 Authors@R: c( person("Lavinia", "Baumstark", , "lavinia@pik-potsdam.de", role = c("aut", "cre")), person("Renato", "Rodrigues", role = "aut"), diff --git a/README.md b/README.md index ef12c4c0..a062704b 100644 --- a/README.md +++ b/README.md @@ -1,6 +1,6 @@ # MadRat REMIND Input Data Package -R package **mrremind**, version **0.184.1** +R package **mrremind**, version **0.184.1.9001** [![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.184.1.9001, . 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.184.1}, + note = {R package version 0.184.1.9001}, url = {https://github.com/pik-piam/mrremind}, } ``` diff --git a/man/calcCostsTradePeFinancial.Rd b/man/calcCostsTradePeFinancial.Rd index a6e78ec1..f232b6dc 100644 --- a/man/calcCostsTradePeFinancial.Rd +++ b/man/calcCostsTradePeFinancial.Rd @@ -7,12 +7,10 @@ calcCostsTradePeFinancial() } \description{ -Provides REMIND data for PE trade cost (energy losses on import, export and -use). +Provides REMIND data for PE trade cost (energy losses on import, export and use). } \examples{ - -\dontrun{ +\dontrun{ calcOutput("CostsTradePeFinancial") } diff --git a/man/calcCostsWeathering.Rd b/man/calcCostsWeathering.Rd index 9e1ab247..91b3e4fe 100644 --- a/man/calcCostsWeathering.Rd +++ b/man/calcCostsWeathering.Rd @@ -13,7 +13,6 @@ transport costs of spreading rock on the fields Calculate costs of transport of enhanced weathering } \examples{ - \dontrun{ calcOutput("CostsWeathering") } diff --git a/man/calcDiffInvestCosts.Rd b/man/calcDiffInvestCosts.Rd index 5492967d..d9cd704f 100644 --- a/man/calcDiffInvestCosts.Rd +++ b/man/calcDiffInvestCosts.Rd @@ -7,17 +7,18 @@ calcDiffInvestCosts(subtype) } \arguments{ -\item{subtype}{Investment Costs, I&M Costs, and Efficiency} +\item{subtype}{either "Invest_Costs" or "Efficiency"} } \value{ -Magpie object with aggregated but diffrentiated investment costs for some technologies. +Magpie object with aggregated but differentiated investment costs for some technologies. } \description{ Disaggregated investment cost data is aggregated and technologies renamed to REMIND names } \details{ -REMIND does not have a classification of coal power plants e.g., sub-critical. Therefore, countries are given coal plant -costs assuming what type of coal plants are expected to develop there. For other technologies, certain assumptions are taken +REMIND does not have a classification of coal power plants e.g., sub-critical. +Therefore, countries are given coal plant costs assuming what type of coal plants are +expected to develop there. For other technologies, certain assumptions are taken to change to REMIND convention. } \author{ diff --git a/man/calcEconometricEmiParameter.Rd b/man/calcEconometricEmiParameter.Rd index cc217d8b..c00c07ee 100644 --- a/man/calcEconometricEmiParameter.Rd +++ b/man/calcEconometricEmiParameter.Rd @@ -7,8 +7,8 @@ calcEconometricEmiParameter() } \value{ -REMIND data forCO2 parameters to calculate baseline emissions of -waste from population and investment and corresonding weights (population) +REMIND data for CO2 parameters to calculate baseline emissions of +waste from population and investment and corresponding weights (population) as a list of two MAgPIE objects } \description{ diff --git a/man/calcFETaxes.Rd b/man/calcFETaxes.Rd index b39f37b4..5061bea8 100644 --- a/man/calcFETaxes.Rd +++ b/man/calcFETaxes.Rd @@ -19,10 +19,8 @@ calculate taxes at the final energy delivery level to the end-use sectors respective energy quantities as weights. } \examples{ - \dontrun{ calcOutput("FETaxes") - } } diff --git a/man/calcGEA2012.Rd b/man/calcGEA2012.Rd index cea099d1..a53fe8d7 100644 --- a/man/calcGEA2012.Rd +++ b/man/calcGEA2012.Rd @@ -18,8 +18,8 @@ MAgPIE object containing regionally aggregated GEA 2012 data Extracts oil, gas and coal data from the GEA 2012 into a scenario- and time-dependent grade structure } \examples{ - -\dontrun{ a <- calcOutput("GEA2012") +\dontrun{ +a <- calcOutput("GEA2012") } } diff --git a/man/calcMACCsCO2.Rd b/man/calcMACCsCO2.Rd index 840a18e1..c4cace1e 100644 --- a/man/calcMACCsCO2.Rd +++ b/man/calcMACCsCO2.Rd @@ -13,10 +13,8 @@ MAgPIE object Rrange of possible abatement between maximum and minimum emission level in a year } \examples{ - -\dontrun{ +\dontrun{ calcOutput("MACCsCO2") - } } \author{ diff --git a/man/calcPETaxes.Rd b/man/calcPETaxes.Rd index e257863b..381fc12b 100644 --- a/man/calcPETaxes.Rd +++ b/man/calcPETaxes.Rd @@ -18,10 +18,8 @@ calculate taxes at primary energy level. Regional aggregation is done via the respective energy quantities as weights. } \examples{ - \dontrun{ calcOutput("PETaxes") - } } diff --git a/man/convertIEA_PVPS.Rd b/man/convertIEA_PVPS.Rd index cd8cf18d..59043ca5 100644 --- a/man/convertIEA_PVPS.Rd +++ b/man/convertIEA_PVPS.Rd @@ -4,12 +4,10 @@ \alias{convertIEA_PVPS} \title{Convert IEA PVPS data from REMIND regions to iso countries} \usage{ -convertIEA_PVPS(x, subtype) +convertIEA_PVPS(x) } \arguments{ \item{x}{MAgPIE object to be converted} - -\item{subtype}{type of data read from IEA PVPS} } \value{ Magpie object with IEA PVPS investment cost per country diff --git a/man/convertIIASA_subs_taxes.Rd b/man/convertIIASA_subs_taxes.Rd index 31c7d66d..90898429 100644 --- a/man/convertIIASA_subs_taxes.Rd +++ b/man/convertIIASA_subs_taxes.Rd @@ -4,11 +4,16 @@ \alias{convertIIASA_subs_taxes} \title{Convert IIASA_subs_taxes data} \usage{ -convertIIASA_subs_taxes(x) +convertIIASA_subs_taxes(x, subtype) } \arguments{ \item{x}{MAgPIE object containing IIASA subsidies and taxes data in country resolution} + +\item{subtype}{Type of country level data as compiled by IIASA that should +be read in. Available types are: \itemize{ \item \code{tax_rate}: tax rate +pre final energy category \item \code{subsidies_bulk}: subsidy rate per final +energy category \item \code{energy}: final energy quantities per category }} } \value{ IIASA_subs_taxes data as MAgPIE object aggregated to country level @@ -18,8 +23,8 @@ Convert IIASA subsidy and taxes data on ISO country level (removes countries not part of 249 oficial ISO countries and fills missing with zeros). } \examples{ - -\dontrun{ a <- convertIIASA_subs_taxes(x) +\dontrun{ +a <- convertIIASA_subs_taxes(x) } } diff --git a/man/readIEA_PVPS.Rd b/man/readIEA_PVPS.Rd index e49384ef..500498df 100644 --- a/man/readIEA_PVPS.Rd +++ b/man/readIEA_PVPS.Rd @@ -4,10 +4,7 @@ \alias{readIEA_PVPS} \title{Reads PV investment cost data for 2020 which are based on 2018 data from IEA PVPS report} \usage{ -readIEA_PVPS(subtype) -} -\arguments{ -\item{subtype}{type of data read from IEA PVPS} +readIEA_PVPS() } \value{ magpie object with PV investment cost data diff --git a/man/readIIASA_subs_taxes.Rd b/man/readIIASA_subs_taxes.Rd index 71b5d48e..dc858715 100644 --- a/man/readIIASA_subs_taxes.Rd +++ b/man/readIIASA_subs_taxes.Rd @@ -9,7 +9,7 @@ readIIASA_subs_taxes(subtype) \arguments{ \item{subtype}{Type of country level data as compiled by IIASA that should be read in. Available types are: \itemize{ \item \code{tax_rate}: tax rate -pre final energy category \item \code{sub_rate}: subsidy rate per final +pre final energy category \item \code{subsidies_bulk}: subsidy rate per final energy category \item \code{energy}: final energy quantities per category }} } \value{ From 7fb6a9aa176e28d83820ae9eea06bbc833320409 Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Fri, 2 Aug 2024 14:03:14 +0200 Subject: [PATCH 27/42] change default unit assumption for units from Int to US --- R/UNIDO.R | 6 +++--- R/calcBP.R | 8 ++++---- R/calcBiomassPrices.R | 4 ++-- R/calcCO2Prices.R | 6 +++--- R/calcCostsTradePeFinancial.R | 6 +++--- R/calcCostsWeathering.R | 7 +++---- R/calcDiffInvestCosts.R | 8 ++++---- R/calcEU_ReferenceScenario.R | 8 ++++---- R/calcEconometricEmiParameter.R | 6 +++--- R/calcFossilExtraction.R | 4 ++-- R/calcINNOPATHS.R | 4 ++-- R/calcIndustry_EEK.R | 6 +++--- R/calcJRC_IDEES.R | 4 ++-- R/calcMacroInvestments.R | 2 +- R/calcTaxConvergence.R | 6 +++--- R/calcTaxLimits.R | 6 +++--- R/calcTaxXport.R | 6 +++--- R/convertDylanAusGasCost.R | 4 ++-- R/convertGEA2012.R | 6 +++--- R/convertIIASA_subs_taxes.R | 6 +++--- 20 files changed, 56 insertions(+), 57 deletions(-) diff --git a/R/UNIDO.R b/R/UNIDO.R index e2257018..61919282 100644 --- a/R/UNIDO.R +++ b/R/UNIDO.R @@ -263,9 +263,9 @@ convertUNIDO <- function(x, subtype = 'INDSTAT2') as.magpie(spatial = 1, temporal = 3, data = ncol(.)) %>% toolCountryFill(verbosity = 2) %>% GDPuc::convertGDP( - unit_in = "constant 2005 Int$PPP", - unit_out = "constant 2017 Int$PPP", - replace_NAs = "with_USA" + unit_in = "constant 2005 US$MER", + unit_out = mrdrivers::toolGetUnitDollar(), + replace_NAs = c("linear", "with_USA") ) %>% return() } diff --git a/R/calcBP.R b/R/calcBP.R index db195e75..49c982d1 100644 --- a/R/calcBP.R +++ b/R/calcBP.R @@ -145,8 +145,8 @@ calcBP <- function() { poil <- GDPuc::convertGDP( gdp = x[, , "Price|Primary Energy|Oil (US$2023/GJ)"], unit_in = "constant 2022 US$MER", - unit_out = "constant 2017 Int$PPP", - replace_NAs = "with_USA" + unit_out = mrdrivers::toolGetUnitDollar(), + replace_NAs = c("linear", "with_USA") ) getNames(poil) <- gsub("\\$2023", "\\$2017", getNames(poil)) @@ -155,8 +155,8 @@ calcBP <- function() { pcoalgas <- GDPuc::convertGDP( gdp = x[, , c("Price|Primary Energy|Gas (US$/GJ)", "Price|Primary Energy|Coal (US$/GJ)")], unit_in = "current US$MER", - unit_out = "constant 2017 Int$PPP", - replace_NAs = "with_USA" + unit_out = mrdrivers::toolGetUnitDollar(), + replace_NAs = c("linear", "with_USA") ) getNames(pcoalgas) <- gsub("\\$", "\\$2017", getNames(pcoalgas)) diff --git a/R/calcBiomassPrices.R b/R/calcBiomassPrices.R index 07a2746c..90ac0afe 100644 --- a/R/calcBiomassPrices.R +++ b/R/calcBiomassPrices.R @@ -28,8 +28,8 @@ calcBiomassPrices <- function() { x <- GDPuc::convertGDP( gdp = x, unit_in = "constant 2005 US$MER", - unit_out = "constant 2017 Int$PPP", - replace_NAs = "with_USA" + unit_out = mrdrivers::toolGetUnitDollar(), + replace_NAs = c("linear", "with_USA") ) return(list(x = x, diff --git a/R/calcCO2Prices.R b/R/calcCO2Prices.R index b772cf88..af6b421e 100644 --- a/R/calcCO2Prices.R +++ b/R/calcCO2Prices.R @@ -8,9 +8,9 @@ calcCO2Prices <- function() { x <- GDPuc::convertGDP( gdp = x, - unit_in = "constant 2005 Int$PPP", - unit_out = "constant 2017 Int$PPP", - replace_NAs = "with_USA" + unit_in = "constant 2005 US$MER", + unit_out = mrdrivers::toolGetUnitDollar(), + replace_NAs = c("linear", "with_USA") ) # read data used for weight diff --git a/R/calcCostsTradePeFinancial.R b/R/calcCostsTradePeFinancial.R index 7ff1b8c3..0a80c48d 100644 --- a/R/calcCostsTradePeFinancial.R +++ b/R/calcCostsTradePeFinancial.R @@ -14,9 +14,9 @@ calcCostsTradePeFinancial <- function() { data <- GDPuc::convertGDP( gdp = data, - unit_in = "constant 2005 Int$PPP", - unit_out = "constant 2017 Int$PPP", - replace_NAs = "with_USA" + unit_in = "constant 2005 US$MER", + unit_out = mrdrivers::toolGetUnitDollar(), + replace_NAs = c("linear", "with_USA") ) w <- calcOutput("GDP", aggregate = FALSE)[, 2005, "gdp_SSP2"] diff --git a/R/calcCostsWeathering.R b/R/calcCostsWeathering.R index 7edb9bea..6f3259b6 100644 --- a/R/calcCostsWeathering.R +++ b/R/calcCostsWeathering.R @@ -11,12 +11,11 @@ calcCostsWeathering <- function() { costs <- readSource("Strefler", subtype = "weathering_costs") # convert from $2005 to $2017 - x <- GDPuc::convertGDP( gdp = costs, - unit_in = "constant 2005 Int$PPP", - unit_out = "constant 2017 Int$PPP", - replace_NAs = "with_USA" + unit_in = "constant 2005 US$MER", + unit_out = mrdrivers::toolGetUnitDollar(), + replace_NAs = c("linear", "with_USA") ) weight <- costs # get the same dimensions of the data diff --git a/R/calcDiffInvestCosts.R b/R/calcDiffInvestCosts.R index 6017169f..63c99742 100644 --- a/R/calcDiffInvestCosts.R +++ b/R/calcDiffInvestCosts.R @@ -163,9 +163,9 @@ calcDiffInvestCosts <- function(subtype) { x_new <- GDPuc::convertGDP( gdp = x_new, - unit_in = "constant 2015 Int$PPP", - unit_out = "constant 2017 Int$PPP", - replace_NAs = "with_USA" + unit_in = "constant 2015 US$MER", + unit_out = mrdrivers::toolGetUnitDollar(), + replace_NAs = c("linear", "with_USA") ) return(list( @@ -177,7 +177,7 @@ calcDiffInvestCosts <- function(subtype) { } else if (subtype == "Efficiency") { x <- readSource("IEA_WEO", subtype = "Efficiency") - x[, , ] <- as.numeric(x[, , ]) # convertng data values into numeric + x[, , ] <- as.numeric(x[, , ]) # converting data values into numeric # Various mapping files used to get needed mappings, for e.g., South Asia countries <- toolGetMapping("regionmappingREMIND.csv", where = "mappingfolder", type = "regional") diff --git a/R/calcEU_ReferenceScenario.R b/R/calcEU_ReferenceScenario.R index 3229dbb6..3b20a7c3 100644 --- a/R/calcEU_ReferenceScenario.R +++ b/R/calcEU_ReferenceScenario.R @@ -6,8 +6,8 @@ calcEU_ReferenceScenario <- function() { tmp <- GDPuc::convertGDP( gdp = euRef2016[, , "Price|Secondary Energy|Electricity (EUR2013/GJ)"], unit_in = "constant 2013 €", - unit_out = "constant 2017 Int$PPP", - replace_NAs = "with_USA" + unit_out = mrdrivers::toolGetUnitDollar(), + replace_NAs = c("linear", "with_USA") ) getNames(tmp) <- "Price|Secondary Energy|Electricity (US$2017/GJ)" @@ -22,8 +22,8 @@ calcEU_ReferenceScenario <- function() { tmp <- GDPuc::convertGDP( gdp = euRef2020[, , "Price|Secondary Energy|Electricity (EUR2015/GJ)"], unit_in = "constant 2015 €", - unit_out = "constant 2017 Int$PPP", - replace_NAs = "with_USA" + unit_out = mrdrivers::toolGetUnitDollar(), + replace_NAs = c("linear", "with_USA") ) getNames(tmp) <- "Price|Secondary Energy|Electricity (US$2017/GJ)" diff --git a/R/calcEconometricEmiParameter.R b/R/calcEconometricEmiParameter.R index 8c0df5f4..7cccd874 100644 --- a/R/calcEconometricEmiParameter.R +++ b/R/calcEconometricEmiParameter.R @@ -34,9 +34,9 @@ calcEconometricEmiParameter <- function() { p4 <- GDPuc::convertGDP( gdp = p4, - unit_in = "constant 2005 Int$PPP", - unit_out = "constant 2017 Int$PPP", - replace_NAs = "with_USA" + unit_in = "constant 2005 US$MER", + unit_out = mrdrivers::toolGetUnitDollar(), + replace_NAs = c("linear", "with_USA") ) # combine all parameters diff --git a/R/calcFossilExtraction.R b/R/calcFossilExtraction.R index 1885c37c..2ab225e4 100644 --- a/R/calcFossilExtraction.R +++ b/R/calcFossilExtraction.R @@ -50,9 +50,9 @@ calcFossilExtraction <- function(subtype = "FossilExtraction") { # (1.58 is lowest price in gas extraction data after 2015) DIIS <- data.frame( Res = 23000, - Price = GDPuc::convertSingle(x = 1.5, iso3c = "USA", + Price = GDPuc::convertSingle(x = 1.5, iso3c = "AUS", unit_in = "constant 2015 LCU", - unit_out = "constant 2017 Int$PPP") + unit_out = mrdrivers::toolGetUnitDollar()) ) RegrData <- RegrData %>% diff --git a/R/calcINNOPATHS.R b/R/calcINNOPATHS.R index 21cf2197..9753639b 100644 --- a/R/calcINNOPATHS.R +++ b/R/calcINNOPATHS.R @@ -37,8 +37,8 @@ calcINNOPATHS <- function() { tmp <- GDPuc::convertGDP( gdp = tmp, unit_in = "constant 2015 €", - unit_out = "constant 2017 Int$PPP", - replace_NAs = "with_USA" + unit_out = mrdrivers::toolGetUnitDollar(), + replace_NAs = c("linear", "with_USA") ) x <- mbind(x, tmp) diff --git a/R/calcIndustry_EEK.R b/R/calcIndustry_EEK.R index 423b9e97..653e8047 100644 --- a/R/calcIndustry_EEK.R +++ b/R/calcIndustry_EEK.R @@ -109,9 +109,9 @@ calcIndustry_EEK <- function(kap) { ## Converting from billion 2012 to trillion 2017 dollars EEK <- EEK %>% dplyr::rename("value" = "EEK") %>% - GDPuc::convertGDP(unit_in = "constant 2012 Int$PPP", - unit_out = "constant 2017 Int$PPP", - replace_NAs = "with_USA") %>% + GDPuc::convertGDP(unit_in = "constant 2012 US$MER", + unit_out = mrdrivers::toolGetUnitDollar(), + replace_NAs = c("linear", "with_USA")) %>% dplyr::mutate(value = .data$value * 1e-3) %>% dplyr::rename("EEK" = "value") diff --git a/R/calcJRC_IDEES.R b/R/calcJRC_IDEES.R index a9520a7e..565ee7ba 100644 --- a/R/calcJRC_IDEES.R +++ b/R/calcJRC_IDEES.R @@ -82,8 +82,8 @@ calcJRC_IDEES <- function(subtype) { tmp <- GDPuc::convertGDP( gdp = tmp, unit_in = "constant 2010 €", - unit_out = "constant 2017 Int$PPP", - replace_NAs = "with_USA" + unit_out = mrdrivers::toolGetUnitDollar(), + replace_NAs = c("linear", "with_USA") ) x <- mbind(x, tmp) } diff --git a/R/calcMacroInvestments.R b/R/calcMacroInvestments.R index f6024bee..c73e3fc5 100644 --- a/R/calcMacroInvestments.R +++ b/R/calcMacroInvestments.R @@ -19,6 +19,6 @@ calcMacroInvestments <- function() { x = data, weight = NULL, unit = "trillion 20017US$", - description = "Investments in the macro-economic capital stock in constant 2017 Int$PPP" + description = "Investments in the macro-economic capital stock in constant 2017 US$MER" )) } diff --git a/R/calcTaxConvergence.R b/R/calcTaxConvergence.R index 1dfce479..1f7bbbb1 100644 --- a/R/calcTaxConvergence.R +++ b/R/calcTaxConvergence.R @@ -20,9 +20,9 @@ calcTaxConvergence <- function() { # convert data from $2005 to $2017 taxConvergence <- GDPuc::convertGDP( gdp = taxConvergence, - unit_in = "constant 2005 Int$PPP", - unit_out = "constant 2017 Int$PPP", - replace_NAs = "with_USA" + unit_in = "constant 2005 US$MER", + unit_out = mrdrivers::toolGetUnitDollar(), + replace_NAs = c("linear", "with_USA") ) return(list( diff --git a/R/calcTaxLimits.R b/R/calcTaxLimits.R index 0c0ac8a2..4277ed38 100644 --- a/R/calcTaxLimits.R +++ b/R/calcTaxLimits.R @@ -47,9 +47,9 @@ calcTaxLimits <- function(subtype) { # convert data from $2005 to $2017 output <- GDPuc::convertGDP( gdp = output, - unit_in = "constant 2005 Int$PPP", - unit_out = "constant 2017 Int$PPP", - replace_NAs = "with_USA" + unit_in = "constant 2005 US$MER", + unit_out = mrdrivers::toolGetUnitDollar(), + replace_NAs = c("linear", "with_USA") ) # Return tax convergence levels aggregated to selected REMIND regions diff --git a/R/calcTaxXport.R b/R/calcTaxXport.R index 5b63d880..f115f928 100644 --- a/R/calcTaxXport.R +++ b/R/calcTaxXport.R @@ -9,9 +9,9 @@ calcTaxXport <- function() { # convert data from $2005 to $2017 x <- GDPuc::convertGDP( gdp = x, - unit_in = "constant 2005 Int$PPP", - unit_out = "constant 2017 Int$PPP", - replace_NAs = "with_USA" + unit_in = "constant 2005 US$MER", + unit_out = mrdrivers::toolGetUnitDollar(), + replace_NAs = c("linear", "with_USA") ) x <- time_interpolate(x, c(seq(2010, 2150, 5)), diff --git a/R/convertDylanAusGasCost.R b/R/convertDylanAusGasCost.R index 1e2adcc1..a902bea2 100644 --- a/R/convertDylanAusGasCost.R +++ b/R/convertDylanAusGasCost.R @@ -7,8 +7,8 @@ convertDylanAusGasCost <- function(x) { x %>% - # Converting from constant 2015 Australian dollars to constant 2017 Int$PPP - GDPuc::convertGDP(unit_in = "constant 2015 LCU", unit_out = "constant 2017 Int$PPP") %>% + # Converting from constant 2015 Australian dollars to constant 2017 US$MER + GDPuc::convertGDP(unit_in = "constant 2015 LCU", unit_out = mrdrivers::toolGetUnitDollar()) %>% add_dimension(dim = 3.4, add = "unit", nm = "Natural Gas Extraction Cost [2017USD/GJ]") %>% toolCountryFill(fill = 0, verbosity = 2) %>% return() diff --git a/R/convertGEA2012.R b/R/convertGEA2012.R index 96a24d03..59795411 100644 --- a/R/convertGEA2012.R +++ b/R/convertGEA2012.R @@ -61,9 +61,9 @@ convertGEA2012 <- function(x, subtype) { # convert T US$2005/TWa -> T US$2017/TWa for cost factors xi1 and xi2 tmp <- GDPuc::convertGDP( gdp = out[, , c("xi1", "xi2")], - unit_in = "constant 2005 Int$PPP", - unit_out = "constant 2017 Int$PPP", - replace_NAs = "with_USA" + unit_in = "constant 2005 US$MER", + unit_out = mrdrivers::toolGetUnitDollar(), + replace_NAs = c("linear", "with_USA") ) out <- mbind(tmp, out[, , c("xi1", "xi2"), invert = TRUE]) diff --git a/R/convertIIASA_subs_taxes.R b/R/convertIIASA_subs_taxes.R index 15cffab9..26ea440d 100644 --- a/R/convertIIASA_subs_taxes.R +++ b/R/convertIIASA_subs_taxes.R @@ -28,9 +28,9 @@ convertIIASA_subs_taxes <- function(x, subtype) { if (!subtype %in% c("subsidies_bulk", "tax_rate")) { x <- GDPuc::convertGDP( gdp = x, - unit_in = "constant 2005 Int$PPP", - unit_out = "constant 2017 Int$PPP", - replace_NAs = "with_USA" + unit_in = "constant 2005 US$MER", + unit_out = mrdrivers::toolGetUnitDollar(), + replace_NAs = c("linear", "with_USA") ) } From 629f600e5ae93e7b28d1063a6b454ef845627c5a Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Mon, 12 Aug 2024 12:37:35 +0200 Subject: [PATCH 28/42] unify unit naming in calc functions --- R/EDGE-Industry.R | 2 +- R/calcCapital.R | 2 +- R/calcCostsTradePeFinancial.R | 2 +- R/calcCostsWeathering.R | 2 +- R/calcEconometricEmiParameter.R | 2 +- R/calcFETaxes.R | 2 +- R/calcFossilExtraction.R | 2 +- R/calcGEA2012.R | 2 +- R/calcIndustry_EEK.R | 2 +- R/calcMacroInvestments.R | 2 +- R/calcPETaxes.R | 2 +- R/calcTaxConvergence.R | 2 +- R/calcTaxLimits.R | 2 +- R/calcTaxXport.R | 2 +- 14 files changed, 14 insertions(+), 14 deletions(-) diff --git a/R/EDGE-Industry.R b/R/EDGE-Industry.R index a7cb260e..9c48fac4 100644 --- a/R/EDGE-Industry.R +++ b/R/EDGE-Industry.R @@ -2808,7 +2808,7 @@ calcIndustry_Value_Added <- function(subtype = 'physical', return(list(x = x %>% as.magpie(spatial = 2, temporal = 4, data = 5), weight = NULL, - unit = '$tn/year', + unit = 'trillion US$2017/year', description = 'chemicals and other industry value added')) } diff --git a/R/calcCapital.R b/R/calcCapital.R index 112e7eda..84107d17 100644 --- a/R/calcCapital.R +++ b/R/calcCapital.R @@ -82,6 +82,6 @@ calcCapital <- function() { # tie outputs together ---- list(x = mbind(cap_future, EEK), weight = NULL, - unit = "trillion 20017US$", + unit = "trillion US$2017", description = "Capital stock, computed using the capital to GDP ratio from PWT, and GDP scenarios from mrdrivers.") } diff --git a/R/calcCostsTradePeFinancial.R b/R/calcCostsTradePeFinancial.R index 0a80c48d..3ef691b9 100644 --- a/R/calcCostsTradePeFinancial.R +++ b/R/calcCostsTradePeFinancial.R @@ -24,7 +24,7 @@ calcCostsTradePeFinancial <- function() { return(list( x = data, weight = w, - unit = "T US$2017/TWa", + unit = "trillion US$2017/TWa", description = "PE tradecosts (financial costs on import, export and use)" )) } diff --git a/R/calcCostsWeathering.R b/R/calcCostsWeathering.R index 6f3259b6..bd68e8cb 100644 --- a/R/calcCostsWeathering.R +++ b/R/calcCostsWeathering.R @@ -24,7 +24,7 @@ calcCostsWeathering <- function() { return(list( x = x, weight = weight, - unit = "T US$2017/Gt stone", + unit = "trillion US$2017/Gt stone", description = "Transport costs for spreading rocks on the fields. The first rlf corresponds to climate regions (1 - warm, 2 - temperate). The second rlf are the distances of fields from the sources of the material." diff --git a/R/calcEconometricEmiParameter.R b/R/calcEconometricEmiParameter.R index 7cccd874..7271a3ad 100644 --- a/R/calcEconometricEmiParameter.R +++ b/R/calcEconometricEmiParameter.R @@ -45,6 +45,6 @@ calcEconometricEmiParameter <- function() { return(list(x = x, weight = pop, - unit = "p3 - GtC/Cap, p4 - $US2017/Cap", + unit = "p3 - GtC/Cap, p4 - US$2017/Cap", description = "CO2 parameters to calculate baseline emissions of waste from population and investment")) } diff --git a/R/calcFETaxes.R b/R/calcFETaxes.R index eb71ddad..75ed6c8e 100644 --- a/R/calcFETaxes.R +++ b/R/calcFETaxes.R @@ -128,5 +128,5 @@ calcFETaxes <- function(subtype = "taxes") { # for cooling and low for cooking # So, we can assume that countries are app. similar in a given region - return(list(x = Rtax, weight = Renergy, unit = "$2017/GJ", description = desc)) + return(list(x = Rtax, weight = Renergy, unit = "US$2017/GJ", description = desc)) } diff --git a/R/calcFossilExtraction.R b/R/calcFossilExtraction.R index 2ab225e4..671114a9 100644 --- a/R/calcFossilExtraction.R +++ b/R/calcFossilExtraction.R @@ -117,7 +117,7 @@ calcFossilExtraction <- function(subtype = "FossilExtraction") { return(list( x = output, weight = NULL, - unit = "tr USD2017/TWa", + unit = "trillion US$2017/TWa", description = description, aggregationFunction = toolCubicFunctionAggregate, aggregationArguments = list(xUpperBound = upperBoundMaxExtraction, steepCurve = highCostCurve) diff --git a/R/calcGEA2012.R b/R/calcGEA2012.R index 7e4f400c..45b5c868 100644 --- a/R/calcGEA2012.R +++ b/R/calcGEA2012.R @@ -28,7 +28,7 @@ calcGEA2012 <- function(subtype, datatype) { w[, , "xi3"] <- NA mixed <- TRUE # TODO: confirm the unit for cost grades, as it is merely an educated guess - unit <- "cost grades (xi1 and xi2) in T US$2017/TWa; quantities (xi3) in TWa" + unit <- "cost grades (xi1 and xi2) in trillion US$2017/TWa; quantities (xi3) in TWa" } else if (subtype == "bounds") { # This subtype is used to define region-specific bounds found in the GAMS code of the previous implementation of timeDepGrades diff --git a/R/calcIndustry_EEK.R b/R/calcIndustry_EEK.R index 653e8047..7b065771 100644 --- a/R/calcIndustry_EEK.R +++ b/R/calcIndustry_EEK.R @@ -362,6 +362,6 @@ calcIndustry_EEK <- function(kap) { return(list(x = EEK %>% as.magpie(spatial = 1, temporal = 2, data = ncol(.)), weight = NULL, - unit = 'trillion 2017US$', + unit = 'trillion US$2017', description = 'Industry energy efficiency capital stock')) } diff --git a/R/calcMacroInvestments.R b/R/calcMacroInvestments.R index c73e3fc5..eb82a79f 100644 --- a/R/calcMacroInvestments.R +++ b/R/calcMacroInvestments.R @@ -18,7 +18,7 @@ calcMacroInvestments <- function() { return(list( x = data, weight = NULL, - unit = "trillion 20017US$", + unit = "trillion US$2017", description = "Investments in the macro-economic capital stock in constant 2017 US$MER" )) } diff --git a/R/calcPETaxes.R b/R/calcPETaxes.R index 1375a730..30893088 100644 --- a/R/calcPETaxes.R +++ b/R/calcPETaxes.R @@ -49,5 +49,5 @@ calcPETaxes <- function(subtype = "subsidies") { getYears(Rtax) <- "2005" getYears(Renergy) <- "2005" - return(list(x = Rtax, weight = Renergy, unit = "$2017/GJ", description = desc)) + return(list(x = Rtax, weight = Renergy, unit = "US$2017/GJ", description = desc)) } diff --git a/R/calcTaxConvergence.R b/R/calcTaxConvergence.R index 1f7bbbb1..586244fc 100644 --- a/R/calcTaxConvergence.R +++ b/R/calcTaxConvergence.R @@ -28,7 +28,7 @@ calcTaxConvergence <- function() { return(list( x = taxConvergence, weight = w, - unit = "$/GJ", + unit = "US$2017/GJ", description = "Tax convergence level for specific regions, year and final energy type" )) } diff --git a/R/calcTaxLimits.R b/R/calcTaxLimits.R index 4277ed38..5947d687 100644 --- a/R/calcTaxLimits.R +++ b/R/calcTaxLimits.R @@ -53,5 +53,5 @@ calcTaxLimits <- function(subtype) { ) # Return tax convergence levels aggregated to selected REMIND regions - return(list(x = output, weight = weight, unit = "$/GJ", description = description)) + return(list(x = output, weight = weight, unit = "US$2017/GJ", description = description)) } diff --git a/R/calcTaxXport.R b/R/calcTaxXport.R index f115f928..6fd453af 100644 --- a/R/calcTaxXport.R +++ b/R/calcTaxXport.R @@ -21,7 +21,7 @@ calcTaxXport <- function() { return(list( x = x, weight = weight, - unit = "$/GJ", + unit = "US$2017/GJ", description = "resource export taxes, not used in default settings." )) } From 49fd3a324b12b932b186f13f5d0acd398ab52716 Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Thu, 29 Aug 2024 12:03:41 +0200 Subject: [PATCH 29/42] bugfix in convertIIASA_subs_taxes --- R/convertIIASA_subs_taxes.R | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/R/convertIIASA_subs_taxes.R b/R/convertIIASA_subs_taxes.R index 26ea440d..8ce432c5 100644 --- a/R/convertIIASA_subs_taxes.R +++ b/R/convertIIASA_subs_taxes.R @@ -25,7 +25,7 @@ convertIIASA_subs_taxes <- function(x, subtype) { ) # convert monetary data from $2005 to $2017 - if (!subtype %in% c("subsidies_bulk", "tax_rate")) { + if (subtype %in% c("subsidies_bulk", "tax_rate")) { x <- GDPuc::convertGDP( gdp = x, unit_in = "constant 2005 US$MER", From d4384387bcecadd4daf0be084c865165da3f7d47 Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Fri, 30 Aug 2024 09:21:05 +0200 Subject: [PATCH 30/42] add GDPuc as dependency --- DESCRIPTION | 1 + 1 file changed, 1 insertion(+) diff --git a/DESCRIPTION b/DESCRIPTION index 95133cb6..6090a7b7 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -52,6 +52,7 @@ Imports: data.table, dplyr, ggplot2, + GDPuc, Hmisc, luscale, magrittr, From 18ae0725e6563b3fe5eca80ded42f6a6f251fc5b Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Fri, 30 Aug 2024 16:43:53 +0200 Subject: [PATCH 31/42] adjust unit in calcEDGETransport --- R/calcEDGETransport.R | 8 ++++---- 1 file changed, 4 insertions(+), 4 deletions(-) diff --git a/R/calcEDGETransport.R b/R/calcEDGETransport.R index d012f4c7..636c1654 100644 --- a/R/calcEDGETransport.R +++ b/R/calcEDGETransport.R @@ -27,7 +27,7 @@ calcEDGETransport <- function(subtype) { weight[weightSum == 0, value := 1] weight[, c("RegionCode", "weightSum") := NULL] weight <- as.magpie(weight) - unit = "2005US$/(p|t)km" + unit = "2017US$/(p|t)km" description = "Capital cost (purchase) per energy service demand on CES level." }, "f35_fe2es" = { @@ -59,7 +59,7 @@ calcEDGETransport <- function(subtype) { "CAPEXandNonFuelOPEX" = { gdp <- calcOutput("GDP", aggregate = FALSE)[,,"gdp_SSP2"] weight = gdp |> time_interpolate(getYears(x)) - unit = "2005US$/(p|t)km" + unit = "2017US$/(p|t)km" description = "Capital cost (purchase) and non-fuel operational costs on technology level." }, "scenSpecPrefTrends" = { @@ -83,7 +83,7 @@ calcEDGETransport <- function(subtype) { "initialIncoCosts" = { gdp <- calcOutput("GDP", aggregate = FALSE)[,,"gdp_SSP2"] weight = gdp |> time_interpolate(getYears(x)) - unit = "2005US$/(p|t)km" + unit = "2017US$/(p|t)km" description = "Initial inconvenience cost values." }, "annualMileage" = { @@ -95,7 +95,7 @@ calcEDGETransport <- function(subtype) { "timeValueCosts" = { gdp <- calcOutput("GDP", aggregate = FALSE)[,,"gdp_SSP2"] weight = gdp |> time_interpolate(getYears(x)) - unit = "2005US$/(p|t)km" + unit = "2017US$/(p|t)km" description = "Value of time cost equivalent." } ) From 775cee4bc0068693fc50800c3da1b1c63faff0fe Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Tue, 3 Sep 2024 14:37:47 +0200 Subject: [PATCH 32/42] adjust replace_NAs parameter in unit conversion --- R/UNIDO.R | 2 +- R/calcBP.R | 4 ++-- R/calcBiomassPrices.R | 2 +- R/calcCO2Prices.R | 2 +- R/calcCostsTradePeFinancial.R | 2 +- R/calcCostsWeathering.R | 2 +- R/calcDiffInvestCosts.R | 2 +- R/calcEU_ReferenceScenario.R | 4 ++-- R/calcEconometricEmiParameter.R | 2 +- R/calcINNOPATHS.R | 2 +- R/calcIndustry_EEK.R | 2 +- R/calcJRC_IDEES.R | 2 +- R/calcTaxConvergence.R | 2 +- R/calcTaxLimits.R | 2 +- R/calcTaxXport.R | 2 +- R/convertGEA2012.R | 2 +- R/convertIIASA_subs_taxes.R | 2 +- 17 files changed, 19 insertions(+), 19 deletions(-) diff --git a/R/UNIDO.R b/R/UNIDO.R index 61919282..be7231eb 100644 --- a/R/UNIDO.R +++ b/R/UNIDO.R @@ -265,7 +265,7 @@ convertUNIDO <- function(x, subtype = 'INDSTAT2') GDPuc::convertGDP( unit_in = "constant 2005 US$MER", unit_out = mrdrivers::toolGetUnitDollar(), - replace_NAs = c("linear", "with_USA") + replace_NAs = "with_USA" ) %>% return() } diff --git a/R/calcBP.R b/R/calcBP.R index 49c982d1..ed35ea04 100644 --- a/R/calcBP.R +++ b/R/calcBP.R @@ -146,7 +146,7 @@ calcBP <- function() { gdp = x[, , "Price|Primary Energy|Oil (US$2023/GJ)"], unit_in = "constant 2022 US$MER", unit_out = mrdrivers::toolGetUnitDollar(), - replace_NAs = c("linear", "with_USA") + replace_NAs = "with_USA" ) getNames(poil) <- gsub("\\$2023", "\\$2017", getNames(poil)) @@ -156,7 +156,7 @@ calcBP <- function() { gdp = x[, , c("Price|Primary Energy|Gas (US$/GJ)", "Price|Primary Energy|Coal (US$/GJ)")], unit_in = "current US$MER", unit_out = mrdrivers::toolGetUnitDollar(), - replace_NAs = c("linear", "with_USA") + replace_NAs = "with_USA" ) getNames(pcoalgas) <- gsub("\\$", "\\$2017", getNames(pcoalgas)) diff --git a/R/calcBiomassPrices.R b/R/calcBiomassPrices.R index 90565bbb..be5636d9 100644 --- a/R/calcBiomassPrices.R +++ b/R/calcBiomassPrices.R @@ -34,7 +34,7 @@ calcBiomassPrices <- function() { gdp = x, unit_in = "constant 2005 US$MER", unit_out = mrdrivers::toolGetUnitDollar(), - replace_NAs = c("linear", "with_USA") + replace_NAs = "with_USA" ) return(list(x = x, diff --git a/R/calcCO2Prices.R b/R/calcCO2Prices.R index af6b421e..2c727fdd 100644 --- a/R/calcCO2Prices.R +++ b/R/calcCO2Prices.R @@ -10,7 +10,7 @@ calcCO2Prices <- function() { gdp = x, unit_in = "constant 2005 US$MER", unit_out = mrdrivers::toolGetUnitDollar(), - replace_NAs = c("linear", "with_USA") + replace_NAs = "with_USA" ) # read data used for weight diff --git a/R/calcCostsTradePeFinancial.R b/R/calcCostsTradePeFinancial.R index 3ef691b9..f8fc67b8 100644 --- a/R/calcCostsTradePeFinancial.R +++ b/R/calcCostsTradePeFinancial.R @@ -16,7 +16,7 @@ calcCostsTradePeFinancial <- function() { gdp = data, unit_in = "constant 2005 US$MER", unit_out = mrdrivers::toolGetUnitDollar(), - replace_NAs = c("linear", "with_USA") + replace_NAs = "with_USA" ) w <- calcOutput("GDP", aggregate = FALSE)[, 2005, "gdp_SSP2"] diff --git a/R/calcCostsWeathering.R b/R/calcCostsWeathering.R index bd68e8cb..90ae0f48 100644 --- a/R/calcCostsWeathering.R +++ b/R/calcCostsWeathering.R @@ -15,7 +15,7 @@ calcCostsWeathering <- function() { gdp = costs, unit_in = "constant 2005 US$MER", unit_out = mrdrivers::toolGetUnitDollar(), - replace_NAs = c("linear", "with_USA") + replace_NAs = "with_USA" ) weight <- costs # get the same dimensions of the data diff --git a/R/calcDiffInvestCosts.R b/R/calcDiffInvestCosts.R index 63c99742..521d1570 100644 --- a/R/calcDiffInvestCosts.R +++ b/R/calcDiffInvestCosts.R @@ -165,7 +165,7 @@ calcDiffInvestCosts <- function(subtype) { gdp = x_new, unit_in = "constant 2015 US$MER", unit_out = mrdrivers::toolGetUnitDollar(), - replace_NAs = c("linear", "with_USA") + replace_NAs = "with_USA" ) return(list( diff --git a/R/calcEU_ReferenceScenario.R b/R/calcEU_ReferenceScenario.R index 3b20a7c3..f8e1fb46 100644 --- a/R/calcEU_ReferenceScenario.R +++ b/R/calcEU_ReferenceScenario.R @@ -7,7 +7,7 @@ calcEU_ReferenceScenario <- function() { gdp = euRef2016[, , "Price|Secondary Energy|Electricity (EUR2013/GJ)"], unit_in = "constant 2013 €", unit_out = mrdrivers::toolGetUnitDollar(), - replace_NAs = c("linear", "with_USA") + replace_NAs = "with_USA" ) getNames(tmp) <- "Price|Secondary Energy|Electricity (US$2017/GJ)" @@ -23,7 +23,7 @@ calcEU_ReferenceScenario <- function() { gdp = euRef2020[, , "Price|Secondary Energy|Electricity (EUR2015/GJ)"], unit_in = "constant 2015 €", unit_out = mrdrivers::toolGetUnitDollar(), - replace_NAs = c("linear", "with_USA") + replace_NAs = "with_USA" ) getNames(tmp) <- "Price|Secondary Energy|Electricity (US$2017/GJ)" diff --git a/R/calcEconometricEmiParameter.R b/R/calcEconometricEmiParameter.R index 7271a3ad..653c91f9 100644 --- a/R/calcEconometricEmiParameter.R +++ b/R/calcEconometricEmiParameter.R @@ -36,7 +36,7 @@ calcEconometricEmiParameter <- function() { gdp = p4, unit_in = "constant 2005 US$MER", unit_out = mrdrivers::toolGetUnitDollar(), - replace_NAs = c("linear", "with_USA") + replace_NAs = "with_USA" ) # combine all parameters diff --git a/R/calcINNOPATHS.R b/R/calcINNOPATHS.R index 9753639b..063394b9 100644 --- a/R/calcINNOPATHS.R +++ b/R/calcINNOPATHS.R @@ -38,7 +38,7 @@ calcINNOPATHS <- function() { gdp = tmp, unit_in = "constant 2015 €", unit_out = mrdrivers::toolGetUnitDollar(), - replace_NAs = c("linear", "with_USA") + replace_NAs = "with_USA" ) x <- mbind(x, tmp) diff --git a/R/calcIndustry_EEK.R b/R/calcIndustry_EEK.R index 7b065771..296c6f64 100644 --- a/R/calcIndustry_EEK.R +++ b/R/calcIndustry_EEK.R @@ -111,7 +111,7 @@ calcIndustry_EEK <- function(kap) { dplyr::rename("value" = "EEK") %>% GDPuc::convertGDP(unit_in = "constant 2012 US$MER", unit_out = mrdrivers::toolGetUnitDollar(), - replace_NAs = c("linear", "with_USA")) %>% + replace_NAs = "with_USA") %>% dplyr::mutate(value = .data$value * 1e-3) %>% dplyr::rename("EEK" = "value") diff --git a/R/calcJRC_IDEES.R b/R/calcJRC_IDEES.R index 565ee7ba..e64ffab8 100644 --- a/R/calcJRC_IDEES.R +++ b/R/calcJRC_IDEES.R @@ -83,7 +83,7 @@ calcJRC_IDEES <- function(subtype) { gdp = tmp, unit_in = "constant 2010 €", unit_out = mrdrivers::toolGetUnitDollar(), - replace_NAs = c("linear", "with_USA") + replace_NAs = "with_USA" ) x <- mbind(x, tmp) } diff --git a/R/calcTaxConvergence.R b/R/calcTaxConvergence.R index 586244fc..33de1a7a 100644 --- a/R/calcTaxConvergence.R +++ b/R/calcTaxConvergence.R @@ -22,7 +22,7 @@ calcTaxConvergence <- function() { gdp = taxConvergence, unit_in = "constant 2005 US$MER", unit_out = mrdrivers::toolGetUnitDollar(), - replace_NAs = c("linear", "with_USA") + replace_NAs = "with_USA" ) return(list( diff --git a/R/calcTaxLimits.R b/R/calcTaxLimits.R index 5947d687..ad210487 100644 --- a/R/calcTaxLimits.R +++ b/R/calcTaxLimits.R @@ -49,7 +49,7 @@ calcTaxLimits <- function(subtype) { gdp = output, unit_in = "constant 2005 US$MER", unit_out = mrdrivers::toolGetUnitDollar(), - replace_NAs = c("linear", "with_USA") + replace_NAs = "with_USA" ) # Return tax convergence levels aggregated to selected REMIND regions diff --git a/R/calcTaxXport.R b/R/calcTaxXport.R index 6fd453af..ee0639e5 100644 --- a/R/calcTaxXport.R +++ b/R/calcTaxXport.R @@ -11,7 +11,7 @@ calcTaxXport <- function() { gdp = x, unit_in = "constant 2005 US$MER", unit_out = mrdrivers::toolGetUnitDollar(), - replace_NAs = c("linear", "with_USA") + replace_NAs = "with_USA" ) x <- time_interpolate(x, c(seq(2010, 2150, 5)), diff --git a/R/convertGEA2012.R b/R/convertGEA2012.R index 59795411..d6f1d32c 100644 --- a/R/convertGEA2012.R +++ b/R/convertGEA2012.R @@ -63,7 +63,7 @@ convertGEA2012 <- function(x, subtype) { gdp = out[, , c("xi1", "xi2")], unit_in = "constant 2005 US$MER", unit_out = mrdrivers::toolGetUnitDollar(), - replace_NAs = c("linear", "with_USA") + replace_NAs = "with_USA" ) out <- mbind(tmp, out[, , c("xi1", "xi2"), invert = TRUE]) diff --git a/R/convertIIASA_subs_taxes.R b/R/convertIIASA_subs_taxes.R index 8ce432c5..10734a90 100644 --- a/R/convertIIASA_subs_taxes.R +++ b/R/convertIIASA_subs_taxes.R @@ -30,7 +30,7 @@ convertIIASA_subs_taxes <- function(x, subtype) { gdp = x, unit_in = "constant 2005 US$MER", unit_out = mrdrivers::toolGetUnitDollar(), - replace_NAs = c("linear", "with_USA") + replace_NAs = "with_USA" ) } From 1ff1f6fcde3b496fc28eb4f616f96e1f3edc621a Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Fri, 6 Sep 2024 13:39:49 +0200 Subject: [PATCH 33/42] increment to dev version --- .buildlibrary | 2 +- CITATION.cff | 4 ++-- DESCRIPTION | 4 ++-- README.md | 6 +++--- man/calcDiffInvestCosts.Rd | 1 - 5 files changed, 8 insertions(+), 9 deletions(-) diff --git a/.buildlibrary b/.buildlibrary index fb6a5ed0..951a372b 100644 --- a/.buildlibrary +++ b/.buildlibrary @@ -1,4 +1,4 @@ -ValidationKey: '37405683' +ValidationKey: '374255327972' 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 0354a654..fde4885f 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.187.3 -date-released: '2024-09-05' +version: 0.187.3.9001 +date-released: '2024-09-06' abstract: The mrremind packages contains data preprocessing for the REMIND model. authors: - family-names: Baumstark diff --git a/DESCRIPTION b/DESCRIPTION index dca1db20..12aaf038 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -1,8 +1,8 @@ Type: Package Package: mrremind Title: MadRat REMIND Input Data Package -Version: 0.187.3 -Date: 2024-09-05 +Version: 0.187.3.9001 +Date: 2024-09-06 Authors@R: c( person("Lavinia", "Baumstark", , "lavinia@pik-potsdam.de", role = c("aut", "cre")), person("Renato", "Rodrigues", role = "aut"), diff --git a/README.md b/README.md index 7ae04cdc..b308e5f2 100644 --- a/README.md +++ b/README.md @@ -1,6 +1,6 @@ # MadRat REMIND Input Data Package -R package **mrremind**, version **0.187.3** +R package **mrremind**, version **0.187.3.9001** [![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.187.3.9001, . 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.187.3}, + note = {R package version 0.187.3.9001}, url = {https://github.com/pik-piam/mrremind}, } ``` diff --git a/man/calcDiffInvestCosts.Rd b/man/calcDiffInvestCosts.Rd index e408cffd..d9cd704f 100644 --- a/man/calcDiffInvestCosts.Rd +++ b/man/calcDiffInvestCosts.Rd @@ -8,7 +8,6 @@ calcDiffInvestCosts(subtype) } \arguments{ \item{subtype}{either "Invest_Costs" or "Efficiency"} ->>>>>>> 5cf8202c9d28b75c700f4410b75b025d85523c59 } \value{ Magpie object with aggregated but differentiated investment costs for some technologies. From 22a6df508c11f9c77147c77441f34965ec7391c9 Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Fri, 6 Sep 2024 14:01:13 +0200 Subject: [PATCH 34/42] convert currencty in convertTransportSubsidies --- R/convertTransportSubisidies.R | 8 ++++++++ 1 file changed, 8 insertions(+) diff --git a/R/convertTransportSubisidies.R b/R/convertTransportSubisidies.R index 75e21d0d..be43fdc4 100644 --- a/R/convertTransportSubisidies.R +++ b/R/convertTransportSubisidies.R @@ -12,5 +12,13 @@ convertTransportSubsidies <- function(x) { x <- toolCountryFill(x, fill = 0, verbosity = 2) # fill countries with no data x[is.na(x)] <- 0 + # convert data from EUR 2020 to USD 2017 + x <- GDPuc::convertGDP( + gdp = x, + unit_in = "constant 2020 €", + unit_out = mrdrivers::toolGetUnitDollar(), + replace_NAs = "with_USA" + ) + return(x) } From 6a6db58e67ec755e8f2e852289e909c194758131 Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Mon, 9 Sep 2024 09:51:25 +0200 Subject: [PATCH 35/42] fix minor bug in calcMacroInvestments --- R/calcMacroInvestments.R | 1 + 1 file changed, 1 insertion(+) diff --git a/R/calcMacroInvestments.R b/R/calcMacroInvestments.R index eb82a79f..d17a2642 100644 --- a/R/calcMacroInvestments.R +++ b/R/calcMacroInvestments.R @@ -3,6 +3,7 @@ calcMacroInvestments <- function() { # Read in investment share and SSP2 GDP in 2005 shInv <- readSource("PWT")[, 2005, "csh_i"] gdp <- calcOutput("GDP", scenario = "SSP2", years = 2005, aggregate = FALSE) + getItems(gdp, dim = 2) <- "y2005" shInv_new <- toolFillWithRegionAvg(shInv, valueToReplace = 0, weight = gdp) From 4389a0ce51d17f02dba239f7511f76ac33c34531 Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Mon, 9 Sep 2024 14:14:01 +0200 Subject: [PATCH 36/42] fix bug in calcCostsWeathering --- R/calcCostsWeathering.R | 16 +++++++++++++++- 1 file changed, 15 insertions(+), 1 deletion(-) diff --git a/R/calcCostsWeathering.R b/R/calcCostsWeathering.R index 90ae0f48..190d98a3 100644 --- a/R/calcCostsWeathering.R +++ b/R/calcCostsWeathering.R @@ -8,9 +8,19 @@ #' } #' calcCostsWeathering <- function() { + costs <- readSource("Strefler", subtype = "weathering_costs") + # convert from $2005 to $2017 + + # a hack: we must reformat the subdimensions 'rfl' and 'rfl1' so that its values are not + # integers, which causes the internal conversion back to maglass to wrongly guess + # the year dimension + + getNames(costs, dim = 1) <- paste0(getNames(costs, dim = 1), "-rfl") + getNames(costs, dim = 2) <- paste0(getNames(costs, dim = 2), "-rfl1") + x <- GDPuc::convertGDP( gdp = costs, unit_in = "constant 2005 US$MER", @@ -18,7 +28,11 @@ calcCostsWeathering <- function() { replace_NAs = "with_USA" ) - weight <- costs # get the same dimensions of the data + # undo the hack after conversion + getNames(x, dim = 1) <- gsub("-rfl", "", getNames(x, dim = 1)) + getNames(x, dim = 2) <- gsub("-rfl1", "", getNames(x, dim = 2)) + + weight <- x # get the same dimensions of the data weight[, , ] <- 1 # this will take the average of the countries to get the regional resolution return(list( From c5f8d78a35e7db72ec59b2c3f303c5b7f699eeb4 Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Mon, 9 Sep 2024 14:54:20 +0200 Subject: [PATCH 37/42] fix bug in calcBiomassPrices --- R/calcBiomassPrices.R | 7 +++++-- 1 file changed, 5 insertions(+), 2 deletions(-) diff --git a/R/calcBiomassPrices.R b/R/calcBiomassPrices.R index be5636d9..909d867a 100644 --- a/R/calcBiomassPrices.R +++ b/R/calcBiomassPrices.R @@ -16,10 +16,13 @@ calcBiomassPrices <- function() { getNames(x) <- gsub("SDP-MC", "SDP", getNames(x)) # Introduce new SSP/SDP dimension by replacing "-" with "." - getNames(x) <- gsub("(SSP[0-9]|SDP)-", "\\1.",getNames(x)) + getNames(x) <- gsub("(SSP[0-9]|SDP)-", "\\1.", getNames(x)) + getSets(x)["d3.1"] <- "scen1" + getSets(x)["d3.2"] <- "scen2" + getSets(x)["d3.3"] <- "char" # add supply curves for SSP3 using the curves from SSP2 - tmp <- x[,,"SSP2"] + tmp <- x[, , "SSP2"] getNames(tmp) <- gsub("SSP2", "SSP3", getNames(tmp)) x <- mbind(x, tmp) From 6ba9f0168fcbe745c754f53c4456b3130a606747 Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Mon, 9 Sep 2024 15:16:19 +0200 Subject: [PATCH 38/42] fix bug in convertGEA2012 --- R/convertGEA2012.R | 9 +++++++++ 1 file changed, 9 insertions(+) diff --git a/R/convertGEA2012.R b/R/convertGEA2012.R index d6f1d32c..faf8d640 100644 --- a/R/convertGEA2012.R +++ b/R/convertGEA2012.R @@ -58,6 +58,12 @@ convertGEA2012 <- function(x, subtype) { if (subtype %in% c("oil", "coal", "gas")) { + # a hack: we must reformat the subdimension 'grade' so that its values are not + # integers, which causes the internal conversion back to maglass to wrongly guess + # the year dimension + + getNames(out, dim = 4) <- paste0(getNames(out, dim = 4), "-grade") + # convert T US$2005/TWa -> T US$2017/TWa for cost factors xi1 and xi2 tmp <- GDPuc::convertGDP( gdp = out[, , c("xi1", "xi2")], @@ -68,6 +74,9 @@ convertGEA2012 <- function(x, subtype) { out <- mbind(tmp, out[, , c("xi1", "xi2"), invert = TRUE]) + # undo the hack after conversion + getNames(out, dim = 4) <- gsub("-grade", "", getNames(x, dim = 4)) + } else { out <- x } From dbd2d7596f5038bb5b7b1c7db3ef59503b69b2af Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Mon, 9 Sep 2024 17:15:29 +0200 Subject: [PATCH 39/42] remove no longer needed workaround --- DESCRIPTION | 2 +- R/calcCostsWeathering.R | 12 ------------ R/convertGEA2012.R | 9 --------- 3 files changed, 1 insertion(+), 22 deletions(-) diff --git a/DESCRIPTION b/DESCRIPTION index 12aaf038..15a83795 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -52,7 +52,7 @@ Imports: data.table, dplyr, ggplot2, - GDPuc, + GDPuc (>= 1.0.5), Hmisc, luscale, magrittr, diff --git a/R/calcCostsWeathering.R b/R/calcCostsWeathering.R index 190d98a3..bc1f308c 100644 --- a/R/calcCostsWeathering.R +++ b/R/calcCostsWeathering.R @@ -11,16 +11,8 @@ calcCostsWeathering <- function() { costs <- readSource("Strefler", subtype = "weathering_costs") - # convert from $2005 to $2017 - # a hack: we must reformat the subdimensions 'rfl' and 'rfl1' so that its values are not - # integers, which causes the internal conversion back to maglass to wrongly guess - # the year dimension - - getNames(costs, dim = 1) <- paste0(getNames(costs, dim = 1), "-rfl") - getNames(costs, dim = 2) <- paste0(getNames(costs, dim = 2), "-rfl1") - x <- GDPuc::convertGDP( gdp = costs, unit_in = "constant 2005 US$MER", @@ -28,10 +20,6 @@ calcCostsWeathering <- function() { replace_NAs = "with_USA" ) - # undo the hack after conversion - getNames(x, dim = 1) <- gsub("-rfl", "", getNames(x, dim = 1)) - getNames(x, dim = 2) <- gsub("-rfl1", "", getNames(x, dim = 2)) - weight <- x # get the same dimensions of the data weight[, , ] <- 1 # this will take the average of the countries to get the regional resolution diff --git a/R/convertGEA2012.R b/R/convertGEA2012.R index faf8d640..d6f1d32c 100644 --- a/R/convertGEA2012.R +++ b/R/convertGEA2012.R @@ -58,12 +58,6 @@ convertGEA2012 <- function(x, subtype) { if (subtype %in% c("oil", "coal", "gas")) { - # a hack: we must reformat the subdimension 'grade' so that its values are not - # integers, which causes the internal conversion back to maglass to wrongly guess - # the year dimension - - getNames(out, dim = 4) <- paste0(getNames(out, dim = 4), "-grade") - # convert T US$2005/TWa -> T US$2017/TWa for cost factors xi1 and xi2 tmp <- GDPuc::convertGDP( gdp = out[, , c("xi1", "xi2")], @@ -74,9 +68,6 @@ convertGEA2012 <- function(x, subtype) { out <- mbind(tmp, out[, , c("xi1", "xi2"), invert = TRUE]) - # undo the hack after conversion - getNames(out, dim = 4) <- gsub("-grade", "", getNames(x, dim = 4)) - } else { out <- x } From 0aa98f557abb514fabfef614a6210ff3b1c7e3ba Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Tue, 10 Sep 2024 22:23:25 +0200 Subject: [PATCH 40/42] fix bug in calcCO2Prices --- R/calcCO2Prices.R | 3 ++- 1 file changed, 2 insertions(+), 1 deletion(-) diff --git a/R/calcCO2Prices.R b/R/calcCO2Prices.R index 2c727fdd..398e9b46 100644 --- a/R/calcCO2Prices.R +++ b/R/calcCO2Prices.R @@ -2,7 +2,6 @@ calcCO2Prices <- function() { # read data x <- readSource("ExpertGuess", subtype = "co2prices") - getNames(x) <- NULL # convert from $2005 to $2017 @@ -13,6 +12,8 @@ calcCO2Prices <- function() { replace_NAs = "with_USA" ) + getNames(x) <- NULL + # read data used for weight ceds <- calcOutput("Emissions", datasource = "CEDS2024", aggregate = FALSE) ceds <- ceds[, , "Emi|CO2|Energy and Industrial Processes (Mt CO2/yr)"] From da8377a35fbcd7b6f0bf04cf402f81503bed94ce Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Thu, 19 Sep 2024 08:55:21 +0200 Subject: [PATCH 41/42] increment dev version --- .buildlibrary | 2 +- CITATION.cff | 4 ++-- DESCRIPTION | 4 ++-- README.md | 7 +++---- 4 files changed, 8 insertions(+), 9 deletions(-) diff --git a/.buildlibrary b/.buildlibrary index 18085d6a..909b74fa 100644 --- a/.buildlibrary +++ b/.buildlibrary @@ -1,4 +1,4 @@ -ValidationKey: '37967700' +ValidationKey: '379894884985' 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 aad0cd43..2c97088a 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.190.0 -date-released: '2024-09-17' +version: 0.190.0.9001 +date-released: '2024-09-19' abstract: The mrremind packages contains data preprocessing for the REMIND model. authors: - family-names: Baumstark diff --git a/DESCRIPTION b/DESCRIPTION index 2187e6a4..0e460916 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -1,8 +1,8 @@ Type: Package Package: mrremind Title: MadRat REMIND Input Data Package -Version: 0.190.0 -Date: 2024-09-17 +Version: 0.190.0.9001 +Date: 2024-09-19 Authors@R: c( person("Lavinia", "Baumstark", , "lavinia@pik-potsdam.de", role = c("aut", "cre")), person("Renato", "Rodrigues", role = "aut"), diff --git a/README.md b/README.md index 8ce47d6b..cd258f16 100644 --- a/README.md +++ b/README.md @@ -1,6 +1,6 @@ # MadRat REMIND Input Data Package -R package **mrremind**, version **0.190.0** +R package **mrremind**, version **0.190.0.9001** [![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,8 +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.190.0.9001, . A BibTeX entry for LaTeX users is @@ -49,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.190.0}, + note = {R package version 0.190.0.9001}, url = {https://github.com/pik-piam/mrremind}, } ``` From 28de8d4676225bdc16898103371f343fe72b2483 Mon Sep 17 00:00:00 2001 From: Falk Benke Date: Fri, 20 Sep 2024 14:07:06 +0200 Subject: [PATCH 42/42] increment version --- .buildlibrary | 2 +- CITATION.cff | 4 ++-- DESCRIPTION | 4 ++-- README.md | 6 +++--- 4 files changed, 8 insertions(+), 8 deletions(-) diff --git a/.buildlibrary b/.buildlibrary index 5fa23b77..59918290 100644 --- a/.buildlibrary +++ b/.buildlibrary @@ -1,4 +1,4 @@ -ValidationKey: '38191335' +ValidationKey: '38213232' 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 996a171c..1ef2aaf8 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.191.1 -date-released: '2024-09-19' +version: 0.191.2 +date-released: '2024-09-20' abstract: The mrremind packages contains data preprocessing for the REMIND model. authors: - family-names: Baumstark diff --git a/DESCRIPTION b/DESCRIPTION index eca37659..8c9f4a87 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -1,8 +1,8 @@ Type: Package Package: mrremind Title: MadRat REMIND Input Data Package -Version: 0.191.1 -Date: 2024-09-19 +Version: 0.191.2 +Date: 2024-09-20 Authors@R: c( person("Lavinia", "Baumstark", , "lavinia@pik-potsdam.de", role = c("aut", "cre")), person("Renato", "Rodrigues", role = "aut"), diff --git a/README.md b/README.md index b1c7a9f5..3e1b70d8 100644 --- a/README.md +++ b/README.md @@ -1,6 +1,6 @@ # MadRat REMIND Input Data Package -R package **mrremind**, version **0.191.1** +R package **mrremind**, version **0.191.2** [![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.191.2, . 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.191.1}, + note = {R package version 0.191.2}, url = {https://github.com/pik-piam/mrremind}, } ```