library(tidyverse)
## -- Attaching packages ----------------------------------------------------------------------------- tidyverse 1.2.1 --
## v ggplot2 3.2.1     v purrr   0.3.2
## v tibble  2.1.3     v dplyr   0.8.3
## v tidyr   1.0.0     v stringr 1.4.0
## v readr   1.3.1     v forcats 0.4.0
## -- Conflicts -------------------------------------------------------------------------------- tidyverse_conflicts() --
## x dplyr::filter() masks stats::filter()
## x dplyr::lag()    masks stats::lag()
library(ggthemes)
library(ggrepel)
library(readr)
library(scales)
## 
## Attaching package: 'scales'
## The following object is masked from 'package:purrr':
## 
##     discard
## The following object is masked from 'package:readr':
## 
##     col_factor
library(RColorBrewer)
library(timetk)
## Registered S3 method overwritten by 'xts':
##   method     from
##   as.zoo.xts zoo
library(plotly)
## 
## Attaching package: 'plotly'
## The following object is masked from 'package:ggplot2':
## 
##     last_plot
## The following object is masked from 'package:stats':
## 
##     filter
## The following object is masked from 'package:graphics':
## 
##     layout
library(dplyr)
library(ggplot2)
library(highcharter)
## Registered S3 method overwritten by 'quantmod':
##   method            from
##   as.zoo.data.frame zoo
## Highcharts (www.highcharts.com) is a Highsoft software product which is
## not free for commercial and Governmental use
library(kableExtra)
## 
## Attaching package: 'kableExtra'
## The following object is masked from 'package:dplyr':
## 
##     group_rows
getwd()
## [1] "C:/Users/chat5/OneDrive/Desktop/Data 101/Final project"
energy <- read_csv("C:/Users/chat5/OneDrive/Desktop/Data 101/Final project/Data/all_energy_statistics.csv")
## Parsed with column specification:
## cols(
##   country_or_area = col_character(),
##   commodity_transaction = col_character(),
##   year = col_double(),
##   unit = col_character(),
##   quantity = col_double(),
##   quantity_footnotes = col_double(),
##   category = col_character()
## )
head(energy)
## # A tibble: 6 x 7
##   country_or_area commodity_trans~  year unit  quantity quantity_footno~
##   <chr>           <chr>            <dbl> <chr>    <dbl>            <dbl>
## 1 Austria         Additives and O~  1996 Metr~        5               NA
## 2 Austria         Additives and O~  1995 Metr~       17               NA
## 3 Belgium         Additives and O~  2014 Metr~        0               NA
## 4 Belgium         Additives and O~  2013 Metr~        0               NA
## 5 Belgium         Additives and O~  2012 Metr~       35               NA
## 6 Belgium         Additives and O~  2011 Metr~       25               NA
## # ... with 1 more variable: category <chr>
tail(energy)
## # A tibble: 6 x 7
##   country_or_area commodity_trans~  year unit  quantity quantity_footno~
##   <chr>           <chr>            <dbl> <chr>    <dbl>            <dbl>
## 1 Viet Nam        Electricity - t~  2013 Kilo~       92                1
## 2 Viet Nam        Electricity - t~  2012 Kilo~       92                1
## 3 Viet Nam        Electricity - t~  2011 Kilo~       87               NA
## 4 Viet Nam        Electricity - t~  2010 Kilo~       50               NA
## 5 Viet Nam        Electricity - t~  2009 Kilo~       10               NA
## 6 Viet Nam        Electricity - t~  2008 Kilo~        1               NA
## # ... with 1 more variable: category <chr>

