Energy - monthly data

Data - Eurostat

Info

source dataset .html .RData

eurostat

ei_isen_m

2024-06-20 2024-06-08

Data on energy

source dataset .html .RData

ec

WOB

2024-06-19 2024-01-03

eurostat

ei_isen_m

2024-06-20 2024-06-08

eurostat

nrg_bal_c

2023-12-31 2024-06-08

eurostat

nrg_pc_202

2024-06-20 2024-06-08

eurostat

nrg_pc_203

2023-06-11 2024-06-07

eurostat

nrg_pc_203_c

2024-06-20 2024-06-08

eurostat

nrg_pc_203_h

2024-06-20 2024-06-23

eurostat

nrg_pc_203_v

2024-06-20 2024-06-08

eurostat

nrg_pc_204

2024-06-20 2024-06-23

eurostat

nrg_pc_205

2023-06-11 2024-06-08

fred

energy

2024-06-20 2024-06-07

iea

world_energy_balances_highlights_2022

2024-06-20 2023-04-24

wb

CMO

2024-06-20 2024-05-23

wdi

EG.GDP.PUSE.KO.PP.KD

2024-06-20 2024-04-14

wdi

EG.USE.PCAP.KG.OE

2024-06-20 2024-04-14

yahoo

energy

2024-06-23 2024-06-23

Last

Code
ei_isen_m %>%
  group_by(time) %>%
  summarise(Nobs = n()) %>%
  arrange(desc(time)) %>%
  head(2) %>%
  print_table_conditional()
time Nobs
2024M05 13
2024M04 154

indic

French

Code
load_data("eurostat/indic_fr.RData")
ei_isen_m %>%
  left_join(indic, by = "indic") %>%
  group_by(indic, Indic) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  {if (is_html_output()) print_table(.) else .}
indic Indic Nobs
IS-CEL-GWH Consommation d'électricité - GWh 6553
IS-IEL-GWH Importations d'électricité GWh 6553
IS-CNG-TJ Consommation totale de gaz naturel, TJ (GCV) 6442
IS-IDC-T Livraisons intérieures de charbon brun - 1000t 6426
IS-ING-TJ Importations de gaz naturel, TJ (GCV) 6402
IS-IDMG-T Livraisons intérieures d'essence moteur - 1000t 6310
IS-IDJF-T Livraisons intérieures de carburéacteur type kérosène - 1000t 6302
IS-ICO-T Importations de pétrole brut - 1000 t 6140
IS-PNG-TJ Production de gas naturel, TJ (GVC) 6138
IS-IDMS-T Livraisons intérieures d'essence pour moteurs - 1000t 4391
IS-IDGD-T Livraisons intérieures de gas-oil - 1000t 4389
IS-ROGD-T Production de gasoil des raffineries - 1000t 4239
IS-ROMS-T Production d'essence pour moteur des raffineries - 1000t 4239
IS-PEL-GWH Production d'électricité - GWh 3570

English

Code
load_data("eurostat/indic.RData")
ei_isen_m %>%
  left_join(indic, by = "indic") %>%
  group_by(indic, Indic) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  {if (is_html_output()) print_table(.) else .}
indic Indic Nobs
IS-CEL-GWH Consumption of electricity - GWh 6553
IS-IEL-GWH Imports of electricity - GWh 6553
IS-CNG-TJ Total consumption of natural gas, TJ (GCV) 6442
IS-IDC-T Inland deliveries of brown coal - 1000t 6426
IS-ING-TJ Imports of natural gas, TJ (GCV) 6402
IS-IDMG-T Inland deliveries of motor gasoline - 1000t 6310
IS-IDJF-T Inland deliveries of kerosene-type jet fuel - 1000t 6302
IS-ICO-T Imports of crude oil - 1000t 6140
IS-PNG-TJ Production of natural gas, TJ (GCV) 6138
IS-IDMS-T Inland deliveries of motor spirit - 1000t 4391
IS-IDGD-T Inland deliveries of gas/diesel oil - 1000t 4389
IS-ROGD-T Refinery output of gas/diesel oil - 1000t 4239
IS-ROMS-T Refinery output of motor spirit - 1000t 4239
IS-PEL-GWH Production of electricity - GWh 3570

geo

