Country level - volume (in TEUs) of containers handled in main ports, by loading status - mar_mg_am_cvh

Data - Eurostat

Info

LAST_DOWNLOAD

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

LAST_COMPILE

LAST_COMPILE
2024-06-24

Last

Code
mar_mg_am_cvh %>%
  group_by(time) %>%
  summarise(Nobs = n()) %>%
  arrange(desc(time)) %>%
  head(1) %>%
  print_table_conditional()
time Nobs
2022 102

loadstat

Code
mar_mg_am_cvh %>%
  left_join(loadstat, by = "loadstat") %>%
  group_by(loadstat, Loadstat) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  print_table_conditional()
loadstat Loadstat Nobs
TOTAL Total loaded and empty 1267
EMPTY Empty 1257

unit

Code
load_data("eurostat/unit_fr.RData")
mar_mg_am_cvh %>%
  left_join(unit, by = "unit") %>%
  group_by(unit, Unit) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  {if (is_html_output()) print_table(.) else .}
unit Unit Nobs
THS_TEU Mille équivalent vingt pieds (EVP) 1295
RT_PRE Taux de croissance par rapport à la période précédente (t/t-1) 1229

rep_mar

Code
mar_mg_am_cvh %>%
  left_join(rep_mar, by = "rep_mar") %>%
  group_by(rep_mar, Rep_mar) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  mutate(Flag = gsub(" ", "-", str_to_lower(gsub(" ", "-", Rep_mar))),
         Flag = paste0('<img src="../../icon/flag/vsmall/', Flag, '.png" alt="Flag">')) %>%
  select(Flag, everything()) %>%
  {if (is_html_output()) datatable(., filter = 'top', rownames = F, escape = F) else .}

time

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

Conteneurs

Table

Code
mar_mg_am_cvh %>%
  filter(unit == "THS_TEU",
         time == "2019") %>%
  select( -unit, -time) %>%
  left_join(rep_mar, by = "rep_mar") %>%
  left_join(loadstat, by = "loadstat") %>%
  select(-loadstat) %>%
  spread(Loadstat, values) %>%
  arrange(`Total loaded and empty`) %>%
  mutate(Flag = gsub(" ", "-", str_to_lower(gsub(" ", "-", Rep_mar))),
         Flag = paste0('<img src="../../icon/flag/vsmall/', Flag, '.png" alt="Flag">')) %>%
  select(Flag, everything()) %>%
  {if (is_html_output()) datatable(., filter = 'top', rownames = F, escape = F) else .}

Pleins + Vides

Linear

Code
mar_mg_am_cvh %>%
  filter(loadstat == "TOTAL",
         unit == "THS_TEU",
         rep_mar %in% c("NL", "FR", "IT", "DE", "ES", "UK", "BE", "EL")) %>%
  select(-loadstat, -unit) %>%
  left_join(rep_mar, by = "rep_mar") %>%
  year_to_date %>%
  left_join(colors, by = c("Rep_mar" = "country")) %>%
  rename(Geo = Rep_mar) %>%
  mutate(values = values / 10^3) %>%
  ggplot + geom_line(aes(x = date, y = values, color = color)) +
  scale_color_identity() + theme_minimal() + xlab("") + ylab("Mille équivalent vingt pieds (EVP)") + add_8flags +
  scale_x_date(breaks = seq(1940, 2020, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = seq(0, 20, 2))

Base-100

Code
mar_mg_am_cvh %>%
  filter(loadstat == "TOTAL",
         unit == "THS_TEU",
         rep_mar %in% c("NL", "FR", "IT", "DE", "ES", "UK", "BE", "EL")) %>%
  select(-loadstat, -unit) %>%
  left_join(rep_mar, by = "rep_mar") %>%
  year_to_date %>%
  filter(date >= as.Date("2000-01-01")) %>%
  left_join(colors, by = c("Rep_mar" = "country")) %>%
  rename(Geo = Rep_mar) %>%
  group_by(Geo) %>%
  arrange(date) %>%
  mutate(values = 100*values / values[1]) %>%
  ggplot + geom_line(aes(x = date, y = values, color = color)) +
  scale_color_identity() + theme_minimal() + xlab("") + ylab("Mille équivalent vingt pieds (EVP)") + add_8flags +
  scale_x_date(breaks = seq(1940, 2020, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(50,1000, 50))

Log

Code
mar_mg_am_cvh %>%
  filter(loadstat == "TOTAL",
         unit == "THS_TEU",
         rep_mar %in% c("NL", "FR", "IT", "DE", "ES", "UK", "BE", "EL")) %>%
  select(-loadstat, -unit) %>%
  left_join(rep_mar, by = "rep_mar") %>%
  year_to_date %>%
  left_join(colors, by = c("Rep_mar" = "country")) %>%
  rename(Geo = Rep_mar) %>%
  mutate(values = values / 10^3) %>%
  ggplot + geom_line(aes(x = date, y = values, color = color)) +
  scale_color_identity() + theme_minimal() + xlab("") + ylab("") + add_8flags +
  scale_x_date(breaks = seq(1940, 2020, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%y")) +
  scale_y_log10(breaks = seq(0, 20, 2))

Vides

Code
mar_mg_am_cvh %>%
  filter(loadstat == "EMPTY",
         unit == "THS_TEU",
         rep_mar %in% c("NL", "FR", "IT", "DE", "ES", "UK", "BE", "EL")) %>%
  select(-loadstat, -unit) %>%
  left_join(rep_mar, by = "rep_mar") %>%
  year_to_date %>%
  left_join(colors, by = c("Rep_mar" = "country")) %>%
  rename(Geo = Rep_mar) %>%
  mutate(values = values / 10^3) %>%
  ggplot + geom_line(aes(x = date, y = values, color = color)) +
  scale_color_identity() + theme_minimal() + xlab("") + ylab("") + add_8flags +
  scale_x_date(breaks = seq(1940, 2020, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%y")) +
  scale_y_continuous(breaks = seq(0, 20, 1))