The dataset I chose was the International Energy Statistics from the United Nations (link: https://www.kaggle.com/unitednations/international-energy-statistics). Variables are:

Commodity_transaction- What the use specific use of the commodity is (import, export, etc)

Quantity- The amount of the energy type per unit it’s measured in.

energy %>%
  summarise(count = sum(is.na(country_or_area))) # There are 0  missing values
## # A tibble: 1 x 1
##   count
##   <int>
## 1     0
energy %>%
  summarise(count = sum(is.na(commodity_transaction))) # There are 0    missing values
## # A tibble: 1 x 1
##   count
##   <int>
## 1     0
energy %>%
  summarise(count = sum(is.na(year))) # There are 0 missing values
## # A tibble: 1 x 1
##   count
##   <int>
## 1     0
energy %>%
  summarise(count = sum(is.na(unit))) # There are 0 missing values
## # A tibble: 1 x 1
##   count
##   <int>
## 1     0
energy %>%
  summarise(count = sum(is.na(quantity))) # There are 0 missing values
## # A tibble: 1 x 1
##   count
##   <int>
## 1     0
energy %>%
  summarise(count = sum(is.na(quantity_footnotes))) # There are 1025536 missing values
## # A tibble: 1 x 1
##     count
##     <int>
## 1 1025536
energy %>%
  summarise(count = sum(is.na(category))) # There are 0 missing values
## # A tibble: 1 x 1
##   count
##   <int>
## 1     0

No need for conversion since missing values are already as NA.

# Total of 1189482 rows and 7 columns resulting in 8,326,374, total entries

x <- (1025536 / 8326374) *100

# The percentage of missing values in the dataset is 12.32%, which all comes from one column of data (quantity_footnotes) 

What I am interested in exploring with this data is to first see the use of renewables in the US and China, as these are the top two nations when it comes to pollution. The first question is if the use of renewable energy has increased over the years, and then to compare between the two countries.

unitedstates <- energy %>%
  filter(country_or_area == 'United States')  

head(unitedstates)
## # A tibble: 6 x 7
##   country_or_area commodity_trans~  year unit  quantity quantity_footno~
##   <chr>           <chr>            <dbl> <chr>    <dbl>            <dbl>
## 1 United States   Additives and O~  2014 Metr~     2484               NA
## 2 United States   Additives and O~  2013 Metr~     2640               NA
## 3 United States   Additives and O~  2012 Metr~     2579               NA
## 4 United States   Additives and O~  2011 Metr~     2506               NA
## 5 United States   Additives and O~  2010 Metr~     2497               NA
## 6 United States   Additives and O~  2009 Metr~     2213               NA
## # ... with 1 more variable: category <chr>
unitedstates1990 <- unitedstates %>%
  filter(year == '1990') 

head(unitedstates1990)
## # A tibble: 6 x 7
##   country_or_area commodity_trans~  year unit  quantity quantity_footno~
##   <chr>           <chr>            <dbl> <chr>    <dbl>            <dbl>
## 1 United States   Animal waste - ~  1990 Tera~    47398                1
## 2 United States   Animal waste - ~  1990 Tera~    65706                1
## 3 United States   Animal waste - ~  1990 Tera~    47398                1
## 4 United States   Animal waste - ~  1990 Tera~    65706                1
## 5 United States   Animal waste - ~  1990 Tera~   113104                1
## 6 United States   Animal waste - ~  1990 Tera~   113104                1
## # ... with 1 more variable: category <chr>
unitedstates2014 <- unitedstates %>%
  filter(year == '2014')


head(unitedstates2014)
## # A tibble: 6 x 7
##   country_or_area commodity_trans~  year unit  quantity quantity_footno~
##   <chr>           <chr>            <dbl> <chr>    <dbl>            <dbl>
## 1 United States   Additives and O~  2014 Metr~     2484               NA
## 2 United States   Additives and O~  2014 Metr~       95               NA
## 3 United States   Additives and O~  2014 Metr~     2667               NA
## 4 United States   Additives and O~  2014 Metr~      193               NA
## 5 United States   Additives and O~  2014 Metr~       85               NA
## 6 United States   Additives and O~  2014 Metr~       85               NA
## # ... with 1 more variable: category <chr>
unique(energy$country_or_area)
##   [1] "Austria"                                 
##   [2] "Belgium"                                 
##   [3] "Czechia"                                 
##   [4] "Finland"                                 
##   [5] "France"                                  
##   [6] "Greece"                                  
##   [7] "Hungary"                                 
##   [8] "Italy"                                   
##   [9] "Korea, Republic of"                      
##  [10] "Netherlands"                             
##  [11] "Romania"                                 
##  [12] "Serbia"                                  
##  [13] "Slovakia"                                
##  [14] "Ukraine"                                 
##  [15] "United Kingdom"                          
##  [16] "United States"                           
##  [17] "Brunei Darussalam"                       
##  [18] "Bulgaria"                                
##  [19] "Canada"                                  
##  [20] "Chile"                                   
##  [21] "Croatia"                                 
##  [22] "Iran (Islamic Rep. of)"                  
##  [23] "Jordan"                                  
##  [24] "Lithuania"                               
##  [25] "Mexico"                                  
##  [26] "Oman"                                    
##  [27] "Other Asia"                              
##  [28] "Poland"                                  
##  [29] "Portugal"                                
##  [30] "Spain"                                   
##  [31] "Sweden"                                  
##  [32] "Switzerland"                             
##  [33] "T.F.Yug.Rep. Macedonia"                  
##  [34] "Turkey"                                  
##  [35] "Uzbekistan"                              
##  [36] "Argentina"                               
##  [37] "Colombia"                                
##  [38] "Germany"                                 
##  [39] "Norway"                                  
##  [40] "Australia"                               
##  [41] "China, Macao SAR"                        
##  [42] "Japan"                                   
##  [43] "Denmark"                                 
##  [44] "Ireland"                                 
##  [45] "Philippines"                             
##  [46] "Bangladesh"                              
##  [47] "Eritrea"                                 
##  [48] "Ethiopia"                                
##  [49] "Lesotho"                                 
##  [50] "Nepal"                                   
##  [51] "Niger"                                   
##  [52] "Pakistan"                                
##  [53] "Serbia and Montenegro"                   
##  [54] "Tunisia"                                 
##  [55] "Botswana"                                
##  [56] "Georgia"                                 
##  [57] "Republic of Moldova"                     
##  [58] "Peru"                                    
##  [59] "South Africa"                            
##  [60] "Iceland"                                 
##  [61] "Latvia"                                  
##  [62] "Luxembourg"                              
##  [63] "Cuba"                                    
##  [64] "Kyrgyzstan"                              
##  [65] "Singapore"                               
##  [66] "Thailand"                                
##  [67] "United Arab Emirates"                    
##  [68] "Uruguay"                                 
##  [69] "Armenia"                                 
##  [70] "Fiji"                                    
##  [71] "Korea, Dem.Ppl's.Rep."                   
##  [72] "Russian Federation"                      
##  [73] "Swaziland"                               
##  [74] "Zimbabwe"                                
##  [75] "Afghanistan"                             
##  [76] "Antigua and Barbuda"                     
##  [77] "Azerbaijan"                              
##  [78] "Bahamas"                                 
##  [79] "Belize"                                  
##  [80] "Bolivia (Plur. State of)"                
##  [81] "Brazil"                                  
##  [82] "Burkina Faso"                            
##  [83] "Cameroon"                                
##  [84] "Cayman Islands"                          
##  [85] "Central African Rep."                    
##  [86] "China"                                   
##  [87] "Comoros"                                 
##  [88] "Congo"                                   
##  [89] "Costa Rica"                              
##  [90] "Côte d'Ivoire"                           
##  [91] "Dem. Rep. of the Congo"                  
##  [92] "Dominican Republic"                      
##  [93] "Ecuador"                                 
##  [94] "Egypt"                                   
##  [95] "El Salvador"                             
##  [96] "Estonia"                                 
##  [97] "Ethiopia, incl. Eritrea"                 
##  [98] "Faeroe Islands"                          
##  [99] "French Guiana"                           
## [100] "Germany, Fed. R. (former)"               
## [101] "Greenland"                               
## [102] "Guatemala"                               
## [103] "Guinea"                                  
## [104] "Guyana"                                  
## [105] "Honduras"                                
## [106] "Indonesia"                               
## [107] "Israel"                                  
## [108] "Jamaica"                                 
## [109] "Jersey"                                  
## [110] "Kazakhstan"                              
## [111] "Kenya"                                   
## [112] "Kuwait"                                  
## [113] "Lao People's Dem. Rep."                  
## [114] "Liberia"                                 
## [115] "Libya"                                   
## [116] "Malawi"                                  
## [117] "Malaysia"                                
## [118] "Maldives"                                
## [119] "Mauritania"                              
## [120] "Mayotte"                                 
## [121] "Morocco"                                 
## [122] "Myanmar"                                 
## [123] "Namibia"                                 
## [124] "New Caledonia"                           
## [125] "New Zealand"                             
## [126] "Nicaragua"                               
## [127] "Niue"                                    
## [128] "Panama"                                  
## [129] "Papua New Guinea"                        
## [130] "Paraguay"                                
## [131] "Sao Tome and Principe"                   
## [132] "Senegal"                                 
## [133] "Seychelles"                              
## [134] "Slovenia"                                
## [135] "Solomon Islands"                         
## [136] "Sri Lanka"                               
## [137] "Sudan (former)"                          
## [138] "Suriname"                                
## [139] "Togo"                                    
## [140] "Tonga"                                   
## [141] "Trinidad and Tobago"                     
## [142] "United Rep. of Tanzania"                 
## [143] "Venezuela (Bolivar. Rep.)"               
## [144] "Yugoslavia, SFR (former)"                
## [145] "Zambia"                                  
## [146] "Algeria"                                 
## [147] "Curaçao"                                 
## [148] "Gabon"                                   
## [149] "Malta"                                   
## [150] "Neth. Antilles (former)"                 
## [151] "Sierra Leone"                            
## [152] "USSR (former)"                           
## [153] "Barbados"                                
## [154] "Benin"                                   
## [155] "Chad"                                    
## [156] "Djibouti"                                
## [157] "French Polynesia"                        
## [158] "Ghana"                                   
## [159] "Grenada"                                 
## [160] "Guadeloupe"                              
## [161] "Haiti"                                   
## [162] "Iraq"                                    
## [163] "Kiribati"                                
## [164] "Madagascar"                              
## [165] "Mali"                                    
## [166] "Martinique"                              
## [167] "Pacific Islands (former)"                
## [168] "Palau"                                   
## [169] "St. Helena and Depend."                  
## [170] "St. Vincent-Grenadines"                  
## [171] "Syrian Arab Republic"                    
## [172] "Uganda"                                  
## [173] "Yemen"                                   
## [174] "Yemen, Dem. (former)"                    
## [175] "Burundi"                                 
## [176] "India"                                   
## [177] "Mauritius"                               
## [178] "Mozambique"                              
## [179] "Nigeria"                                 
## [180] "Réunion"                                 
## [181] "Rwanda"                                  
## [182] "Samoa"                                   
## [183] "Somalia"                                 
## [184] "St. Kitts-Nevis"                         
## [185] "Viet Nam"                                
## [186] "Belarus"                                 
## [187] "Cyprus"                                  
## [188] "Cabo Verde"                              
## [189] "Albania"                                 
## [190] "Bahrain"                                 
## [191] "Bosnia and Herzegovina"                  
## [192] "China, Hong Kong SAR"                    
## [193] "Czechoslovakia (former)"                 
## [194] "Angola"                                  
## [195] "Bermuda"                                 
## [196] "Bhutan"                                  
## [197] "Equatorial Guinea"                       
## [198] "Lebanon"                                 
## [199] "Saudi Arabia"                            
## [200] "St. Lucia"                               
## [201] "St. Pierre-Miquelon"                     
## [202] "State of Palestine"                      
## [203] "Tajikistan"                              
## [204] "German Dem. R. (former)"                 
## [205] "Anguilla"                                
## [206] "Mongolia"                                
## [207] "Montenegro"                              
## [208] "Cambodia"                                
## [209] "South Sudan"                             
## [210] "Sudan"                                   
## [211] "Andorra"                                 
## [212] "Aruba"                                   
## [213] "Bonaire, St Eustatius, Saba"             
## [214] "British Virgin Islands"                  
## [215] "Dominica"                                
## [216] "Falkland Is. (Malvinas)"                 
## [217] "Gambia"                                  
## [218] "Gibraltar"                               
## [219] "Qatar"                                   
## [220] "Sint Maarten (Dutch part)"               
## [221] "Turkmenistan"                            
## [222] "Turks and Caicos Islands"                
## [223] "Vanuatu"                                 
## [224] "Guinea-Bissau"                           
## [225] "Micronesia (Fed. States of)"             
## [226] "Timor-Leste"                             
## [227] "Yemen Arab Rep. (former)"                
## [228] "American Samoa"                          
## [229] "Liechtenstein"                           
## [230] "Puerto Rico"                             
## [231] "Cook Islands"                            
## [232] "Guam"                                    
## [233] "Guernsey"                                
## [234] "Isle of Man"                             
## [235] "Marshall Islands"                        
## [236] "Montserrat"                              
## [237] "Nauru"                                   
## [238] "Northern Mariana Islands"                
## [239] "Tuvalu"                                  
## [240] "United States Virgin Is."                
## [241] "Wallis and Futuna Is."                   
## [242] "Commonwealth of Independent States (CIS)"
## [243] "Antarctic Fisheries"
unique(unitedstates2014$commodity_transaction)
##   [1] "Additives and Oxygenates - Exports"                                                                     
##   [2] "Additives and Oxygenates - Imports"                                                                     
##   [3] "Additives and Oxygenates - Receipts from other sources"                                                 
##   [4] "Additives and Oxygenates - Stock changes"                                                               
##   [5] "Additives and Oxygenates - Total energy supply"                                                         
##   [6] "Additives and Oxygenates - Transformation"                                                              
##   [7] "Additives and Oxygenates - Transformation in oil refineries"                                            
##   [8] "Animal waste - Consumption by commerce and public services"                                             
##   [9] "Animal waste - Consumption by households"                                                               
##  [10] "Animal waste - Consumption by manufacturing, construction and non-fuel industry"                        
##  [11] "Animal waste - Consumption by other"                                                                    
##  [12] "Animal waste - Consumption by other manuf., const. and non-fuel min. ind."                              
##  [13] "Animal waste - Consumption in agriculture, forestry and fishing"                                        
##  [14] "Animal waste - Final consumption"                                                                       
##  [15] "Animal waste - Final energy consumption"                                                                
##  [16] "Animal waste - Production"                                                                              
##  [17] "Animal waste - Total energy supply"                                                                     
##  [18] "animal waste - Transformation"                                                                          
##  [19] "Animal waste - Transformation in electricity, CHP and heat plants"                                      
##  [20] "Anthracite - commerce and public services"                                                              
##  [21] "Anthracite - consumption by chemical and petrochemical"                                                 
##  [22] "Anthracite - consumption by food and tobacco"                                                           
##  [23] "Anthracite - consumption by manufacturing, construction and non-fuel industry"                          
##  [24] "Anthracite - consumption by non-metallic minerals"                                                      
##  [25] "Anthracite - consumption by other"                                                                      
##  [26] "Anthracite - consumption by other manuf., const. and non-fuel ind."                                     
##  [27] "Anthracite - consumption by paper, pulp and print"                                                      
##  [28] "Anthracite - consumption by textile and leather"                                                        
##  [29] "Anthracite - consumption not elsewhere specified (industry)"                                            
##  [30] "Anthracite - exports"                                                                                   
##  [31] "Anthracite - Final consumption"                                                                         
##  [32] "Anthracite - final energy consumption"                                                                  
##  [33] "Anthracite - imports"                                                                                   
##  [34] "Anthracite - production"                                                                                
##  [35] "Anthracite - receipts from other sources"                                                               
##  [36] "Anthracite - stock changes"                                                                             
##  [37] "Anthracite - Total energy supply"                                                                       
##  [38] "Anthracite - transformation"                                                                            
##  [39] "Anthracite - transformation in CHP plants - autoproducers"                                              
##  [40] "Anthracite - transformation in CHP plants - main activity producers"                                    
##  [41] "Anthracite - transformation in electricity, CHP and heat plants"                                        
##  [42] "Anthracite - transformation in electricity plants - main activity producers"                            
##  [43] "Aviation gasoline - Consumption by transport"                                                           
##  [44] "Aviation gasoline - Consumption in domestic aviation"                                                   
##  [45] "Aviation gasoline - Final consumption"                                                                  
##  [46] "Aviation gasoline - Final energy consumption"                                                           
##  [47] "Aviation gasoline - Imports"                                                                            
##  [48] "Aviation gasoline - Production"                                                                         
##  [49] "Aviation gasoline - production from refineries"                                                         
##  [50] "Aviation gasoline - Stock changes"                                                                      
##  [51] "Aviation gasoline - Total energy supply"                                                                
##  [52] "Bagasse - Consumption by manufacturing, construction and non-fuel industry"                             
##  [53] "Bagasse - Consumption by other manuf., const. and non-fuel ind."                                        
##  [54] "Bagasse - Final consumption"                                                                            
##  [55] "Bagasse - Final energy consumption"                                                                     
##  [56] "Bagasse - Production"                                                                                   
##  [57] "Bagasse - Total energy supply"                                                                          
##  [58] "Biodiesel - Consumption by agriculture, forestry and fishing"                                           
##  [59] "Biodiesel - Consumption by chemical and petrochemical"                                                  
##  [60] "Biodiesel - Consumption by construction"                                                                
##  [61] "Biodiesel - Consumption by domestic navigation"                                                         
##  [62] "Biodiesel - Consumption by food and tobacco"                                                            
##  [63] "Biodiesel - Consumption by iron and steel"                                                              
##  [64] "Biodiesel - Consumption by machinery"                                                                   
##  [65] "Biodiesel - Consumption by manufacturing, construction and non-fuel mining industry"                    
##  [66] "Biodiesel - Consumption by mining and quarrying"                                                        
##  [67] "Biodiesel - Consumption by non-metallic minerals"                                                       
##  [68] "Biodiesel - Consumption by other"                                                                       
##  [69] "Biodiesel - Consumption by other manufacturing, construction and non-fuel mining industry"              
##  [70] "Biodiesel - Consumption by paper, pulp and print"                                                       
##  [71] "Biodiesel - Consumption by rail"                                                                        
##  [72] "Biodiesel - Consumption by road"                                                                        
##  [73] "Biodiesel - Consumption by transport equipment"                                                         
##  [74] "Biodiesel - Consumption by wood and wood products"                                                      
##  [75] "Biodiesel - Consumption in transport"                                                                   
##  [76] "Biodiesel - Consumption not elsewhere specified (industry)"                                             
##  [77] "Biodiesel - Energy industries own use"                                                                  
##  [78] "Biodiesel - Exports"                                                                                    
##  [79] "Biodiesel - Final consumption"                                                                          
##  [80] "Biodiesel - Final energy consumption"                                                                   
##  [81] "Biodiesel - Imports"                                                                                    
##  [82] "Biodiesel - International marine bunkers"                                                               
##  [83] "Biodiesel - Own use by coal mines"                                                                      
##  [84] "Biodiesel - Own use by oil and gas extraction"                                                          
##  [85] "Biodiesel - Production"                                                                                 
##  [86] "Biodiesel - Stock changes"                                                                              
##  [87] "Biodiesel - Total energy supply"                                                                        
##  [88] "Biodiesel - Transformation"                                                                             
##  [89] "Biodiesel - Transformation in CHP plants - main activity producers"                                     
##  [90] "Biodiesel - Transformation in electricity, CHP and heat plants"                                         
##  [91] "Biodiesel - Transformation in electricity plants - main activity producers"                             
##  [92] "Biogases - Consumption by agriculture, forestry and fishing"                                            
##  [93] "Biogases - Consumption by chemical and petrochemical"                                                   
##  [94] "Biogases - Consumption by commerce and public services"                                                 
##  [95] "Biogases - Consumption by food and tobacco"                                                             
##  [96] "Biogases - Consumption by manufacturing, construction and non-fuel mining industry"                     
##  [97] "Biogases - Consumption by other"                                                                        
##  [98] "Biogases - Consumption by other manuf., const. and non-fuel ind."                                       
##  [99] "Biogases - Consumption by paper, pulp and print"                                                        
## [100] "Biogases - Consumption by transport equipment"                                                          
## [101] "Biogases - Consumption not elsewhere specified (industry)"                                              
## [102] "Biogases - Final consumption"                                                                           
## [103] "Biogases - Final energy consumption"                                                                    
## [104] "Biogases - Production"                                                                                  
## [105] "Biogases - Total energy supply"                                                                         
## [106] "Biogases - Transformation"                                                                              
## [107] "Biogases - Transformation in CHP plants - autoproducers"                                                
## [108] "Biogases - Transformation in CHP plants - main activity producers"                                      
## [109] "Biogases - Transformation in electricity, CHP and heat plants"                                          
## [110] "Biogases - Transformation in electricity plants - autoproducers"                                        
## [111] "Biogases - Transformation in electricity plants - main activity producers"                              
## [112] "Biogasoline - Consumption by agriculture, forestry and fishing"                                         
## [113] "Biogasoline - Consumption by commerce and public services"                                              
## [114] "Biogasoline - Consumption by domestic navigation"                                                       
## [115] "Biogasoline - Consumption by manufacturing, construction and non-fuel industry"                         
## [116] "Biogasoline - Consumption by mining and quarrying"                                                      
## [117] "Biogasoline - Consumption by Other"                                                                     
## [118] "Biogasoline - Consumption by other manuf., const. and non-fuel ind."                                    
## [119] "Biogasoline - Consumption by road"                                                                      
## [120] "Biogasoline - consumption by transport"                                                                 
## [121] "Biogasoline - Energy industries own use"                                                                
## [122] "Biogasoline - exports"                                                                                  
## [123] "Biogasoline - Final consumption"                                                                        
## [124] "Biogasoline - Final energy consumption"                                                                 
## [125] "Biogasoline - imports"                                                                                  
## [126] "Biogasoline - Own use by coal mines"                                                                    
## [127] "Biogasoline - own use by oil and gas extraction"                                                        
## [128] "Biogasoline - production"                                                                               
## [129] "Biogasoline - stock changes"                                                                            
## [130] "Biogasoline - Total energy supply"                                                                      
## [131] "Bitumen - Energy industries own use"                                                                    
## [132] "Bitumen - Exports"                                                                                      
## [133] "Bitumen - Final consumption"                                                                            
## [134] "Bitumen - Imports"                                                                                      
## [135] "Bitumen - Non-energy uses"                                                                              
## [136] "Bitumen - Own use by oil refineries"                                                                    
## [137] "Bitumen - Production"                                                                                   
## [138] "Bitumen - production from refineries"                                                                   
## [139] "Bitumen - Stock changes"                                                                                
## [140] "Bitumen - Total energy supply"                                                                          
## [141] "Bitumen - Transfers and recycled products"                                                              
## [142] "Black Liquor - Consumption by manufacturing, construction and non-fuel mining industry"                 
## [143] "Black Liquor - Consumption by other manuf., const. and non-fuel ind."                                   
## [144] "Black Liquor - Final consumption"                                                                       
## [145] "Black Liquor - Final energy consumption"                                                                
## [146] "Black Liquor - Production"                                                                              
## [147] "Black Liquor - Total energy supply"                                                                     
## [148] "Blast Furnace Gas - Consumption by iron and steel"                                                      
## [149] "Blast Furnace Gas - Consumption by manufacturing, construction and non-fuel industry"                   
## [150] "Blast Furnace Gas - Energy industries own use"                                                          
## [151] "Blast furnace gas - final consumption"                                                                  
## [152] "Blast Furnace Gas - Final energy consumption"                                                           
## [153] "Blast Furnace Gas - Own use by blast furnaces"                                                          
## [154] "Blast Furnace Gas - Own use by coke ovens"                                                              
## [155] "Blast Furnace Gas - Production"                                                                         
## [156] "Blast furnace gas - Total energy supply"                                                                
## [157] "Blast furnace gas - Transformation"                                                                     
## [158] "Blast Furnace Gas - Transformation in CHP plants - autoproducers"                                       
## [159] "Blast Furnace Gas - Transformation in CHP plants - main activity producers"                             
## [160] "Blast Furnace Gas - Transformation in electricity, CHP and heat plants"                                 
## [161] "Blast Furnace Gas - Transformation in electricity plants - autoproducers"                               
## [162] "Blast Furnace Gas - Transformation in electricity plants - main activity producers"                     
## [163] "Brown coal - changes in stocks"                                                                         
## [164] "Brown coal - consumption by chemical and petrochemical industry"                                        
## [165] "Brown coal - Consumption by commerce and public services"                                               
## [166] "Brown coal - Consumption by food, beverage and tobacco industry"                                        
## [167] "Brown coal - consumption by manufacturing, construction and non-fuel mining industry"                   
## [168] "Brown coal - Consumption by non-metallic minerals industry"                                             
## [169] "Brown coal - consumption by Other"                                                                      
## [170] "Brown coal - consumption by other manuf., const. and non-fuel ind."                                     
## [171] "Brown coal - Consumption by paper, pulp and print"                                                      
## [172] "Brown coal - Consumption not elsewhere specified (industry)"                                            
## [173] "Brown coal - energy industries own use"                                                                 
## [174] "Brown coal - exports"                                                                                   
## [175] "Brown coal - final consumption"                                                                         
## [176] "Brown coal - Final energy consumption"                                                                  
## [177] "Brown coal - imports"                                                                                   
## [178] "Brown coal - own use by coal mines"                                                                     
## [179] "Brown coal - production"                                                                                
## [180] "Brown coal - Receipts from other sources"                                                               
## [181] "Brown coal - Total energy supply"                                                                       
## [182] "Brown coal - transformation"                                                                            
## [183] "Brown coal - Transformation in autoproducer CHP plants"                                                 
## [184] "Brown coal - Transformation in autoproducer electricity plants"                                         
## [185] "Brown coal - Transformation in electricity, CHP and heat plants"                                        
## [186] "Brown coal - transformation in gas works"                                                               
## [187] "Brown coal - Transformation in main activity CHP plants"                                                
## [188] "Brown coal - Transformation in main activity electricity plants"                                        
## [189] "Lignite brown coal- recoverable resources"                                                              
## [190] "Lignite brown coal - total known reserves"                                                              
## [191] "Lignite brown coal - total resources in place"                                                          
## [192] "Charcoal - Consumption by households"                                                                   
## [193] "Charcoal - Consumption by other"                                                                        
## [194] "Charcoal - Exports"                                                                                     
## [195] "Charcoal - Final consumption"                                                                           
## [196] "Charcoal - Final energy consumption"                                                                    
## [197] "Charcoal - Imports"                                                                                     
## [198] "Charcoal - Production"                                                                                  
## [199] "Charcoal - Total energy supply"                                                                         
## [200] "Coke Oven Gas - Consumption by iron and steel"                                                          
## [201] "Coke Oven Gas - Consumption by manufacturing, construction and non-fuel industry"                       
## [202] "Coke Oven Gas - Consumption by other manuf., const. and non-fuel ind."                                  
## [203] "Coke Oven Gas - Consumption not elsewhere specified (industry)"                                         
## [204] "Coke Oven Gas - Energy industries own use"                                                              
## [205] "Coke Oven Gas - Final consumption"                                                                      
## [206] "Coke Oven Gas - Final energy consumption"                                                               
## [207] "Coke Oven Gas - Own use by blast furnaces"                                                              
## [208] "Coke Oven Gas - Own use by coke ovens"                                                                  
## [209] "Coke Oven Gas - Production"                                                                             
## [210] "Coke Oven Gas - Total energy supply"                                                                    
## [211] "Coke Oven Gas - Transformation"                                                                         
## [212] "Coke Oven Gas - Transformation in CHP plants - autoproducers"                                           
## [213] "Coke Oven Gas - Transformation in electricity, CHP and heat plants"                                     
## [214] "Coke Oven Gas - Transformation in electricity plants - main activity producers"                         
## [215] "Coking coal - exports"                                                                                  
## [216] "Coking coal - imports"                                                                                  
## [217] "Coking coal - production"                                                                               
## [218] "Coking coal - stock changes"                                                                            
## [219] "Coking coal - total energy supply"                                                                      
## [220] "Coking coal - transformation"                                                                           
## [221] "Coking coal - transformation in coke ovens"                                                             
## [222] "Conventional crude oil - exports"                                                                       
## [223] "Conventional crude oil - imports"                                                                       
## [224] "Conventional crude oil - production"                                                                    
## [225] "Conventional crude oil - stock changes"                                                                 
## [226] "Conventional crude oil - total energy supply"                                                           
## [227] "Conventional crude oil - transformation"                                                                
## [228] "Conventional crude oil - transformation in oil refineries"                                              
## [229] "Crude petroleum - refinery capacity"                                                                    
## [230] "Crude petroleum - reserves"                                                                             
## [231] "Direct use of geothermal heat - Consumption by households"                                              
## [232] "Direct use of geothermal heat - Consumption by other"                                                   
## [233] "Direct use of geothermal heat - Final energy consumption"                                               
## [234] "Direct use of solar thermal heat - Consumption by commerce and public services"                         
## [235] "Direct use of solar thermal heat - Consumption by households"                                           
## [236] "Direct use of solar thermal heat - Consumption by other"                                                
## [237] "Direct use of solar thermal heat - Final energy consumption"                                            
## [238] "Electricity generating capacity - From other sources - Autoproducers"                                   
## [239] "Electricity generating capacity - From other sources - Main activity producers"                         
## [240] "Electricity generating capacity - From other sources - Total"                                           
## [241] "Electricity generating capacity - Pumped hydro - Main activity producers"                               
## [242] "Electricity generating capacity - Pumped hydro - Total"                                                 
## [243] "Electricity - net installed capacity of electric power plants, public combustible fuels"                
## [244] "Electricity - net installed capacity of electric power plants, public geothermal"                       
## [245] "Electricity - net installed capacity of electric power plants, public hydro"                            
## [246] "Electricity - net installed capacity of electric power plants, public nuclear"                          
## [247] "Electricity - net installed capacity of electric power plants public solar"                             
## [248] "Electricity - net installed capacity of electric power plants, public wind"                             
## [249] "Electricity - net installed capacity of electric power plants, self-producer combustible fuels"         
## [250] "Electricity - net installed capacity of electric power plants, self-producer hydro"                     
## [251] "Electricity - net installed capacity of electric power plants, self-producer solar"                     
## [252] "Electricity - net installed capacity of electric power plants, self-producer wind"                      
## [253] "Electricity - total net installed capacity of electric power plants, autoproducer"                      
## [254] "Electricity - total net installed capacity of electric power plants, combustible fuels"                 
## [255] "Electricity - total net installed capacity of electric power plants, geothermal"                        
## [256] "Electricity - total net installed capacity of electric power plants, hydro"                             
## [257] "Electricity - total net installed capacity of electric power plants, main activity"                     
## [258] "Electricity - total net installed capacity of electric power plants, main activity & autoproducer"      
## [259] "Electricity - total net installed capacity of electric power plants, nuclear"                           
## [260] "Electricity - total net installed capacity of electric power plants, solar"                             
## [261] "Electricity - total net installed capacity of electric power plants, wind"                              
## [262] "Ethane - Consumption for non-energy uses"                                                               
## [263] "Ethane - Energy industries own use"                                                                     
## [264] "Ethane - Final consumption"                                                                             
## [265] "Ethane - Imports"                                                                                       
## [266] "Ethane - Own use by oil refineries"                                                                     
## [267] "Ethane - Production"                                                                                    
## [268] "Ethane - Production from plants"                                                                        
## [269] "Ethane - Production from refineries"                                                                    
## [270] "Ethane - Stock changes"                                                                                 
## [271] "Ethane - Total energy supply"                                                                           
## [272] "Fuel oil - Consumption by chemical and petrochemical"                                                   
## [273] "Fuel oil - Consumption by commerce and public services"                                                 
## [274] "Fuel oil - Consumption by domestic navigation"                                                          
## [275] "Fuel oil - Consumption by food and tobacco"                                                             
## [276] "Fuel oil - Consumption by iron and steel"                                                               
## [277] "Fuel oil - Consumption by machinery"                                                                    
## [278] "Fuel oil - Consumption by manufacturing, construction and non-fuel industry"                            
## [279] "Fuel oil - Consumption by mining and quarrying"                                                         
## [280] "Fuel oil - Consumption by non-metallic minerals"                                                        
## [281] "Fuel oil - Consumption by other"                                                                        
## [282] "Fuel oil - Consumption by other manuf., const. and non-fuel ind."                                       
## [283] "Fuel oil - Consumption by paper, pulp and print"                                                        
## [284] "Fuel oil - Consumption by textile and leather"                                                          
## [285] "Fuel oil - Consumption by transport"                                                                    
## [286] "Fuel oil - Consumption by transport equipment"                                                          
## [287] "Fuel oil - Consumption by wood and wood products"                                                       
## [288] "Fuel oil - Consumption in agriculture, forestry and fishing"                                            
## [289] "Fuel oil - Energy industries own use"                                                                   
## [290] "Fuel oil - Exports"                                                                                     
## [291] "Fuel oil - Final consumption"                                                                           
## [292] "Fuel oil - Final energy consumption"                                                                    
## [293] "Fuel oil - Imports"                                                                                     
## [294] "Fuel oil - International marine bunkers"                                                                
## [295] "Fuel oil - Own use by coal mines"                                                                       
## [296] "Fuel oil - Own use by oil and gas extraction"                                                           
## [297] "Fuel oil - Own use by oil refineries"                                                                   
## [298] "Fuel oil - Production"                                                                                  
## [299] "Fuel oil - production from refineries"                                                                  
## [300] "Fuel oil - Stock changes"                                                                               
## [301] "Fuel oil - Total energy supply"                                                                         
## [302] "Fuel oil - Transfers and recycled products"                                                             
## [303] "Fuel oil - Transformation"                                                                              
## [304] "Fuel oil - Transformation in CHP plants - autoproducers"                                                
## [305] "Fuel oil - Transformation in CHP plants - main activity producers"                                      
## [306] "Fuel oil - Transformation in electricity, CHP and heat plants"                                          
## [307] "Fuel oil - Transformation in electricity plants - autoproducers"                                        
## [308] "Fuel oil - Transformation in electricity plants - main activity producers"                              
## [309] "Fuelwood - Consumption by households"                                                                   
## [310] "Fuelwood - Consumption by other"                                                                        
## [311] "Fuelwood - Exports"                                                                                     
## [312] "Fuelwood - Final consumption"                                                                           
## [313] "Fuelwood - Final energy consumption"                                                                    
## [314] "Fuelwood - Imports"                                                                                     
## [315] "Fuelwood - Production"                                                                                  
## [316] "Fuelwood - Total energy supply"                                                                         
## [317] "Fuelwood - Transformation"                                                                              
## [318] "Fuelwood - Transformation in charcoal plants"                                                           
## [319] "Gas Oil/ Diesel Oil - Consumption by chemical and petrochemical"                                        
## [320] "Gas Oil/ Diesel Oil - Consumption by commerce and public services"                                      
## [321] "Gas Oil/ Diesel Oil - Consumption by construction"                                                      
## [322] "Gas Oil/ Diesel Oil - Consumption by food and tobacco"                                                  
## [323] "Gas Oil/ Diesel Oil - Consumption by households"                                                        
## [324] "Gas Oil/ Diesel Oil - Consumption by iron and steel"                                                    
## [325] "Gas Oil/ Diesel Oil - Consumption by machinery"                                                         
## [326] "Gas Oil/ Diesel Oil - Consumption by manufacturing, construction and non-fuel mining industry"          
## [327] "Gas Oil/ Diesel Oil - Consumption by mining and quarrying"                                              
## [328] "Gas Oil/ Diesel Oil - Consumption by non-ferrous metals"                                                
## [329] "Gas Oil/ Diesel Oil - Consumption by non-metallic minerals"                                             
## [330] "Gas Oil/ Diesel Oil - Consumption by other"                                                             
## [331] "Gas Oil/ Diesel Oil - Consumption by other manuf., const. and non-fuel min. ind."                       
## [332] "Gas Oil/ Diesel Oil - Consumption by paper, pulp and print"                                             
## [333] "Gas Oil/ Diesel Oil - Consumption by transport"                                                         
## [334] "Gas Oil/ Diesel Oil - Consumption by transport equipment"                                               
## [335] "Gas Oil/ Diesel Oil - Consumption by wood and wood products"                                            
## [336] "Gas Oil/ Diesel Oil - Consumption in agriculture, forestry and fishing"                                 
## [337] "Gas Oil/ Diesel Oil - Consumption in domestic navigation"                                               
## [338] "Gas Oil/ Diesel Oil - Consumption in rail"                                                              
## [339] "Gas Oil/ Diesel Oil - Consumption in road"                                                              
## [340] "Gas Oil/ Diesel Oil - Consumption not elsewhere specified (industry)"                                   
## [341] "Gas Oil/ Diesel Oil - Energy industries own use"                                                        
## [342] "Gas Oil/ Diesel Oil - Exports"                                                                          
## [343] "Gas Oil/ Diesel Oil - Final consumption"                                                                
## [344] "Gas Oil/ Diesel Oil - Final energy consumption"                                                         
## [345] "Gas Oil/ Diesel Oil - Imports"                                                                          
## [346] "Gas Oil/ Diesel Oil - International marine bunkers"                                                     
## [347] "Gas Oil/ Diesel Oil - Non-energy uses"                                                                  
## [348] "Gas Oil/ Diesel Oil - Own use by coal mines"                                                            
## [349] "Gas Oil/ Diesel Oil - Own use by oil and gas extraction"                                                
## [350] "Gas Oil/ Diesel Oil - Own use by oil refineries"                                                        
## [351] "Gas Oil/ Diesel Oil - Production"                                                                       
## [352] "Gas Oil/ Diesel Oil - production from refineries"                                                       
## [353] "Gas Oil/ Diesel Oil - Receipts from other sources"                                                      
## [354] "Gas Oil/ Diesel Oil - Stock changes"                                                                    
## [355] "Gas Oil/ Diesel Oil - Total energy supply"                                                              
## [356] "Gas Oil/ Diesel Oil - Transfers and recycled products"                                                  
## [357] "Gas Oil/ Diesel Oil - Transformation"                                                                   
## [358] "Gas Oil/ Diesel Oil - Transformation in CHP plants - autoproducers"                                     
## [359] "Gas Oil/ Diesel Oil - Transformation in CHP plants - main activity producers"                           
## [360] "Gas Oil/ Diesel Oil - Transformation in electricity, CHP and heat plants"                               
## [361] "Gas Oil/ Diesel Oil - Transformation in electricity plants - autoproducers"                             
## [362] "Gas Oil/ Diesel Oil - Transformation in electricity plants - main activity producers"                   
## [363] "Gasworks Gas - Production"                                                                              
## [364] "Gasworks Gas - Total energy supply"                                                                     
## [365] "Gasworks Gas - Transformation"                                                                          
## [366] "Gasworks Gas - Transformation in natural gas blending plants"                                           
## [367] "Electricity - total geothermal production"                                                              
## [368] "Coal - recoverable reserves"                                                                            
## [369] "Coal - total known reserves"                                                                            
## [370] "Coal - total resources in place"                                                                        
## [371] "Hard coal - consumption by chemical and petrochemical industry"                                         
## [372] "Hard coal - consumption by commerce and public services"                                                
## [373] "Hard coal - consumption by food and tobacco industry"                                                   
## [374] "Hard coal - consumption by machinery industry"                                                          
## [375] "Hard coal - consumption by manufacturing, construction and non-fuel mining industry"                    
## [376] "Hard coal - consumption by non-metallic minerals industry"                                              
## [377] "Hard coal - consumption by other"                                                                       
## [378] "Hard coal - consumption by other manuf., const. and non-fuel ind."                                      
## [379] "Hard coal - consumption by paper, pulp and print"                                                       
## [380] "Hard coal - consumption by textile and leather industry"                                                
## [381] "Hard coal - consumption by transport equipment industry"                                                
## [382] "Hard coal - consumption by wood and wood products industry"                                             
## [383] "Hard coal - consumption not elsewhere specified (industry)"                                             
## [384] "Hard coal - energy industries own use"                                                                  
## [385] "Hard coal - exports"                                                                                    
## [386] "Hard coal - final consumption"                                                                          
## [387] "Hard coal - final energy consumption"                                                                   
## [388] "Hard coal - imports"                                                                                    
## [389] "Hard coal - own use by coal mines"                                                                      
## [390] "Hard coal - production"                                                                                 
## [391] "Hard coal - receipts from other sources"                                                                
## [392] "Hard coal - stock changes"                                                                              
## [393] "Hard coal - total energy supply"                                                                        
## [394] "Hard coal - transformation"                                                                             
## [395] "Hard coal - transformation in blast furnaces"                                                           
## [396] "Hard coal - transformation in CHP plants - autoproducers"                                               
## [397] "Hard coal - transformation in CHP plants - main activity producers"                                     
## [398] "Hard coal - transformation in coke ovens"                                                               
## [399] "Hard coal - transformation in electricity, CHP and heat plants"                                         
## [400] "Hard coal - transformation in electricity plants - autoproducers"                                       
## [401] "Hard coal - transformation in electricity plants - main activity producers"                             
## [402] "Hrad coal - consumption by iron and steel industry"                                                     
## [403] "From combustible fuels – Main activity"                                                                 
## [404] "From combustible fuels – Main activity – CHP plants"                                                    
## [405] "Heat - Consumption by chemical and petrochemical"                                                       
## [406] "Heat - Consumption by commerce and public services"                                                     
## [407] "Heat - Consumption by food and tobacco"                                                                 
## [408] "Heat - Consumption by iron and steel"                                                                   
## [409] "Heat - Consumption by machinery"                                                                        
## [410] "Heat - Consumption by manufacturing, construction and non-fuel industry"                                
## [411] "Heat - Consumption by non-ferrous metals"                                                               
## [412] "Heat - Consumption by non-metallic minerals"                                                            
## [413] "Heat - Consumption by other"                                                                            
## [414] "Heat - Consumption by other manuf., const. and non-fuel ind."                                           
## [415] "Heat - Consumption by paper, pulp and print"                                                            
## [416] "Heat - Consumption by textile and leather"                                                              
## [417] "Heat - Consumption by transport equipment"                                                              
## [418] "Heat - Consumption by wood and wood products"                                                           
## [419] "Heat - Consumption not elsewhere specified (industry)"                                                  
## [420] "Heat - Energy industries own use"                                                                       
## [421] "Heat - Final energy consumption"                                                                        
## [422] "Heat - Gross demand"                                                                                    
## [423] "Heat - Gross production"                                                                                
## [424] "Heat - Losses"                                                                                          
## [425] "Heat - Net production"                                                                                  
## [426] "Heat - Own use by electricity, CHP and heat plants"                                                     
## [427] "Heat - Own use by oil refineries"                                                                       
## [428] "Heat production - Main activity total"                                                                  
## [429] "Electricity - total hydro production"                                                                   
## [430] "Industrial Waste - Consumption by chemical and petrochemical"                                           
## [431] "Industrial Waste - Consumption by food and tobacco"                                                     
## [432] "Industrial Waste - Consumption by manufacturing, construction and non-fuel industry"                    
## [433] "Industrial Waste - Consumption by non-metallic minerals"                                                
## [434] "Industrial Waste - Consumption by other manuf., const. and non-fuel ind."                               
## [435] "Industrial Waste - Consumption by paper, pulp and print"                                                
## [436] "Industrial waste - Final consumption"                                                                   
## [437] "Industrial Waste - Final energy consumption"                                                            
## [438] "Industrial Waste - Production"                                                                          
## [439] "Industrial waste - Total energy supply"                                                                 
## [440] "Industrial Waste - Transformation"                                                                      
## [441] "Industrial Waste - Transformation in CHP plants - autoproducers"                                        
## [442] "Industrial Waste - Transformation in CHP plants - main activity producers"                              
## [443] "Industrial waste - Transformation in electricity, CHP and heat plants"                                  
## [444] "Industrial Waste - Transformation in electricity plants - autoproducers"                                
## [445] "Industrial Waste - Transformation in electricity plants - main activity producers"                      
## [446] "Kerosene-type Jet Fuel - Consumption by domestic aviation"                                              
## [447] "Kerosene-type Jet Fuel - Consumption by transport"                                                      
## [448] "Kerosene-type Jet Fuel - Energy industries own use"                                                     
## [449] "Kerosene-type Jet Fuel - Exports"                                                                       
## [450] "Kerosene-type Jet Fuel - Final consumption"                                                             
## [451] "Kerosene-type Jet Fuel - Final energy consumption"                                                      
## [452] "Kerosene-type Jet Fuel - Imports"                                                                       
## [453] "Kerosene-type Jet Fuel - International aviation bunkers"                                                
## [454] "Kerosene-type Jet Fuel - Own use by oil refineries"                                                     
## [455] "Kerosene-type Jet Fuel - Production"                                                                    
## [456] "Kerosene-type Jet Fuel - production from refineries"                                                    
## [457] "Kerosene-type Jet Fuel - Stock changes"                                                                 
## [458] "Kerosene-type Jet Fuel - Total energy supply"                                                           
## [459] "Kerosene-type Jet Fuel - Transfers and recycled products"                                               
## [460] "Kerosene-type Jet Fuel - Transformation"                                                                
## [461] "Kerosene-type Jet Fuel - Transformation in CHP plants - autoproducers"                                  
## [462] "Kerosene-type Jet Fuel - Transformation in electricity, CHP and heat plants"                            
## [463] "Kerosene-type Jet Fuel - Transformation in electricity plants - main activity producers"                
## [464] "Lignite - Consumption by chemical and petrochemical industry"                                           
## [465] "Lignite - Consumption by food and tobacco industry"                                                     
## [466] "Lignite - Consumption by manufacturing, construction and non-fuel industry"                             
## [467] "Lignite - Consumption by other manuf., const. and non-fuel ind."                                        
## [468] "Lignite - Exports"                                                                                      
## [469] "Lignite - Final consumption"                                                                            
## [470] "Lignite - Final energy consumption"                                                                     
## [471] "Lignite - Imports"                                                                                      
## [472] "Lignite - Production"                                                                                   
## [473] "Lignite - Stock changes"                                                                                
## [474] "Lignite - Total energy supply"                                                                          
## [475] "Lignite - Transformation"                                                                               
## [476] "Lignite - Transformation in autoproducer CHP plants"                                                    
## [477] "Lignite - Transformation in electricity, CHP and heat plants"                                           
## [478] "Lignite - Transformation in gas works"                                                                  
## [479] "Lignite - Transformation in main activity electricity plants"                                           
## [480] "Liquefied petroleum gas (LPG) - consumption by chemical and petrochemical"                              
## [481] "Liquefied petroleum gas (LPG) - Consumption by households"                                              
## [482] "Liquefied petroleum gas (LPG) - consumption by iron and steel industry"                                 
## [483] "Liquefied petroleum gas (LPG) - consumption by manufacturing, construction and non-fuel mining industry"
## [484] "Liquefied petroleum gas (LPG) - Consumption by other"                                                   
## [485] "Liquefied petroleum gas (LPG) - consumption by other manuf., const. and non-fuel min. ind."             
## [486] "Liquefied petroleum gas (LPG) - Consumption by transport"                                               
## [487] "Liquefied petroleum gas (LPG) - Consumption in agriculture, forestry and fishing"                       
## [488] "Liquefied petroleum gas (LPG) - Consumption in road"                                                    
## [489] "Liquefied petroleum gas (LPG) - Energy industries own use"                                              
## [490] "Liquefied petroleum gas (LPG) - Final consumption"                                                      
## [491] "Liquefied petroleum gas (LPG) - Non-energy uses"                                                        
## [492] "Liquefied petroleum gas (LPG) - Own use by oil refineries"                                              
## [493] "Liquefied petroleum gas (LPG) - Production"                                                             
## [494] "Liquefied petroleum gas (LPG) - production from plants"                                                 
## [495] "Liquefied petroleum gas (LPG) - production from refineries"                                             
## [496] "Liquefied petroleum gas (LPG) - Stock changes"                                                          
## [497] "Liquefied petroleum gas (LPG) - Total energy supply"                                                    
## [498] "Liquified Petroleum Gas (LPG) - Consumption by commerce and public services"                            
## [499] "Liquified Petroleum Gas (LPG) - Consumption by construction"                                            
## [500] "Liquified Petroleum Gas (LPG) - Consumption by food and tobacco"                                        
## [501] "Liquified Petroleum Gas (LPG) - Consumption by machinery"                                               
## [502] "Liquified Petroleum Gas (LPG) - Consumption by non-ferrous metals"                                      
## [503] "Liquified Petroleum Gas (LPG) - Consumption by non-metallic minerals"                                   
## [504] "Liquified Petroleum Gas (LPG) - Consumption by paper, pulp and print"                                   
## [505] "Liquified Petroleum Gas (LPG) - Consumption by textile and leather"                                     
## [506] "Liquified Petroleum Gas (LPG) - Consumption by transport equipment"                                     
## [507] "Liquified Petroleum Gas (LPG) - Consumption by wood and wood products"                                  
## [508] "Liquified Petroleum Gas (LPG) - Final energy consumption"                                               
## [509] "Lubricants - Exports"                                                                                   
## [510] "Lubricants - Final consumption"                                                                         
## [511] "Lubricants - Imports"                                                                                   
## [512] "Lubricants - Non-energy uses"                                                                           
## [513] "Lubricants - Production"                                                                                
## [514] "Lubricants - production from refineries"                                                                
## [515] "Lubricants - Stock changes"                                                                             
## [516] "Lubricants - Total energy supply"                                                                       
## [517] "Motor Gasoline - Consumption by commerce and public services"                                           
## [518] "Motor Gasoline - Consumption by domestic navigation"                                                    
## [519] "Motor Gasoline - Consumption by manufacturing, construction and non-fuel mining industry"               
## [520] "Motor Gasoline - Consumption by mining and quarrying"                                                   
## [521] "Motor Gasoline - Consumption by other"                                                                  
## [522] "Motor Gasoline - Consumption by other manuf., const. and non-fuel min. ind."                            
## [523] "Motor Gasoline - Consumption by transport"                                                              
## [524] "Motor Gasoline - Consumption in agriculture, forestry and fishing"                                      
## [525] "Motor Gasoline - Consumption in road"                                                                   
## [526] "Motor Gasoline - Energy industries own use"                                                             
## [527] "Motor Gasoline - Exports"                                                                               
## [528] "Motor Gasoline - Final consumption"                                                                     
## [529] "Motor Gasoline - Final energy consumption"                                                              
## [530] "Motor Gasoline - Imports"                                                                               
## [531] "Motor Gasoline - Own use by coal mines"                                                                 
## [532] "Motor Gasoline - Own use by oil and gas extraction"                                                     
## [533] "Motor Gasoline - Own use by oil refineries"                                                             
## [534] "Motor Gasoline - Production"                                                                            
## [535] "Motor Gasoline - production from plants"                                                                
## [536] "Motor Gasoline - production from refineries"                                                            
## [537] "Motor Gasoline - Receipts from other sources"                                                           
## [538] "Motor Gasoline - Stock changes"                                                                         
## [539] "Motor Gasoline - Total energy supply"                                                                   
## [540] "Municipal Wastes - Consumption by commerce and public services"                                         
## [541] "Municipal Wastes - Consumption by manufacturing, construction and non-fuel industry"                    
## [542] "Municipal Wastes - Consumption by other"                                                                
## [543] "Municipal Wastes - Consumption by other manuf., const. and non-fuel ind."                               
## [544] "Municipal Wastes - Consumption not elsewhere specified (industry)"                                      
## [545] "Municipal wastes - final consumption"                                                                   
## [546] "Municipal Wastes - Final energy consumption"                                                            
## [547] "Municipal Wastes - Production"                                                                          
## [548] "Municipal wastes - Total energy supply"                                                                 
## [549] "Municipal Wastes - Transformation"                                                                      
## [550] "Municipal Wastes - Transformation in CHP plants - autoproducers"                                        
## [551] "Municipal Wastes - Transformation in CHP plants - main activity producers"                              
## [552] "Municipal Wastes - Transformation in electricity, CHP and heat plants"                                  
## [553] "Municipal Wastes - Transformation in electricity plants - autoproducers"                                
## [554] "Municipal Wastes - Transformation in electricity plants - main activity producers"                      
## [555] "Naphtha - Final consumption"                                                                            
## [556] "Naphtha - Imports"                                                                                      
## [557] "Naphtha - Non-energy uses"                                                                              
## [558] "Naphtha - Production"                                                                                   
## [559] "Naphtha - production from refineries"                                                                   
## [560] "Naphtha - Stock changes"                                                                                
## [561] "Naphtha - Total energy supply"                                                                          
## [562] "Natural gas (including LNG) - consumption by chemical and petrochemical"                                
## [563] "Natural Gas (including LNG) - consumption by commerce and public services"                              
## [564] "Natural Gas (including LNG) - consumption by construction"                                              
## [565] "Natural Gas (including LNG) - consumption by food and tobacco"                                          
## [566] "Natural gas (including LNG) - consumption by households"                                                
## [567] "Natural Gas (including LNG) - consumption by industries not elsewhere specified"                        
## [568] "Natural gas (including LNG) - consumption by iron and steel"                                            
## [569] "Natural Gas (including LNG) - consumption by machinery"                                                 
## [570] "Natural gas (including LNG) - consumption by manufacturing, construction and non-fuel industry"         
## [571] "Natural Gas (including LNG) - consumption by mining and quarrying"                                      
## [572] "Natural Gas (including LNG) - consumption by non-ferrous metals"                                        
## [573] "Natural Gas (including LNG) - consumption by non-metallic minerals"                                     
## [574] "Natural gas (including LNG) - consumption by other"                                                     
## [575] "Natural gas (including LNG) - consumption by other manuf., const. and non-fuel ind."                    
## [576] "Natural Gas (including LNG) - consumption by paper, pulp and print"                                     
## [577] "Natural Gas (including LNG) - consumption by pipeline transport"                                        
## [578] "Natural Gas (including LNG) - consumption by textile and leather"                                       
## [579] "Natural gas (including LNG) - consumption by transport"                                                 
## [580] "Natural Gas (including LNG) - consumption by transport equipment"                                       
## [581] "Natural Gas (including LNG) - consumption by wood and wood products"                                    
## [582] "Natural gas (including LNG) - consumption in agriculture, forestry and fishing"                         
## [583] "Natural gas (including LNG) - consumption in road"                                                      
## [584] "Natural gas (including LNG) - energy industries own use"                                                
## [585] "Natural gas (including LNG) - exports"                                                                  
## [586] "Natural gas (including LNG) - extraction loss shrinkage"                                                
## [587] "Natural gas (including LNG) - final consumption"                                                        
## [588] "Natural Gas (including LNG) - final energy consumption"                                                 
## [589] "Natural gas (including LNG) - flared and vented"                                                        
## [590] "Natural gas (including LNG) - imports"                                                                  
## [591] "Natural gas (including LNG) - Memo:Gross production"                                                    
## [592] "Natural gas (including LNG) - non-energy uses"                                                          
## [593] "Natural gas (including LNG) - other transformation"                                                     
## [594] "Natural Gas (including LNG) - own use by blast furnaces"                                                
## [595] "Natural gas (including LNG) - own use by coal mines"                                                    
## [596] "Natural gas (including LNG) - own use by coke ovens"                                                    
## [597] "Natural gas (including LNG) - own use by oil and gas extraction"                                        
## [598] "Natural gas (including LNG) - own use by oil refineries"                                                
## [599] "Natural gas (including LNG) - production"                                                               
## [600] "Natural gas (including LNG) - re-injected"                                                              
## [601] "Natural Gas (including LNG) - receipts from other sources"                                              
## [602] "Natural gas (including LNG) - stock changes"                                                            
## [603] "Natural gas (including LNG) - total energy supply"                                                      
## [604] "Natural gas (including LNG) - total resources"                                                          
## [605] "Natural gas (including LNG) - transformation"                                                           
## [606] "Natural Gas (including LNG) - transformation in CHP plants - autoproducers"                             
## [607] "Natural Gas (including LNG) - transformation in CHP plants - main activity producers"                   
## [608] "Natural gas (including LNG) - transformation in electricity, CHP and heat plants"                       
## [609] "Natural Gas (including LNG) - transformation in electricity plants - autoproducers"                     
## [610] "Natural Gas (including LNG) - transformation in electricity plants - main activity producers"           
## [611] "Natural gas liquids - Exports"                                                                          
## [612] "Natural gas liquids - Final consumption"                                                                
## [613] "Natural gas liquids - Imports"                                                                          
## [614] "Natural gas liquids - Non-energy uses"                                                                  
## [615] "Natural gas liquids - Other transformation"                                                             
## [616] "Natural gas liquids - Production"                                                                       
## [617] "Natural gas liquids - Stock changes"                                                                    
## [618] "Natural gas liquids - Total energy supply"                                                              
## [619] "Natural gas liquids - Transformation"                                                                   
## [620] "Natural gas liquids - Transformation in oil refineries"                                                 
## [621] "Electricity - total nuclear production"                                                                 
## [622] "Of which: biodiesel - Consumption by agriculture, forestry and fishing"                                 
## [623] "Of which: biodiesel - Consumption by chemical and petrochemical"                                        
## [624] "Of which: biodiesel - Consumption by construction"                                                      
## [625] "Of which: biodiesel - Consumption by domestic navigation"                                               
## [626] "Of which: biodiesel - Consumption by food and tobacco"                                                  
## [627] "Of which: biodiesel - Consumption by iron and steel"                                                    
## [628] "Of which: biodiesel - Consumption by machinery"                                                         
## [629] "Of which: biodiesel - Consumption by manufacturing, construction and non-fuel mining industry"          
## [630] "Of which: biodiesel - Consumption by mining and quarrying"                                              
## [631] "Of which: biodiesel - Consumption by non-metallic minerals"                                             
## [632] "Of which: biodiesel - Consumption by other"                                                             
## [633] "Of which: biodiesel - Consumption by other manufacturing, construction and non-fuel mining industry"    
## [634] "Of which: biodiesel - Consumption by paper, pulp and print"                                             
## [635] "Of which: biodiesel - Consumption by rail"                                                              
## [636] "Of which: biodiesel - Consumption by road"                                                              
## [637] "Of which: biodiesel - Consumption by transport equipment"                                               
## [638] "Of which: biodiesel - Consumption by wood and wood products"                                            
## [639] "Of which: biodiesel - Consumption in transport"                                                         
## [640] "Of which: biodiesel - Consumption not elsewhere specified (industry)"                                   
## [641] "Of which: biodiesel - Energy industries own use"                                                        
## [642] "Of which: biodiesel - Final consumption"                                                                
## [643] "Of which: biodiesel - Final energy consumption"                                                         
## [644] "Of which: biodiesel - International marine bunkers"                                                     
## [645] "Of which: biodiesel - Own use by coal mines"                                                            
## [646] "Of which: biodiesel - Own use by oil and gas extraction"                                                
## [647] "Of which: biodiesel - Receipts from other sources"                                                      
## [648] "Of which: biodiesel - Stock changes"                                                                    
## [649] "Of which: biodiesel - Total energy supply"                                                              
## [650] "Of which: biodiesel - Transformation"                                                                   
## [651] "Of which: biodiesel - Transformation in CHP plants - main activity producers"                           
## [652] "Of which: biodiesel - Transformation in electricity, CHP and heat plants"                               
## [653] "Of which: biodiesel - Transformation in electricity plants - main activity producers"                   
## [654] "Of which: biogasoline - Consumption by agriculture, forestry and fishing"                               
## [655] "Of which: biogasoline - Consumption by commerce and public services"                                    
## [656] "Of which: biogasoline - Consumption by domestic navigation"                                             
## [657] "Of which: biogasoline - Consumption by manufacturing, construction and non-fuel mining industry"        
## [658] "Of which: biogasoline - Consumption by mining and quarrying"                                            
## [659] "Of which: biogasoline - Consumption by other"                                                           
## [660] "Of which: biogasoline - Consumption by other manuf., const. and non-fuel ind."                          
## [661] "Of which: biogasoline - Consumption by road"                                                            
## [662] "Of which: biogasoline - Consumption in transport"                                                       
## [663] "Of which: biogasoline - Energy industries own use"                                                      
## [664] "Of which: biogasoline - Final consumption"                                                              
## [665] "Of which: biogasoline - Final energy consumption"                                                       
## [666] "Of which: biogasoline - Own use by coal mines"                                                          
## [667] "Of which: biogasoline - Own use by oil and gas extraction"                                              
## [668] "Of which: biogasoline - Receipts from other sources"                                                    
## [669] "Of which: biogasoline - Stock changes"                                                                  
## [670] "Of which: biogasoline - Total energy supply"                                                            
## [671] "Other bituminous coal - consumption by chemical and petrochemical industry"                             
## [672] "Other bituminous coal - consumption by food and tobacco industry"                                       
## [673] "Other bituminous coal - consumption by iron and steel industry"                                         
## [674] "Other bituminous coal - consumption by machinery industry"                                              
## [675] "Other bituminous coal - consumption by manufacturing, construction and non-fuel industry"               
## [676] "Other bituminous coal - consumption by non-metallic minerals"                                           
## [677] "Other bituminous coal - consumption by other"                                                           
## [678] "Other bituminous coal - consumption by other manuf., const. and non-fuel ind."                          
## [679] "Other bituminous coal - consumption by paper, pulp and print"                                           
## [680] "Other bituminous coal - consumption by textile and leather industry"                                    
## [681] "Other bituminous coal - consumption by transport equipment industry"                                    
## [682] "Other bituminous coal - consumption by wood and wood products industry"                                 
## [683] "Other bituminous coal - consumption in commerce and public services"                                    
## [684] "Other bituminous coal - consumption not elsewhere specified (industry)"                                 
## [685] "Other bituminous coal - energy industries own use"                                                      
## [686] "Other bituminous coal - exports"                                                                        
## [687] "Other bituminous coal - final consumption"                                                              
## [688] "Other bituminous coal - final energy consumption"                                                       
## [689] "Other bituminous coal - imports"                                                                        
## [690] "Other bituminous coal - own use by coal mines"                                                          
## [691] "Other bituminous coal - production"                                                                     
## [692] "Other bituminous coal - receipts from other sources"                                                    
## [693] "Other bituminous coal - stock changes"                                                                  
## [694] "Other bituminous coal - total energy supply"                                                            
## [695] "Other bituminous coal - transformation"                                                                 
## [696] "Other bituminous coal - transformation in autoproducer CHP plants"                                      
## [697] "Other bituminous coal - transformation in autoproducer electricity plants"                              
## [698] "Other bituminous coal - transformation in blast furnaces"                                               
## [699] "Other bituminous coal - Transformation in electricity, CHP and heat plants"                             
## [700] "Other bituminous coal - transformation in main activity producer CHP plants"                            
## [701] "Other bituminous coal - transformation in main activity producer electricity plants"                    
## [702] "Other hydrocarbons - imports"                                                                           
## [703] "Other hydrocarbons - receipts from other sources"                                                       
## [704] "Other hydrocarbons - stock changes"                                                                     
## [705] "Other hydrocarbons - total energy supply"                                                               
## [706] "Other hydrocarbons - transformation"                                                                    
## [707] "Other hydrocarbons - transformation in oil refineries"                                                  
## [708] "Other kerosene - Consumption by commerce and public services"                                           
## [709] "Other kerosene - Consumption by households"                                                             
## [710] "Other kerosene - Consumption by other"                                                                  
## [711] "Other kerosene - Energy industries own use"                                                             
## [712] "Other kerosene - Exports"                                                                               
## [713] "Other kerosene - Final consumption"                                                                     
## [714] "Other kerosene - Final energy consumption"                                                              
## [715] "Other kerosene - Imports"                                                                               
## [716] "Other kerosene - Own use by oil refineries"                                                             
## [717] "Other kerosene - Production"                                                                            
## [718] "Other kerosene - production from refineries"                                                            
## [719] "Other kerosene - Stock changes"                                                                         
## [720] "Other kerosene - Total energy supply"                                                                   
## [721] "Other kerosene - Transfers and recycled products"                                                       
## [722] "Other kerosene - Transformation"                                                                        
## [723] "Other kerosene - Transformation in CHP plants - autoproducers"                                          
## [724] "Other kerosene - Transformation in electricity, CHP and heat plants"                                    
## [725] "Other kerosene - Transformation in electricity plants - main activity producers"                        
## [726] "Other liquid biofuels - Consumption by chemical and petrochemical"                                      
## [727] "Other liquid biofuels - Consumption by manufacturing, construction and non-fuel mining industry"        
## [728] "Other liquid biofuels - Consumption by non-metallic minerals"                                           
## [729] "Other liquid biofuels - Consumption by other manufacturing, construction and non-fuel mining industry"  
## [730] "Other liquid biofuels - Consumption by paper, pulp and print"                                           
## [731] "Other liquid biofuels - Final consumption"                                                              
## [732] "Other liquid biofuels - Final energy consumption"                                                       
## [733] "Other liquid biofuels - Production"                                                                     
## [734] "Other liquid biofuels - Total energy supply"                                                            
## [735] "Other liquid biofuels - Transformation"                                                                 
## [736] "Other liquid biofuels - Transformation in CHP plants - autoproducers"                                   
## [737] "Other liquid biofuels - Transformation in electricity, CHP and heat plants"                             
## [738] "Other liquid biofuels - Transformation in electricity plants - autoproducers"                           
## [739] "Other liquid biofuels - Transformation in electricity plants - main activity producers"                 
## [740] "Other oil products n.e.c. - Energy industries own use"                                                  
## [741] "Other oil products n.e.c. - Exports"                                                                    
## [742] "Other oil products n.e.c. - Final consumption"                                                          
## [743] "Other oil products n.e.c. - Imports"                                                                    
## [744] "Other oil products n.e.c. - Non-energy uses"                                                            
## [745] "Other oil products n.e.c. - Own use by oil refineries"                                                  
## [746] "Other oil products n.e.c. - Production"                                                                 
## [747] "Other oil products n.e.c. - production from refineries"                                                 
## [748] "Other oil products n.e.c. - Stock changes"                                                              
## [749] "Other oil products n.e.c. - Total energy supply"                                                        
## [750] "Other oil products n.e.c. - Transfers and recycled products"                                            
## [751] "Other oil products n.e.c. - Transformation"                                                             
## [752] "Other oil products n.e.c. - Transformation in CHP plants - autoproducers"                               
## [753] "Other oil products n.e.c. - Transformation in CHP plants - main activity producers"                     
## [754] "Other oil products n.e.c. - Transformation in electricity, CHP and heat plants"                         
## [755] "Other oil products n.e.c. - Transformation in electricity plants - main activity producers"             
## [756] "Vegetal waste - Consumption by households"                                                              
## [757] "Vegetal waste - Consumption by manufacturing, construction and non-fuel mining industry"                
## [758] "Vegetal waste - Consumption by other"                                                                   
## [759] "Vegetal waste - Consumption by other manufacturing, construction and non-fuel mining industry"          
## [760] "Vegetal waste - Final consumption"                                                                      
## [761] "Vegetal waste - Final energy consumption"                                                               
## [762] "Vegetal waste - Production"                                                                             
## [763] "Vegetal waste - Total energy supply"                                                                    
## [764] "Vegetal waste - Transformation"                                                                         
## [765] "Vegetal waste - Transformation in electricity, CHP and heat plants"                                     
## [766] "Paraffin waxes - Exports"                                                                               
## [767] "Paraffin waxes - Final consumption"                                                                     
## [768] "Paraffin waxes - Imports"                                                                               
## [769] "Paraffin waxes - Non-energy uses"                                                                       
## [770] "Paraffin waxes - Production"                                                                            
## [771] "Paraffin waxes - production from refineries"                                                            
## [772] "Paraffin waxes - Stock changes"                                                                         
## [773] "Paraffin waxes - Total energy supply"                                                                   
## [774] "Petroleum Coke - Consumption by industries not elsewhere specified"                                     
## [775] "Petroleum Coke - Consumption by machinery"                                                              
## [776] "Petroleum coke - Consumption by manufacturing, construction and non-fuel mining industry"               
## [777] "Petroleum Coke - Consumption by non-metallic minerals"                                                  
## [778] "Petroleum coke - Consumption by other manuf., const. and non-fuel min. ind."                            
## [779] "Petroleum Coke - Consumption by paper, pulp and print"                                                  
## [780] "Petroleum coke - Energy industries own use"                                                             
## [781] "Petroleum coke - Exports"                                                                               
## [782] "Petroleum coke - final consumption"                                                                     
## [783] "Petroleum Coke - Final energy consumption"                                                              
## [784] "Petroleum coke - Imports"                                                                               
## [785] "Petroleum coke - Non-energy uses"                                                                       
## [786] "Petroleum coke - Own use by oil refineries"                                                             
## [787] "Petroleum coke - Production"                                                                            
## [788] "Petroleum coke - production from refineries"                                                            
## [789] "Petroleum coke - Stock changes"                                                                         
## [790] "Petroleum coke - Total energy supply"                                                                   
## [791] "Petroleum coke - Transformation"                                                                        
## [792] "Petroleum Coke - Transformation in CHP plants - autoproducers"                                          
## [793] "Petroleum Coke - Transformation in CHP plants - main activity producers"                                
## [794] "Petroleum coke - Transformation in electricity, CHP and heat plants"                                    
## [795] "Petroleum Coke - Transformation in electricity plants - autoproducers"                                  
## [796] "Petroleum Coke - Transformation in electricity plants - main activity producers"                        
## [797] "Feedstocks - exports"                                                                                   
## [798] "Feedstocks - imports"                                                                                   
## [799] "Feedstocks - stock changes"                                                                             
## [800] "Feedstocks - total energy supply"                                                                       
## [801] "Feedstocks - transfers and recycled products"                                                           
## [802] "Feedstocks - transformation"                                                                            
## [803] "Feedstocks - transformation in oil refineries"                                                          
## [804] "Refinery gas - Energy industries own use"                                                               
## [805] "Refinery gas - Final consumption"                                                                       
## [806] "Refinery gas - Non-energy uses"                                                                         
## [807] "Refinery gas - Own use by oil refineries"                                                               
## [808] "Refinery gas - Production"                                                                              
## [809] "Refinery gas - Production from refineries"                                                              
## [810] "Refinery gas - Total energy supply"                                                                     
## [811] "Refinery gas - Transformation"                                                                          
## [812] "Refinery Gas - Transformation in CHP plants - autoproducers"                                            
## [813] "Refinery gas - Transformation in electricity, CHP and heat plants"                                      
## [814] "Refinery Gas - Transformation in electricity plants - autoproducers"                                    
## [815] "Electricity - total solar production"                                                                   
## [816] "Sub-bituminous coal - Consumption by chemical industry"                                                 
## [817] "Sub-bituminous coal - Consumption by coal mines"                                                        
## [818] "Sub-bituminous coal - Consumption by commerce and public services"                                      
## [819] "Sub-bituminous coal - Consumption by energy sector"                                                     
## [820] "Sub-bituminous coal - Consumption by food and tobacco industry"                                         
## [821] "Sub-bituminous coal - Consumption by manufacturing, construction and non-fuel industry"                 
## [822] "Sub-bituminous coal - Consumption by non-metallic minerals industry"                                    
## [823] "Sub-bituminous coal - Consumption by other"                                                             
## [824] "Sub-bituminous coal - Consumption by other manuf., const. and non-fuel ind."                            
## [825] "Sub-bituminous coal - Consumption by paper, pulp and print"                                             
## [826] "Sub-bituminous coal - Consumption not elsewhere specified (industry)"                                   
## [827] "Sub-bituminous coal - Exports"                                                                          
## [828] "Sub-bituminous coal - Final consumption"                                                                
## [829] "Sub-bituminous coal - Final energy consumption"                                                         
## [830] "Sub-bituminous coal - Imports"                                                                          
## [831] "Sub-bituminous coal - Production"                                                                       
## [832] "Sub-bituminous coal - Receipts from other sources"                                                      
## [833] "Sub-bituminous coal - Stock changes"                                                                    
## [834] "Sub-bituminous coal - Total energy supply"                                                              
## [835] "Sub-bituminous coal - Transformation"                                                                   
## [836] "Sub-bituminous coal - Transformation in autoproducer CHP plants"                                        
## [837] "Sub-bituminous coal - Transformation in autoproducer electricity plants"                                
## [838] "Sub-bituminous coal - Transformation in electricity, CHP and heat plants"                               
## [839] "Sub-bituminous coal - Transformation in main activity electricity plants"                               
## [840] "Sub-bituminous coal - Transformation main activity CHP plants"                                          
## [841] "Electricity - total thermal production"                                                                 
## [842] "Electricity - Consumption by chemical and petrochemical"                                                
## [843] "Electricity - Consumption by commercial and public services"                                            
## [844] "Electricity - Consumption by construction"                                                              
## [845] "Electricity - Consumption by food and tobacco"                                                          
## [846] "Electricity - Consumption by households"                                                                
## [847] "Electricity - Consumption by iron and steel"                                                            
## [848] "Electricity - Consumption by machinery"                                                                 
## [849] "Electricity - Consumption by manufacturing, construction and non-fuel industry"                         
## [850] "Electricity - Consumption by mining and quarrying"                                                      
## [851] "Electricity - Consumption by non-ferrous metals"                                                        
## [852] "Electricity - Consumption by non-metallic minerals"                                                     
## [853] "Electricity - Consumption by other"                                                                     
## [854] "Electricity - Consumption by other manuf., const. and non-fuel ind."                                    
## [855] "Electricity - Consumption by paper, pulp and print"                                                     
## [856] "Electricity - Consumption by rail"                                                                      
## [857] "Electricity - Consumption by road"                                                                      
## [858] "Electricity - Consumption by textile and leather"                                                       
## [859] "Electricity - Consumption by transport"                                                                 
## [860] "Electricity - Consumption by transport equipment"                                                       
## [861] "Electricity - Consumption by wood and wood products"                                                    
## [862] "Electricity - Consumption in agriculture, forestry and fishing"                                         
## [863] "Electricity - Consumption not elsewhere specified (industry)"                                           
## [864] "Electricity - Consumption not elsewhere specified (other)"                                              
## [865] "Electricity - Energy industries own use"                                                                
## [866] "Electricity - exports"                                                                                  
## [867] "Electricity - Final energy consumption"                                                                 
## [868] "Electricity - Gross demand"                                                                             
## [869] "Electricity - Gross production"                                                                         
## [870] "Electricity - imports"                                                                                  
## [871] "Electricity - Losses"                                                                                   
## [872] "Electricity - net production"                                                                           
## [873] "Electricity - Other energy industry own use"                                                            
## [874] "Electricity - Own use by blast furnaces"                                                                
## [875] "Electricity - Own use by coal mines"                                                                    
## [876] "Electricity - Own use by coke ovens"                                                                    
## [877] "Electricity - Own use by electricity, heat and CHP plants"                                              
## [878] "Electricity - Own use by oil and gas extraction"                                                        
## [879] "Electricity - Own use by oil refineries"                                                                
## [880] "Electricity - Own use by pump-storage plants"                                                           
## [881] "Electricity - total production, autoproducer"                                                           
## [882] "Electricity - total production, main activity"                                                          
## [883] "From combustible fuels – Autoproducer"                                                                  
## [884] "From combustible fuels – Autoproducer – CHP plants"                                                     
## [885] "From combustible fuels – Autoproducer – Electricity plants"                                             
## [886] "From combustible fuels – Main activity – Electricity plants"                                            
## [887] "From other sources – Autoproducer"                                                                      
## [888] "From other sources – Autoproducer – CHP plants"                                                         
## [889] "From other sources – Autoproducer – Electricity plants"                                                 
## [890] "From other sources – Main activity"                                                                     
## [891] "From other sources – Main activity – CHP plants"                                                        
## [892] "From other sources – Main activity – Electricity plants"                                                
## [893] "Geothermal – Main activity"                                                                             
## [894] "Geothermal – Main activity – Electricity plants"                                                        
## [895] "Hydro – Autoproducer"                                                                                   
## [896] "Hydro – Main activity"                                                                                  
## [897] "Nuclear – Main activity"                                                                                
## [898] "Nuclear – Main activity – Electricity plants"                                                           
## [899] "Of which: Pumped hydro – Main activity"                                                                 
## [900] "Solar – Autoproducer"                                                                                   
## [901] "Solar – Main activity"                                                                                  
## [902] "Solar photovoltaic – Autoproducer"                                                                      
## [903] "Solar photovoltaic – Main activity"                                                                     
## [904] "Solar thermal – Main activity"                                                                          
## [905] "Wind – Autoproducer"                                                                                    
## [906] "Wind – Main activity"                                                                                   
## [907] "Total refinery output"                                                                                  
## [908] "Total refinery throughput"                                                                              
## [909] "Uranium - production"                                                                                   
## [910] "Uranium - reasonably assured reserves"                                                                  
## [911] "White spirit and special boiling point industrial spirits - final consumption"                          
## [912] "White spirit and special boiling point industrial spirits - Imports"                                    
## [913] "White spirit and special boiling point industrial spirits - Non-energy uses"                            
## [914] "White spirit and special boiling point industrial spirits - Production"                                 
## [915] "White spirit and special boiling point industrial spirits - production from refineries"                 
## [916] "White spirit and special boiling point industrial spirits - Stock changes"                              
## [917] "White spirit and special boiling point industrial spirits - Total energy supply"                        
## [918] "White spirit and special boiling point industrial spirits - Transfers and recycled products"            
## [919] "Electricity - total wind production"
unique(unitedstates2014$category)
##  [1] "additives_and_oxygenates"                                   
##  [2] "animal_waste"                                               
##  [3] "anthracite"                                                 
##  [4] "aviation_gasoline"                                          
##  [5] "bagasse"                                                    
##  [6] "biodiesel"                                                  
##  [7] "biogases"                                                   
##  [8] "biogasoline"                                                
##  [9] "bitumen"                                                    
## [10] "black_liquor"                                               
## [11] "blast_furnace_gas"                                          
## [12] "brown_coal"                                                 
## [13] "charcoal"                                                   
## [14] "coke_oven_coke"                                             
## [15] "coking_coal"                                                
## [16] "conventional_crude_oil"                                     
## [17] "direct_use_of_geothermal_heat"                              
## [18] "direct_use_of_solar_thermal_heat"                           
## [19] "electricity_net_installed_capacity_of_electric_power_plants"
## [20] "ethane"                                                     
## [21] "fuel_oil"                                                   
## [22] "fuelwood"                                                   
## [23] "gas_oil_diesel_oil"                                         
## [24] "gasworks_gas"                                               
## [25] "geothermal"                                                 
## [26] "hard_coal"                                                  
## [27] "heat"                                                       
## [28] "hydro"                                                      
## [29] "industrial_waste"                                           
## [30] "kerosene_type_jet_fuel"                                     
## [31] "lignite"                                                    
## [32] "liquified_petroleum_gas"                                    
## [33] "lubricants"                                                 
## [34] "motor_gasoline"                                             
## [35] "municipal_wastes"                                           
## [36] "naphtha"                                                    
## [37] "natural_gas_including_lng"                                  
## [38] "natural_gas_liquids"                                        
## [39] "nuclear_electricity"                                        
## [40] "of_which_biodiesel"                                         
## [41] "of_which_biogasoline"                                       
## [42] "other_bituminous_coal"                                      
## [43] "other_hydrocarbons"                                         
## [44] "other_kerosene"                                             
## [45] "other_liquid_biofuels"                                      
## [46] "other_oil_products_n_e_c"                                   
## [47] "other_vegetal_material_and_residues"                        
## [48] "paraffin_waxes"                                             
## [49] "petroleum_coke"                                             
## [50] "refinery_feedstocks"                                        
## [51] "refinery_gas"                                               
## [52] "solar_electricity"                                          
## [53] "sub_bituminous_coal"                                        
## [54] "thermal_electricity"                                        
## [55] "total_electricity"                                          
## [56] "total_refinery_output"                                      
## [57] "uranium"                                                    
## [58] "white_spirit_and_special_boiling_point_industrial_spirits"  
## [59] "wind_electricity"
unique(unitedstates2014$unit)
## [1] "Metric tons,  thousand"  "Terajoules"             
## [3] "Kilowatts,  thousand"    "Cubic metres, thousand" 
## [5] "Kilowatt-hours, million" "Metric Tons"
electricity_killowatt_hours <-  unitedstates %>%
  filter(unit == 'Kilowatt-hours, million') 

unique(electricity_killowatt_hours$commodity_transaction)
##  [1] "Falling water - total hydraulic resources"                                     
##  [2] "Electricity - total geothermal production"                                     
##  [3] "Electricity - total hydro production"                                          
##  [4] "Electricity - total nuclear production"                                        
##  [5] "Electricity - total solar production"                                          
##  [6] "Electricity - total thermal production"                                        
##  [7] "Electricity - Consumption by chemical and petrochemical"                       
##  [8] "Electricity - Consumption by commercial and public services"                   
##  [9] "Electricity - Consumption by construction"                                     
## [10] "Electricity - Consumption by food and tobacco"                                 
## [11] "Electricity - Consumption by households"                                       
## [12] "Electricity - Consumption by iron and steel"                                   
## [13] "Electricity - Consumption by machinery"                                        
## [14] "Electricity - Consumption by manufacturing, construction and non-fuel industry"
## [15] "Electricity - Consumption by mining and quarrying"                             
## [16] "Electricity - Consumption by non-ferrous metals"                               
## [17] "Electricity - Consumption by non-metallic minerals"                            
## [18] "Electricity - Consumption by other"                                            
## [19] "Electricity - Consumption by other manuf., const. and non-fuel ind."           
## [20] "Electricity - Consumption by paper, pulp and print"                            
## [21] "Electricity - Consumption by rail"                                             
## [22] "Electricity - Consumption by road"                                             
## [23] "Electricity - Consumption by textile and leather"                              
## [24] "Electricity - Consumption by transport"                                        
## [25] "Electricity - Consumption by transport equipment"                              
## [26] "Electricity - Consumption by wood and wood products"                           
## [27] "Electricity - Consumption in agriculture, forestry and fishing"                
## [28] "Electricity - Consumption not elsewhere specified (industry)"                  
## [29] "Electricity - Consumption not elsewhere specified (other)"                     
## [30] "Electricity - Energy industries own use"                                       
## [31] "Electricity - exports"                                                         
## [32] "Electricity - Final energy consumption"                                        
## [33] "Electricity - Gross demand"                                                    
## [34] "Electricity - Gross production"                                                
## [35] "Electricity - imports"                                                         
## [36] "Electricity - Losses"                                                          
## [37] "Electricity - net production"                                                  
## [38] "Electricity - Other energy industry own use"                                   
## [39] "Electricity - Own use by blast furnaces"                                       
## [40] "Electricity - Own use by coal mines"                                           
## [41] "Electricity - Own use by coke ovens"                                           
## [42] "Electricity - Own use by electricity, heat and CHP plants"                     
## [43] "Electricity - Own use by oil and gas extraction"                               
## [44] "Electricity - Own use by oil refineries"                                       
## [45] "Electricity - Own use by pump-storage plants"                                  
## [46] "Electricity - total production, autoproducer"                                  
## [47] "Electricity - total production, main activity"                                 
## [48] "From combustible fuels – Autoproducer"                                         
## [49] "From combustible fuels – Autoproducer – CHP plants"                            
## [50] "From combustible fuels – Autoproducer – Electricity plants"                    
## [51] "From combustible fuels – Main activity"                                        
## [52] "From combustible fuels – Main activity – CHP plants"                           
## [53] "From combustible fuels – Main activity – Electricity plants"                   
## [54] "From other sources – Autoproducer"                                             
## [55] "From other sources – Autoproducer – CHP plants"                                
## [56] "From other sources – Autoproducer – Electricity plants"                        
## [57] "From other sources – Main activity"                                            
## [58] "From other sources – Main activity – CHP plants"                               
## [59] "From other sources – Main activity – Electricity plants"                       
## [60] "Geothermal – Autoproducer"                                                     
## [61] "Geothermal – Autoproducer – Electricity plants"                                
## [62] "Geothermal – Main activity"                                                    
## [63] "Geothermal – Main activity – Electricity plants"                               
## [64] "Hydro – Autoproducer"                                                          
## [65] "Hydro – Main activity"                                                         
## [66] "Nuclear – Autoproducer"                                                        
## [67] "Nuclear – Autoproducer – CHP plants"                                           
## [68] "Nuclear – Main activity"                                                       
## [69] "Nuclear – Main activity – Electricity plants"                                  
## [70] "Of which: Pumped hydro – Main activity"                                        
## [71] "Solar – Autoproducer"                                                          
## [72] "Solar – Main activity"                                                         
## [73] "Solar photovoltaic – Autoproducer"                                             
## [74] "Solar photovoltaic – Main activity"                                            
## [75] "Solar thermal – Autoproducer"                                                  
## [76] "Solar thermal – Main activity"                                                 
## [77] "Wind – Autoproducer"                                                           
## [78] "Wind – Main activity"                                                          
## [79] "Electricity - total wind production"
renewable_geothermal <- electricity_killowatt_hours %>%
  filter(commodity_transaction == "Electricity - total geothermal production") 

renewable_hydro <- electricity_killowatt_hours %>%
  filter(commodity_transaction == "Electricity - total hydro production") 

renewable_nuclear <- electricity_killowatt_hours %>%
  filter(commodity_transaction == "Electricity - total nuclear production") 

renewable_solar <- electricity_killowatt_hours %>%
  filter(commodity_transaction == "Electricity - total solar production") 

renewable_wind <- electricity_killowatt_hours %>%
  filter(commodity_transaction == "Electricity - total wind production")
df1 <- full_join(renewable_geothermal, renewable_hydro)
## Joining, by = c("country_or_area", "commodity_transaction", "year", "unit", "quantity", "quantity_footnotes", "category")
df2 <- full_join(df1, renewable_nuclear)
## Joining, by = c("country_or_area", "commodity_transaction", "year", "unit", "quantity", "quantity_footnotes", "category")
df3 <- full_join(df2, renewable_solar)
## Joining, by = c("country_or_area", "commodity_transaction", "year", "unit", "quantity", "quantity_footnotes", "category")
renewable_energy <- full_join(df3, renewable_wind)
## Joining, by = c("country_or_area", "commodity_transaction", "year", "unit", "quantity", "quantity_footnotes", "category")
highchart () %>%
  hc_add_series(data = renewable_energy,
                   type = "area",
                   hcaes(x = year,
                   y = quantity, 
                   group = commodity_transaction)) %>%
  hc_chart(style = list(fontFamily = "Georgia",
                        fontWeight = "bold")) %>%
  hc_plotOptions(series = list(stacking = "normal",
                               marker = list(enabled = FALSE,
                               states = list(hover = list(enabled = TRUE))),
                               lineWidth = 0.2,
                               lineColor = "white")) %>%
  hc_xAxis(title = list(text="Year")) %>%
  hc_yAxis(title = list(text="Killowat hrs (Million)")) %>%
  hc_title(text = "Renewable Energy Production in US 1990-2014") %>%
  hc_legend(align = "right", verticalAlign = "bottom",
            layout = "vertical") %>%
  hc_tooltip(enabled = TRUE)
## Warning: `parse_quosure()` is deprecated as of rlang 0.2.0.
## Please use `parse_quo()` instead.
## This warning is displayed once per session.
china <- energy %>%
  filter(country_or_area == 'China') 

electricity_killowatt_hours_china <-  china %>%
  filter(unit == 'Kilowatt-hours, million') 


renewable_geothermal_china <- electricity_killowatt_hours_china %>%
  filter(commodity_transaction == "Electricity - total geothermal production") 

renewable_hydro_china <- electricity_killowatt_hours_china %>%
  filter(commodity_transaction == "Electricity - total hydro production") 

renewable_nuclear_china <- electricity_killowatt_hours_china %>%
  filter(commodity_transaction == "Electricity - total nuclear production") 

renewable_solar_china <- electricity_killowatt_hours_china %>%
  filter(commodity_transaction == "Electricity - total solar production") 

renewable_wind_china <- electricity_killowatt_hours_china %>%
  filter(commodity_transaction == "Electricity - total wind production")


df4 <- full_join(renewable_geothermal_china, renewable_hydro_china)
## Joining, by = c("country_or_area", "commodity_transaction", "year", "unit", "quantity", "quantity_footnotes", "category")
df5 <- full_join(df4, renewable_nuclear_china)
## Joining, by = c("country_or_area", "commodity_transaction", "year", "unit", "quantity", "quantity_footnotes", "category")
df6 <- full_join(df5, renewable_solar_china)
## Joining, by = c("country_or_area", "commodity_transaction", "year", "unit", "quantity", "quantity_footnotes", "category")
renewable_energy_china <- full_join(df3, renewable_wind_china)
## Joining, by = c("country_or_area", "commodity_transaction", "year", "unit", "quantity", "quantity_footnotes", "category")
highchart () %>%
  hc_add_series(data = renewable_energy_china,
                   type = "area",
                   hcaes(x = year,
                   y = quantity, 
                   group = commodity_transaction)) %>%
  hc_chart(style = list(fontFamily = "Georgia",
                        fontWeight = "bold")) %>%
  hc_plotOptions(series = list(stacking = "normal",
                               marker = list(enabled = FALSE,
                               states = list(hover = list(enabled = TRUE))),
                               lineWidth = 0.2,
                               lineColor = "white")) %>%
  hc_xAxis(title = list(text="Year")) %>%
  hc_yAxis(title = list(text="Killowat hrs (Million)")) %>%
  hc_title(text = "Renewable Energy Production in China 1990-2014") %>%
  hc_legend(align = "right", verticalAlign = "bottom",
            layout = "vertical") %>%
  hc_tooltip(enabled = TRUE)

It is hard to make a prediction on usage based on our above graphs, but we can make some observations about the trends. It seems that both the US and China seem to have a similar ratio of renewable usage, with the sole exception being wind energy. The United States utilized wind energy for longer, but China has been rapidly increasing its wind energy output and is only slightly behind the capacity of the US.

renewable_geothermal_sum <- renewable_geothermal %>%
  summarise(sum(quantity))

renewable_hydro_sum <- renewable_hydro %>%
  summarise(sum(quantity))

renewable_nuclear_sum <- renewable_nuclear %>%
  summarise(sum(quantity))

renewable_solar_sum <- renewable_solar %>%
  summarise(sum(quantity))
     
renewable_wind_sum <- renewable_wind %>%
  summarise(sum(quantity))


df7 <- full_join(renewable_geothermal_sum, renewable_hydro_sum)
## Joining, by = "sum(quantity)"
df8 <- full_join(df7, renewable_nuclear_sum)
## Joining, by = "sum(quantity)"
df9 <- full_join(df8, renewable_solar_sum)
## Joining, by = "sum(quantity)"
renewable_energy_sum_us <- full_join(df9, renewable_wind_sum)
## Joining, by = "sum(quantity)"
renewable_geothermal_china_sum <- renewable_geothermal_china %>%
  summarise(sum(quantity))

renewable_hydro_china_sum <- renewable_hydro_china %>%
  summarise(sum(quantity))

renewable_nuclear_china_sum <- renewable_nuclear_china %>%
  summarise(sum(quantity))

renewable_solar_china_sum <- renewable_solar_china %>%
  summarise(sum(quantity))
     
renewable_wind_china_sum <- renewable_wind_china %>%
  summarise(sum(quantity))


df10 <- full_join(renewable_geothermal_china_sum, renewable_hydro_china_sum)
## Joining, by = "sum(quantity)"
df11 <- full_join(df10, renewable_nuclear_china_sum)
## Joining, by = "sum(quantity)"
df12 <- full_join(df11, renewable_solar_china_sum)
## Joining, by = "sum(quantity)"
renewable_energy_sum_china <- full_join(df9, renewable_wind_china_sum)
## Joining, by = "sum(quantity)"

I decided to do an independent two-sample T test to examine the rise of wind energy in the US and China and if they were significantly different from each other. For this case Ho will be that they are not related. Ha will be that the rise in wind energy between China and the US are related, perhaps reflecting a global push to embrace renewables. Unfortunately, there was no data available for China before 2010, so I decided to only compare the wind energy data from the US and China 2010-2014.

wind_energy_US_2010to2014 <- c(183892, 169713, 141922, 120854, 95148)

wind_energy_China_2010to2014 <- c(156078, 141197, 95978, 70331, 44622)

t.test(wind_energy_US_2010to2014, wind_energy_China_2010to2014, var.equal = FALSE)
## 
##  Welch Two Sample t-test
## 
## data:  wind_energy_US_2010to2014 and wind_energy_China_2010to2014
## t = 1.5394, df = 7.4939, p-value = 0.1648
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
##  -20974.94 102304.14
## sample estimates:
## mean of x mean of y 
##  142305.8  101641.2
boxplot(wind_energy_US_2010to2014, wind_energy_China_2010to2014,
        main= "Wind Energy Usage US vs China",
        xlab= "US vs China",
        ylab= "Kilowatt-hours, million")

Since our P-value (0.1648) is greater than 0.05 we fail to reject the null hypothesis. What this means is that the use of wind energy between China and the US are not related. This is evident in the fact that the US has been utilizing wind energy for approximately 30 years while China only started 10 years ago.

I then decided to investigate the relationship between Nuclear energy, commonly known as the “dirtiest” renewable energy due to the problematic nature of the spent fuel rods, and Solar energy, one of the “cleanest” renewables. I wanted to see if the rise in Solar resulted in a decrease in the us of Nuclear power. The Ho for my chi square test is that these two variables are independent of each other, while the Ha is that there are dependent.

table <- matrix(c(19065801, 1051155, 81665, 20753), ncol=2)

colnames(table) <- c('Nuclear', 'Solar')

rownames(table) <- c('US', 'China')
trial.table <- as.table(table)
result <- chisq.test(table)

The resulting P value of 2.2e-16, which is smaller than 0.05, therefore we reject the null hypothesis and can state that there is a relationship between Nuclear energy and Solar energy. It should be stated that even though there is a relationship between the two, we cannot state what that might be.

Finally, I decided to test the covariance of Wind and Solar since common sense dictates the increase in use of one would give rise to a general increase in the use of renewables as a whole.

hydro_vs_geothermal <- plot(x = renewable_solar$quantity, y = renewable_wind$quantity,
   xlab = "Solar",
   ylab = "Wind",
   main = "Solar vs Wind",
   col=4, lwd=1
)

The scatter plot indicates a correlation between the two, and now we’ll check the variance using the cor function

cor(renewable_solar$quantity, renewable_wind$quantity)
## [1] 0.9011174

As we can see from above, there seems to be a fairly strong positive correlation between the use of solar energy and wind energy.

linear_regress <- lm(renewable_wind$quantity ~ renewable_solar$quantity)

summary(linear_regress)
## 
## Call:
## lm(formula = renewable_wind$quantity ~ renewable_solar$quantity)
## 
## Residuals:
##    Min     1Q Median     3Q    Max 
## -48936 -14600 -10872   8903  54686 
## 
## Coefficients:
##                           Estimate Std. Error t value Pr(>|t|)    
## (Intercept)              1.059e+04  5.845e+03   1.811   0.0832 .  
## renewable_solar$quantity 9.033e+00  9.063e-01   9.967 8.13e-10 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 25200 on 23 degrees of freedom
## Multiple R-squared:  0.812,  Adjusted R-squared:  0.8038 
## F-statistic: 99.35 on 1 and 23 DF,  p-value: 8.13e-10
hydro_vs_geothermal <- plot(x = renewable_solar$quantity, y = renewable_wind$quantity,
   xlab = "Solar",
   ylab = "Wind",
   main = "Solar vs Wind",
   col=4, lwd=1
)

abline(linear_regress, col=2, lwd=3)

The linear model has a P-value of 8.13e-10 which is smaller than 0.05 stating that there is a strong positive correlation between the two and that the model is statistically significant. The R-squared value for my model is 0.812 which means that 81.2% of the variation the y data is due to variation in the x data.

Some ethical concerns I have regarding this project is that the data used comes from self-reporting, increasing the chance of false/ misleading data. This can be problematic when this same data is used to implement public policy that could have adverse effects on a population. Another concern that I have is that the data does not consider the human/ environmental toll taken by producing certain energies. It may even lead to the adoption of energy sources that are highly damaging to the environment but have a higher ROI in terms of energy harvested for money invested.