International trade of EU, the euro area and the Member States by SITC product group - ext_lt_intertrd

Data - Eurostat

Info

LAST_DOWNLOAD

Code
tibble(dataset = c("ext_lt_intertrd", "ext_lt_intratrd", "ext_lt_introeu27_2020")) %>%
  mutate(LAST_DOWNLOAD = as.Date(file.info(paste0("~/Library/Mobile\ Documents/com~apple~CloudDocs/website/data/eurostat/", dataset, ".RData"))$mtime)) %>%
  mutate(html = paste0("[html](https://fgeerolf.com/data/eurostat/", dataset, '.html)')) %>%
  print_table_conditional()
dataset LAST_DOWNLOAD html
ext_lt_intertrd 2024-10-08 [html]
ext_lt_intratrd 2024-10-08 [html]
ext_lt_introeu27_2020 2024-10-08 [html]

LAST_COMPILE

LAST_COMPILE
2024-11-05

Last

Code
ext_lt_intertrd %>%
  group_by(time) %>%
  summarise(Nobs = n()) %>%
  arrange(desc(time)) %>%
  head(1) %>%
  print_table_conditional()
time Nobs
2023 2362

indic_et

Code
ext_lt_intertrd %>%
  left_join(indic_et, by = "indic_et") %>%
  group_by(indic_et, Indic_et) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  print_table_conditional()
indic_et Indic_et Nobs
MIO_BAL_VAL Trade balance in million ECU/EURO 5104
MIO_EXP_VAL Exports in million of ECU/EURO 5104
MIO_IMP_VAL Imports in million of ECU/EURO 5104
PC_EXP_EU Share of exports to EU in total exports (%) 4928
PC_IMP_EU Share of imports from EU in total imports (%) 4928
IVOL_EXP Export volume index (2015=100) 4466
IVOL_IMP Import volume index (2015=100) 4466
IVU_EXP Export unit value index (2015=100) 4466
IVU_IMP Import unit value index (2015=100) 4466
RT_IVOL Volume Ratio (Export/Import) 4466
RT_IVU Terms of trade (Export/import) 4466

sitc06

Code
ext_lt_intertrd %>%
  left_join(sitc06, by = "sitc06") %>%
  group_by(sitc06, Sitc06) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  print_table_conditional()
sitc06 Sitc06 Nobs
SITC0_1 Food, drinks and tobacco 6974
SITC2_4 Raw materials 6974
SITC3 Mineral fuels, lubricants and related materials 6974
SITC5 Chemicals and related products, n.e.s. 6974
SITC6_8 Other manufactured goods 6974
SITC7 Machinery and transport equipment 6974
TOTAL Total - all products 6974
SITC9 Commodities and transactions not classified elsewhere in the SITC 3146

geo

Code
ext_lt_intertrd %>%
  left_join(geo, by = "geo") %>%
  group_by(geo, Geo) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  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 .}

partner

