Member States EU27 (from 2020) trade by BEC product group since 1999 - ext_st_27_2020msbec

Data - Eurostat

Info

Examples

  • March 2022. Euro area international trade in goods deficit €16.4 bn. pdf

LAST_DOWNLOAD

Code
tibble(LAST_DOWNLOAD = as.Date(file.info("~/Library/Mobile\ Documents/com~apple~CloudDocs/website/data/eurostat/ext_st_27_2020msbec.RData")$mtime)) %>%
  print_table_conditional()
LAST_DOWNLOAD
2024-10-09

LAST_COMPILE

LAST_COMPILE
2024-11-05

Last

Code
ext_st_27_2020msbec %>%
  group_by(time) %>%
  summarise(Nobs = n()) %>%
  arrange(desc(time)) %>%
  head(1) %>%
  print_table_conditional()
time Nobs
2024M07 4470

stk_flow

Code
ext_st_27_2020msbec %>%
  left_join(stk_flow, by = "stk_flow") %>%
  group_by(stk_flow, Stk_flow) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  print_table_conditional()
stk_flow Stk_flow Nobs
IMP Imports 2580269
EXP Exports 2579976
BAL_RT Balance for values / Ratio for indices 1206930

indic_et

Code
ext_st_27_2020msbec %>%
  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
TRD_VAL Trade value in million ECU/EURO 741195
TRD_VAL_SCA Seasonally and calendar adjusted trade value in million ECU/EURO 741195
IVOL_NSA Volume indices - unadjusted data (2015=100) 712800
IVOL_SCA Seasonally and calendar adjusted volume indices (2015=100) 712800
IVU Unit value index (2015=100) 712800
TRD_VAL_SCA_RT1 Growth rate M/M-1 of the seasonally and calendar adjusted trade value 492503
TRD_VAL_RT12 Growth rate M/M-12 of the trade value 474690
IVU_RT1 Growth rate M/M-1 of the unit-value indices 453708
IVOL_SCA_RT1 Growth rate M/M-1 of the seasonally and calendar adjusted volume Indices 453701
IVU_RT12 Growth rate M/M-12 of the unit-value indices 435896
IVOL_NSA_RT12 Growth rate M/M-12 of the volume Indices - unadjusted data 435887

bclas_bec

Code
ext_st_27_2020msbec %>%
  left_join(bclas_bec, by = "bclas_bec") %>%
  group_by(bclas_bec, Bclas_bec) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  print_table_conditional()
bclas_bec Bclas_bec Nobs
TOTAL Total 1274334
CONS Consumption goods 1273281
CONS_TRA Consumption goods, motor spirit and passenger motor cars 1273281
INT Intermediate goods 1273272
CAP Capital goods 1273007

geo

Code
ext_st_27_2020msbec %>%
  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_st_27_2020msbec %>%
  left_join(partner, by = "partner") %>%
  group_by(partner, Partner) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  print_table_conditional()
partner Partner Nobs
EU27_2020 European Union - 27 countries (from 2020) 1073760
WORLD All countries of the world 1073760
EXT_EU27_2020 Extra-EU27 (from 2020) 1073751
EA20 Euro area – 20 countries (from 2023) 1048730
EXT_EA20 Extra-euro area - 20 countries (from 2023) 1048727
EU27_2020_NEA20 EU27 countries (from 2020) not in EA20 (from 2023) - 7 countries 1048447

time

Code
ext_st_27_2020msbec %>%
  group_by(time) %>%
  summarise(Nobs = n()) %>%
  arrange(desc(time)) %>%
  print_table_conditional()

Share of EU

Code
ext_st_27_2020msbec %>%
  filter(stk_flow == "EXP",
         indic_et == "TRD_VAL",
         partner == "WORLD",
         bclas_bec == "TOTAL",
         geo %in% c("FR", "DE", "IT")) %>%
  month_to_date() %>%
  left_join(geo, by = "geo") %>%
  left_join(colors, by = c("Geo" = "country")) %>%
  ggplot + geom_line(aes(x = date, y = values, color = color)) + 
  theme_minimal() + scale_color_identity() + add_flags(3) + 
  scale_y_log10(breaks = 10000*c(1, 2, 3, 5, 8, 10, 20)) + xlab("") + ylab("")

Balance

All

Code
ext_st_27_2020msbec %>%
  filter(stk_flow == "BAL_RT",
         indic_et == "TRD_VAL",
         partner == "WORLD",
         bclas_bec == "TOTAL",
         geo %in% c("FR", "DE", "IT")) %>%
  month_to_date() %>%
  left_join(geo, by = "geo") %>%
  left_join(colors, by = c("Geo" = "country")) %>%
  ggplot + geom_line(aes(x = date, y = values, color = color)) + 
  theme_minimal() + scale_color_identity() + add_flags(3) + 
  scale_y_continuous(breaks = 1000*seq(-20, 60, 5)) + xlab("") + ylab("")

2015-

Code
ext_st_27_2020msbec %>%
  filter(stk_flow == "BAL_RT",
         indic_et == "TRD_VAL",
         partner == "WORLD",
         bclas_bec == "TOTAL",
         geo %in% c("FR", "DE", "IT")) %>%
  month_to_date() %>%
  filter(date >= ymd("2015-01-01")) %>%
  left_join(geo, by = "geo") %>%
  left_join(colors, by = c("Geo" = "country")) %>%
  ggplot + geom_line(aes(x = date, y = values, color = color)) + 
  theme_minimal() + scale_color_identity() + add_flags(3) + 
  scale_y_continuous(breaks = 1000*seq(-20, 60, 5)) + xlab("") + ylab("") +
  scale_x_date(breaks = "1 year",
               labels = date_format("%Y"))

2019-

Code
ext_st_27_2020msbec %>%
  filter(stk_flow == "BAL_RT",
         indic_et == "TRD_VAL",
         partner == "WORLD",
         bclas_bec == "TOTAL",
         geo %in% c("FR", "DE", "IT")) %>%
  month_to_date() %>%
  filter(date >= ymd("2019-01-01")) %>%
  left_join(geo, by = "geo") %>%
  left_join(colors, by = c("Geo" = "country")) %>%
  ggplot + geom_line(aes(x = date, y = values, color = color)) + 
  theme_minimal() + scale_color_identity() + add_flags(3) + 
  scale_y_continuous(breaks = 1000*seq(-20, 60, 5)) + xlab("") + ylab("") +
  scale_x_date(breaks = "6 months",
               labels = date_format("%b %Y"))