Strictness of employment protection – temporary contracts

Data - OECD

Info

source dataset .html .RData
oecd EPL_T 2024-04-16 2023-12-10

LAST_DOWNLOAD

Code
tibble(LAST_DOWNLOAD = as.Date(file.info("~/iCloud/website/data/oecd/EPL_T.RData")$mtime)) %>%
  print_table_conditional()
LAST_DOWNLOAD
2023-12-10

LAST_COMPILE

LAST_COMPILE
2024-11-12

Last

obsTime Nobs
2019 124

SERIES

Code
EPL_T %>%
  left_join(EPL_T_var$SERIES, by = "SERIES") %>%
  group_by(SERIES, Series) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  {if (is_html_output()) print_table(.) else .}
SERIES Series Nobs
EPT_V1 Version 1 (1985-2019) 1120
EPT_V3 Version 3 (2008-2019) 522
EPT_V4 Version 4 (2013-2019) 263

COUNTRY

Code
EPL_T %>%
  left_join(EPL_T_var$COUNTRY, by = "COUNTRY") %>%
  group_by(COUNTRY, Country) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  mutate(Flag = gsub(" ", "-", str_to_lower(gsub(" ", "-", 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, Italy

English

Code
EPL_T %>%
  filter(SERIES == "EPT_V1",
         COUNTRY %in% c("FRA", "ITA", "DEU")) %>%
  left_join(EPL_T_var$COUNTRY, by = "COUNTRY") %>%
  year_to_date %>%
  left_join(colors, by = c("Country" = "country")) %>%
  rename(Location = Country) %>%
  ggplot(.) + geom_line(aes(x = date, y = obsValue, color = color)) + 
  scale_color_identity() + add_3flags + theme_minimal() +
  xlab("") + ylab("Strictness of employment protection") +
  scale_x_date(breaks = seq(1920, 2100, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = seq(0, 6, 1),
                     limits = c(0, 6))

French

Code
EPL_T %>%
  filter(SERIES == "EPT_V1",
         COUNTRY %in% c("FRA", "ITA", "DEU")) %>%
  left_join(EPL_T_var$COUNTRY, by = "COUNTRY") %>%
  year_to_date %>%
  left_join(colors, by = c("Country" = "country")) %>%
  rename(Location = Country) %>%
  ggplot(.) + geom_line(aes(x = date, y = obsValue, color = color)) + 
  scale_color_identity() + add_3flags + theme_minimal() +
  xlab("") + ylab("Indice de protection de l'emploi") +
  scale_x_date(breaks = seq(1920, 2100, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = seq(0, 6, 1),
                     limits = c(0, 6))

Australia, United Kingdom, United States

English

Code
EPL_T %>%
  filter(SERIES == "EPT_V1",
         COUNTRY %in% c("AUS", "GBR", "USA")) %>%
  left_join(EPL_T_var$COUNTRY, by = "COUNTRY") %>%
  year_to_date %>%
  left_join(colors, by = c("Country" = "country")) %>%
  rename(Location = Country) %>%
  ggplot(.) + geom_line(aes(x = date, y = obsValue, color = color)) + 
  scale_color_identity() + add_3flags + theme_minimal() +
  xlab("") + ylab("Strictness of employment protection") +
  scale_x_date(breaks = seq(1920, 2100, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = seq(0, 5, 0.2),
                     limits = c(0, 1.6))

French

Code
EPL_T %>%
  filter(SERIES == "EPT_V1",
         COUNTRY %in% c("AUS", "GBR", "USA")) %>%
  left_join(EPL_T_var$COUNTRY, by = "COUNTRY") %>%
  year_to_date %>%
  left_join(colors, by = c("Country" = "country")) %>%
  rename(Location = Country) %>%
  ggplot(.) + geom_line(aes(x = date, y = obsValue, color = color)) + 
  scale_color_identity() + add_3flags + theme_minimal() +
  xlab("") + ylab("Indice de protection de l'emploi") +
  scale_x_date(breaks = seq(1920, 2100, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = seq(0, 5, 0.2),
                     limits = c(0, 1.6))

Australia, United Kingdom, United States, France, Germany, Italy, Spain

English

Code
EPL_T %>%
  filter(SERIES == "EPT_V1",
         COUNTRY %in% c("AUS", "GBR", "USA", "FRA", "ITA", "DEU", "ESP")) %>%
  left_join(EPL_T_var$COUNTRY, by = "COUNTRY") %>%
  year_to_date %>%
  left_join(colors, by = c("Country" = "country")) %>%
  rename(Location = Country) %>%
  ggplot(.) + geom_line(aes(x = date, y = obsValue, color = color)) + 
  scale_color_identity() + add_7flags + theme_minimal() +
  xlab("") + ylab("Strictness of employment protection") +
  scale_x_date(breaks = seq(1920, 2100, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = seq(0, 7, 0.5))

French

Code
EPL_T %>%
  filter(SERIES == "EPT_V1",
         COUNTRY %in% c("AUS", "GBR", "USA", "FRA", "ITA", "DEU", "ESP")) %>%
  left_join(EPL_T_var$COUNTRY, by = "COUNTRY") %>%
  year_to_date %>%
  left_join(colors, by = c("Country" = "country")) %>%
  rename(Location = Country) %>%
  ggplot(.) + geom_line(aes(x = date, y = obsValue, color = color)) + 
  scale_color_identity() + add_7flags + theme_minimal() +
  xlab("") + ylab("Indice de protection de l'emploi") +
  scale_x_date(breaks = seq(1920, 2100, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = seq(0, 7, 0.5))