source | dataset | .html | .RData |
---|---|---|---|
oecd | EPL_OV | 2024-04-15 | 2023-12-10 |
source | dataset | .html | .RData |
---|---|---|---|
bls | jt | 2024-03-20 | NA |
bls | la | 2024-01-06 | NA |
bls | ln | 2024-01-06 | NA |
eurostat | nama_10_a10_e | 2024-04-15 | 2024-04-09 |
eurostat | nama_10_a64_e | 2024-04-15 | 2024-04-15 |
eurostat | namq_10_a10_e | 2024-04-15 | 2024-04-15 |
eurostat | une_rt_m | 2024-04-15 | 2024-04-09 |
oecd | ALFS_EMP | 2024-04-16 | 2024-01-26 |
oecd | EPL_T | 2024-04-15 | 2023-12-10 |
oecd | LFS_SEXAGE_I_R | 2024-04-15 | 2024-04-15 |
oecd | STLABOUR | 2024-04-15 | 2024-04-15 |
tibble(LAST_DOWNLOAD = as.Date(file.info("~/Dropbox/website/data/oecd/EPL_OV.RData")$mtime)) %>%
print_table_conditional()
LAST_DOWNLOAD |
---|
2023-12-10 |
LAST_COMPILE |
---|
2024-04-16 |
obsTime | Nobs |
---|---|
2019 | 172 |
EPL_OV %>%
left_join(EPL_OV_var$SERIES, by = "SERIES") %>%
group_by(SERIES, Series) %>%
summarise(Nobs = n()) %>%
arrange(-Nobs) %>%
{if (is_html_output()) print_table(.) else .}
SERIES | Series | Nobs |
---|---|---|
EPRC_V1 | Version 1 (1985-2019) | 1129 |
EPRC_V2 | Version 2 (1998-2019) | 806 |
EPRC_V3 | Version 3 (2008-2019) | 526 |
EPRC_V4 | Version 4 (2013-2019) | 293 |
EPL_OV %>%
left_join(EPL_OV_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 .}
EPL_OV %>%
filter(SERIES == "EPRC_V1",
COUNTRY %in% c("FRA", "ITA", "DEU")) %>%
left_join(EPL_OV_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))
EPL_OV %>%
filter(SERIES == "EPRC_V1",
COUNTRY %in% c("AUS", "GBR", "USA")) %>%
left_join(EPL_OV_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))
EPL_OV %>%
filter(SERIES == "EPRC_V1",
COUNTRY %in% c("AUS", "GBR", "USA", "FRA", "ITA", "DEU", "ESP")) %>%
left_join(EPL_OV_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, 5, 0.2))