Share of European Union EU27 (from 2020) in the World Trade - ext_lt_introeu27_2020

Data - Eurostat

Info

LAST_DOWNLOAD

Code
tibble(dataset = c("ext_lt_introeu27_2020", "ext_lt_intertrd", "ext_lt_intratrd")) %>%
  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_introeu27_2020 2024-10-08 [html]
ext_lt_intertrd 2024-10-08 [html]
ext_lt_intratrd 2024-10-08 [html]

LAST_COMPILE

LAST_COMPILE
2024-11-05

Last

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

indic_et

Code
ext_lt_introeu27_2020 %>%
  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 2088
MIO_EXP_VAL Exports in million of ECU/EURO 2088
MIO_IMP_VAL Imports in million of ECU/EURO 2088
PC_EXP_WRL Share of national exports in world exports (%) 2088
PC_IMP_WRL Share of national imports in world imports (%) 2088
RT_EXP_IMP Export/Import ratio 2088

sitc06

Code
ext_lt_introeu27_2020 %>%
  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 1566
SITC2_4 Raw materials 1566
SITC3 Mineral fuels, lubricants and related materials 1566
SITC5 Chemicals and related products, n.e.s. 1566
SITC6_8 Other manufactured goods 1566
SITC7 Machinery and transport equipment 1566
SITC9 Commodities and transactions not classified elsewhere in the SITC 1566
TOTAL Total - all products 1566

geo

Code
ext_lt_introeu27_2020 %>%
  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 .}

time

Code
ext_lt_introeu27_2020 %>%
  group_by(time) %>%
  summarise(Nobs = n()) %>%
  arrange(desc(time)) %>%
  print_table_conditional()
time Nobs
2023 480
2022 528
2021 576
2020 576
2019 576
2018 576
2017 576
2016 576
2015 576
2014 576
2013 576
2012 576
2011 576
2010 576
2009 576
2008 576
2007 576
2006 576
2005 576
2004 576
2003 576
2002 576

Exports

Code
ext_lt_introeu27_2020 %>%
  filter(geo %in% c("EU27_2020", "CN_X_HK", "US"),
         # B1GQ: Gross domestic product at market prices
         indic_et == "PC_EXP_WRL",
         sitc06 == "TOTAL") %>%
  left_join(geo, by = "geo") %>%
  mutate(Geo = ifelse(geo == "CN_X_HK", "China", 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_3flags + xlab("") + ylab("% of World Exports") +
  scale_x_date(breaks = as.Date(paste0(seq(1960, 2020, 2), "-01-01")),
               labels = date_format("%Y")) +
  theme(legend.position = c(0.3, 0.85),
        legend.title = element_blank()) +
  scale_y_continuous(breaks = 0.01*seq(0, 100, 1),
                labels = percent_format(acc = 1))