Code
ei_isen_m %>%
  left_join(geo, by = "geo") %>%
  group_by(geo, Geo) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  mutate(Geo = ifelse(geo == "DE", "Germany", Geo)) %>%
  mutate(Flag = gsub(" ", "-", str_to_lower(Geo)),
         Flag = paste0('<img src="../../bib/flags/vsmall/', Flag, '.png" alt="Flag">')) %>%
  select(Flag, everything()) %>%
  {if (is_html_output()) datatable(., filter = 'top', rownames = F, escape = F) else .}

time

Code
ei_isen_m %>%
  group_by(time) %>%
  summarise(Nobs = n()) %>%
  arrange(desc(time)) %>%
  {if (is_html_output()) datatable(., filter = 'top', rownames = F) else .}

France, Germany, Italy, Spain

Electricity

Consumption

Code
ei_isen_m %>%
  filter(geo %in% c("FR", "DE", "IT", "ES"),
         indic %in% c("IS-CEL-GWH")) %>%
  left_join(geo, by = "geo") %>%
  month_to_date %>%
  left_join(colors, by = c("Geo" = "country")) %>%
  ggplot + geom_line(aes(x = date, y = values, color = color)) +
  scale_color_identity() + theme_minimal()  + add_4flags +
  scale_x_date(breaks = as.Date(paste0(seq(1960, 2025, 2), "-01-01")),
               labels = date_format("%Y")) +
  xlab("") + ylab("")

Imports

Code
ei_isen_m %>%
  filter(geo %in% c("FR", "DE", "IT", "ES"),
         indic %in% c("IS-IEL-GWH")) %>%
  left_join(geo, by = "geo") %>%
  month_to_date %>%
  left_join(colors, by = c("Geo" = "country")) %>%
  ggplot + geom_line(aes(x = date, y = values, color = color)) +
  scale_color_identity() + theme_minimal()  + add_4flags +
  scale_x_date(breaks = as.Date(paste0(seq(1960, 2025, 2), "-01-01")),
               labels = date_format("%Y")) +
  xlab("") + ylab("")

Production

Code
ei_isen_m %>%
  filter(geo %in% c("FR", "DE", "IT", "ES"),
         indic %in% c("IS-PEL-GWH")) %>%
  left_join(geo, by = "geo") %>%
  month_to_date %>%
  left_join(colors, by = c("Geo" = "country")) %>%
  ggplot + geom_line(aes(x = date, y = values, color = color)) +
  scale_color_identity() + theme_minimal()  + add_4flags +
  scale_x_date(breaks = as.Date(paste0(seq(1960, 2025, 1), "-01-01")),
               labels = date_format("%Y")) +
  xlab("") + ylab("")

Natural Gas

Consumption

Code
ei_isen_m %>%
  filter(geo %in% c("FR", "DE", "IT", "ES"),
         indic %in% c("IS-CNG-TJ")) %>%
  left_join(geo, by = "geo") %>%
  month_to_date %>%
  left_join(colors, by = c("Geo" = "country")) %>%
  ggplot + geom_line(aes(x = date, y = values, color = color)) +
  scale_color_identity() + theme_minimal()  + add_4flags +
  scale_x_date(breaks = as.Date(paste0(seq(1960, 2025, 2), "-01-01")),
               labels = date_format("%Y")) +
  xlab("") + ylab("")

Imports

Code
ei_isen_m %>%
  filter(geo %in% c("FR", "DE", "IT", "ES"),
         indic %in% c("IS-ING-TJ")) %>%
  left_join(geo, by = "geo") %>%
  month_to_date %>%
  left_join(colors, by = c("Geo" = "country")) %>%
  ggplot + geom_line(aes(x = date, y = values, color = color)) +
  scale_color_identity() + theme_minimal()  + add_4flags +
  scale_x_date(breaks = as.Date(paste0(seq(1960, 2025, 2), "-01-01")),
               labels = date_format("%Y")) +
  xlab("") + ylab("")

Production

Code
ei_isen_m %>%
  filter(geo %in% c("FR", "DE", "IT", "ES"),
         indic %in% c("IS-PNG-TJ")) %>%
  left_join(geo, by = "geo") %>%
  month_to_date %>%
  left_join(colors, by = c("Geo" = "country")) %>%
  ggplot + geom_line(aes(x = date, y = values, color = color)) +
  scale_color_identity() + theme_minimal()  + add_4flags +
  scale_x_date(breaks = as.Date(paste0(seq(1960, 2025, 1), "-01-01")),
               labels = date_format("%Y")) +
  xlab("") + ylab("")