Nominal unit labour costs, total economy :- Performance relative to the rest of 37 industrial countries - PLCDQ

Data - AMECO

geo, Country

Code
PLCDQ %>%
  left_join(COU, by = "COU") %>%
  group_by(COUNTRY) %>%
  summarise(Nobs = n()) %>%
  mutate(Flag = gsub(" ", "-", str_to_lower(COUNTRY)),
         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 .}

France, Germany

All

Code
PLCDQ %>%
  left_join(COU, by = "COU") %>%
  filter(COU %in% c("FRA", "DEU"),
         vintage == 2021,
         CODE_4 == "30",
         CODE_5 == "437") %>%
  na.omit %>%
  ggplot() + ylab("Nominal unit labour costs (total economy)") + xlab("") + theme_minimal() +
  geom_line(aes(x = date, y = value, color = COUNTRY)) +
  geom_image(data = . %>%
               filter(date == as.Date("2013-01-01")) %>%
               mutate(image = paste0("../../icon/flag/", str_to_lower(gsub(" ", "-", COUNTRY)), ".png")),
             aes(x = date, y = value, image = image), asp = 1.5) +
  scale_color_manual(values = c("#002395", "#000000")) +
  scale_x_date(breaks = seq(1920, 2025, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%y")) +
  theme(legend.position = c(0.8, 0.9),
        legend.title = element_blank()) +
  scale_y_continuous(breaks = seq(-60, 300, 5))

1995-

Code
PLCDQ %>%
  left_join(COU, by = "COU") %>%
  filter(COU %in% c("FRA", "DEU"),
         vintage == 2021,
         CODE_4 == "30",
         CODE_5 == "437") %>%
  arrange(COUNTRY, date) %>%
  filter(date >= as.Date("1995-01-01")) %>%
  group_by(COUNTRY) %>%
  mutate(value = 100*value / value[date == as.Date("1995-01-01")]) %>%
  ggplot() + ylab("Nominal unit labour costs (total economy)") + xlab("") + theme_minimal() +
  geom_line(aes(x = date, y = value, color = COUNTRY)) +
  geom_image(data = . %>%
               filter(date == as.Date("2013-01-01")) %>%
               mutate(image = paste0("../../icon/flag/", str_to_lower(gsub(" ", "-", COUNTRY)), ".png")),
             aes(x = date, y = value, image = image), asp = 1.5) +
  scale_color_manual(values = c("#002395", "#000000")) +
  scale_x_date(breaks = seq(1920, 2025, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%y")) +
  geom_vline(xintercept = as.Date("2011-01-01"),
             linetype= "dashed") +
  theme(legend.position = c(0.1, 0.1),
        legend.title = element_blank()) +
  scale_y_continuous(breaks = seq(-60, 300, 5))

France, Germany, Spain, Italy

All

Code
PLCDQ %>%
  left_join(COU, by = "COU") %>%
  filter(COU %in% c("FRA", "DEU", "ESP", "ITA"),
         vintage == 2021,
         CODE_4 == "30",
         CODE_5 == "437") %>%
  arrange(COUNTRY, date) %>%
  ggplot() + ylab("Nominal unit labour costs (total economy)") + xlab("") + theme_minimal() +
  geom_line(aes(x = date, y = value, color = COUNTRY)) +
  geom_image(data = . %>%
               filter(date == as.Date("2000-01-01")) %>%
               mutate(image = paste0("../../icon/flag/", str_to_lower(gsub(" ", "-", COUNTRY)), ".png")),
             aes(x = date, y = value, image = image), asp = 1.5) +
  scale_color_manual(values = c("#002395", "#000000", "#009246", "#C60B1E")) +
  scale_x_date(breaks = seq(1920, 2025, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%y")) +
  theme(legend.position = c(0.2, 0.8),
        legend.title = element_blank()) +
  scale_y_continuous(breaks = seq(-60, 300, 5))

1999-

Code
PLCDQ %>%
  left_join(COU, by = "COU") %>%
  filter(COU %in% c("FRA", "DEU", "ESP", "ITA"),
         vintage == 2021,
         CODE_4 == "30",
         CODE_5 == "437") %>%
  arrange(COUNTRY, date) %>%
  filter(date >= as.Date("2000-01-01")) %>%
  group_by(COUNTRY) %>%
  mutate(value = 100*value/value[1]) %>%
  ggplot() + ylab("Nominal unit labour costs (total economy)") + xlab("") + theme_minimal() +
  geom_line(aes(x = date, y = value, color = COUNTRY)) +
  geom_image(data = . %>%
               filter(date == as.Date("2014-01-01")) %>%
               mutate(image = paste0("../../icon/flag/", str_to_lower(gsub(" ", "-", COUNTRY)), ".png")),
             aes(x = date, y = value, image = image), asp = 1.5) +
  scale_color_manual(values = c("#002395", "#000000", "#009246", "#C60B1E")) +
  scale_x_date(breaks = seq(1920, 2025, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%y")) +
  theme(legend.position = c(0.1, 0.8),
        legend.title = element_blank()) +
  scale_y_continuous(breaks = seq(-60, 300, 5))