Code
ext_lt_intertrd %>%
  left_join(partner, by = "partner") %>%
  group_by(partner, Partner) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  mutate(Flag = gsub(" ", "-", str_to_lower(Partner)),
         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
ext_lt_intertrd %>%
  group_by(time) %>%
  summarise(Nobs = n()) %>%
  arrange(desc(time)) %>%
  print_table_conditional()
time Nobs
2023 2362
2022 2362
2021 2362
2020 2362
2019 2362
2018 2362
2017 2362
2016 2362
2015 2362
2014 2362
2013 2362
2012 2362
2011 2362
2010 2362
2009 2362
2008 2362
2007 2362
2006 2362
2005 2362
2004 2362
2003 2362
2002 2362

Share of exports to EU in total exports

EU, Germany, France, Spain, Italy

Code
ext_lt_intertrd %>%
  filter(geo %in% c("DE", "FR", "ES", "IT", "NL"),
         partner == "WORLD",
         # B1GQ: Gross domestic product at market prices
         indic_et == "MIO_EXP_VAL",
         sitc06 == "TOTAL") %>%
  left_join(geo, by = "geo") %>%
  left_join(world_exports, by = "time") %>%
  mutate(Geo = ifelse(geo == "EU27_2020", "Europe", Geo)) %>%
  year_to_date %>%
  left_join(colors, by = c("Geo" = "country")) %>%
  mutate(color = ifelse(geo == "NL", color2, color)) %>%
  mutate(values = values/world_exports) %>%
  ggplot + geom_line(aes(x = date, y = values, color = color)) +
  scale_color_identity() + theme_minimal()  + add_5flags + xlab("") +
  ylab("Part des exportations dans les exportations de la Zone € (%)") +
  scale_x_date(breaks = as.Date(paste0(seq(1960, 2025, 1), "-01-01")),
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = 0.01*seq(0, 100, 1),
                labels = percent_format(acc = 1))

France, Spain, Italy, Belgium, Netherlands

Code
ext_lt_intertrd %>%
  filter(geo %in% c("FR", "ES", "IT", "NL", "BE"),
         partner == "WORLD",
         # B1GQ: Gross domestic product at market prices
         indic_et == "MIO_EXP_VAL",
         sitc06 == "TOTAL") %>%
  left_join(geo, by = "geo") %>%
  left_join(world_exports, by = "time") %>%
  mutate(Geo = ifelse(geo == "EU27_2020", "Europe", Geo)) %>%
  year_to_date %>%
  left_join(colors, by = c("Geo" = "country")) %>%
  mutate(color = ifelse(geo == "NL", color2, color)) %>%
  mutate(values = values/world_exports) %>%
  ggplot + geom_line(aes(x = date, y = values, color = color)) +
  scale_color_identity() + theme_minimal()  + add_5flags + xlab("") +
  ylab("Part des exportations dans les exportations de la Zone € (%)") +
  scale_x_date(breaks = as.Date(paste0(seq(1960, 2025, 1), "-01-01")),
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = 0.01*seq(0, 100, 1),
                labels = percent_format(acc = 1))

Finland, Austria, Portugal, Greece, Ireland

Code
ext_lt_intertrd %>%
  filter(geo %in% c("FI", "AT", "PT", "EL", "IE"),
         partner == "WORLD",
         # B1GQ: Gross domestic product at market prices
         indic_et == "MIO_EXP_VAL",
         sitc06 == "TOTAL") %>%
  left_join(geo, by = "geo") %>%
  left_join(world_exports, by = "time") %>%
  mutate(Geo = ifelse(geo == "EU27_2020", "Europe", Geo)) %>%
  year_to_date %>%
  left_join(colors, by = c("Geo" = "country")) %>%
  mutate(color = ifelse(geo == "NL", color2, color)) %>%
  mutate(values = values/world_exports) %>%
  ggplot + geom_line(aes(x = date, y = values, color = color)) +
  scale_color_identity() + theme_minimal()  + add_5flags + xlab("") +
  ylab("Part des exportations dans les exportations de la Zone € (%)") +
  scale_x_date(breaks = as.Date(paste0(seq(1960, 2025, 1), "-01-01")),
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = 0.01*seq(0, 100, 1),
                labels = percent_format(acc = 1))

Slovakia, Lithuania, Slovenia, Luxembourg

Code
ext_lt_intertrd %>%
  filter(geo %in% c("SK", "LT", "SI", "LU"),
         partner == "WORLD",
         # B1GQ: Gross domestic product at market prices
         indic_et == "MIO_EXP_VAL",
         sitc06 == "TOTAL") %>%
  left_join(geo, by = "geo") %>%
  left_join(world_exports, by = "time") %>%
  mutate(Geo = ifelse(geo == "EU27_2020", "Europe", Geo)) %>%
  year_to_date %>%
  left_join(colors, by = c("Geo" = "country")) %>%
  mutate(color = ifelse(geo == "NL", color2, color)) %>%
  mutate(values = values/world_exports) %>%
  ggplot + geom_line(aes(x = date, y = values, color = color)) +
  scale_color_identity() + theme_minimal()  + add_4flags + xlab("") +
  ylab("Part des exportations dans les exportations de la Zone € (%)") +
  scale_x_date(breaks = as.Date(paste0(seq(1960, 2025, 1), "-01-01")),
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = 0.01*seq(0, 100, .2),
                labels = percent_format(acc = .1))

Latvia, Estonia, Cyprus, Malta

Code
ext_lt_intertrd %>%
  filter(geo %in% c("LV", "EE", "CY", "MT"),
         partner == "WORLD",
         # B1GQ: Gross domestic product at market prices
         indic_et == "MIO_EXP_VAL",
         sitc06 == "TOTAL") %>%
  left_join(geo, by = "geo") %>%
  left_join(world_exports, by = "time") %>%
  mutate(Geo = ifelse(geo == "EU27_2020", "Europe", Geo)) %>%
  year_to_date %>%
  left_join(colors, by = c("Geo" = "country")) %>%
  mutate(color = ifelse(geo == "NL", color2, color)) %>%
  mutate(values = values/world_exports) %>%
  ggplot + geom_line(aes(x = date, y = values, color = color)) +
  scale_color_identity() + theme_minimal()  + add_4flags + xlab("") +
  ylab("Part des exportations dans les exportations de la Zone € (%)") +
  scale_x_date(breaks = as.Date(paste0(seq(1960, 2025, 1), "-01-01")),
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = 0.01*seq(0, 100, .1),
                labels = percent_format(acc = .1))

Share of imports to EU in total imports

EU, Germany, France, Spain, Italy

Code
ext_lt_intertrd %>%
  filter(geo %in% c("DE", "FR", "ES", "IT", "NL"),
         partner == "WORLD",
         # B1GQ: Gross domestic product at market prices
         indic_et == "MIO_IMP_VAL",
         sitc06 == "TOTAL") %>%
  left_join(geo, by = "geo") %>%
  left_join(world_imports, by = "time") %>%
  mutate(Geo = ifelse(geo == "EU27_2020", "Europe", Geo)) %>%
  year_to_date %>%
  left_join(colors, by = c("Geo" = "country")) %>%
  mutate(color = ifelse(geo == "NL", color2, color)) %>%
  mutate(values = values/world_imports) %>%
  ggplot + geom_line(aes(x = date, y = values, color = color)) +
  scale_color_identity() + theme_minimal()  + add_5flags + xlab("") +
  ylab("Part des importations dans les importations de la Zone € (%)") +
  scale_x_date(breaks = as.Date(paste0(seq(1960, 2025, 1), "-01-01")),
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = 0.01*seq(0, 100, 1),
                labels = percent_format(acc = 1))

France, Spain, Italy, Belgium, Netherlands

Code
ext_lt_intertrd %>%
  filter(geo %in% c("FR", "ES", "IT", "NL", "BE"),
         partner == "WORLD",
         # B1GQ: Gross domestic product at market prices
         indic_et == "MIO_IMP_VAL",
         sitc06 == "TOTAL") %>%
  left_join(geo, by = "geo") %>%
  left_join(world_imports, by = "time") %>%
  mutate(Geo = ifelse(geo == "EU27_2020", "Europe", Geo)) %>%
  year_to_date %>%
  left_join(colors, by = c("Geo" = "country")) %>%
  mutate(color = ifelse(geo == "NL", color2, color)) %>%
  mutate(values = values/world_imports) %>%
  ggplot + geom_line(aes(x = date, y = values, color = color)) +
  scale_color_identity() + theme_minimal()  + add_5flags + xlab("") +
  ylab("Part des importations dans les importations de la Zone € (%)") +
  scale_x_date(breaks = as.Date(paste0(seq(1960, 2025, 1), "-01-01")),
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = 0.01*seq(0, 100, 1),
                labels = percent_format(acc = 1))

Finland, Austria, Portugal, Greece, Ireland

Code
ext_lt_intertrd %>%
  filter(geo %in% c("FI", "AT", "PT", "EL", "IE"),
         partner == "WORLD",
         # B1GQ: Gross domestic product at market prices
         indic_et == "MIO_IMP_VAL",
         sitc06 == "TOTAL") %>%
  left_join(geo, by = "geo") %>%
  left_join(world_imports, by = "time") %>%
  mutate(Geo = ifelse(geo == "EU27_2020", "Europe", Geo)) %>%
  year_to_date %>%
  left_join(colors, by = c("Geo" = "country")) %>%
  mutate(color = ifelse(geo == "NL", color2, color)) %>%
  mutate(values = values/world_imports) %>%
  ggplot + geom_line(aes(x = date, y = values, color = color)) +
  scale_color_identity() + theme_minimal()  + add_5flags + xlab("") +
  ylab("Part des importations dans les importations de la Zone € (%)") +
  scale_x_date(breaks = as.Date(paste0(seq(1960, 2025, 1), "-01-01")),
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = 0.01*seq(0, 100, 1),
                labels = percent_format(acc = 1))

Slovakia, Lithuania, Slovenia, Luxembourg

Code
ext_lt_intertrd %>%
  filter(geo %in% c("SK", "LT", "SI", "LU"),
         partner == "WORLD",
         # B1GQ: Gross domestic product at market prices
         indic_et == "MIO_IMP_VAL",
         sitc06 == "TOTAL") %>%
  left_join(geo, by = "geo") %>%
  left_join(world_imports, by = "time") %>%
  mutate(Geo = ifelse(geo == "EU27_2020", "Europe", Geo)) %>%
  year_to_date %>%
  left_join(colors, by = c("Geo" = "country")) %>%
  mutate(color = ifelse(geo == "NL", color2, color)) %>%
  mutate(values = values/world_imports) %>%
  ggplot + geom_line(aes(x = date, y = values, color = color)) +
  scale_color_identity() + theme_minimal()  + add_4flags + xlab("") +
  ylab("Part des importations dans les importations de la Zone € (%)") +
  scale_x_date(breaks = as.Date(paste0(seq(1960, 2025, 1), "-01-01")),
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = 0.01*seq(0, 100, .2),
                labels = percent_format(acc = .1))

Latvia, Estonia, Cyprus, Malta

Code
ext_lt_intertrd %>%
  filter(geo %in% c("LV", "EE", "CY", "MT"),
         partner == "WORLD",
         # B1GQ: Gross domestic product at market prices
         indic_et == "MIO_IMP_VAL",
         sitc06 == "TOTAL") %>%
  left_join(geo, by = "geo") %>%
  left_join(world_imports, by = "time") %>%
  mutate(Geo = ifelse(geo == "EU27_2020", "Europe", Geo)) %>%
  year_to_date %>%
  left_join(colors, by = c("Geo" = "country")) %>%
  mutate(color = ifelse(geo == "NL", color2, color)) %>%
  mutate(values = values/world_imports) %>%
  ggplot + geom_line(aes(x = date, y = values, color = color)) +
  scale_color_identity() + theme_minimal()  + add_4flags + xlab("") +
  ylab("Part des importations dans les importations de la Zone € (%)") +
  scale_x_date(breaks = as.Date(paste0(seq(1960, 2025, 1), "-01-01")),
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = 0.01*seq(0, 100, .1),
                labels = percent_format(acc = .1))

Share of imports to EU in total imports

EU, Germany, France, Spain, Italy

Code
ext_lt_intertrd %>%
  filter(geo %in% c("EU27_2020", "DE", "FR", "ES", "IT", "NL"),
         # B1GQ: Gross domestic product at market prices
         indic_et == "PC_IMP_EU",
         sitc06 == "TOTAL") %>%
  left_join(geo, by = "geo") %>%
  mutate(Geo = ifelse(geo == "EU27_2020", "Europe", Geo)) %>%
  year_to_date %>%
  left_join(colors, by = c("Geo" = "country")) %>%
  mutate(values = values/100) %>%
  ggplot + geom_line(aes(x = date, y = values, color = color)) +
  scale_color_identity() + theme_minimal()  + add_6flags + xlab("") +
  ylab("Share of imports from EU in total imports (%)") +
  scale_x_date(breaks = as.Date(paste0(seq(1960, 2025, 5), "-01-01")),
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = 0.01*seq(0, 100, 1),
                labels = percent_format(acc = 1))