Employment by Sex and by Age - GENDER_EMP

Data - OECD

Nobs - Javascript

Code
GENDER_EMP %>%
  left_join(GENDER_EMP_var$IND %>% 
              setNames(c("IND", "Ind")), by = "IND") %>%
  group_by(IND, Ind, SEX, AGE) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  {if (is_html_output()) datatable(., filter = 'top', rownames = F) else .}

IND

Code
GENDER_EMP %>%
  left_join(GENDER_EMP_var$IND %>% 
              setNames(c("IND", "Ind")), by = "IND") %>%
  group_by(IND, Ind) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  {if (is_html_output()) datatable(., filter = 'top', rownames = F) else .}

SEX

Code
GENDER_EMP %>%
  left_join(GENDER_EMP_var$SEX %>% 
              setNames(c("SEX", "Sex")), by = "SEX") %>%
  group_by(SEX, Sex) %>%
  summarise(Nobs = n()) %>%
  {if (is_html_output()) print_table(.) else .}
SEX Sex Nobs
ALL_PERSONS All persons 65353
MEN Men 68292
WOMEN Women 74189

AGE

Code
GENDER_EMP %>%
  left_join(GENDER_EMP_var$AGE %>% 
              setNames(c("AGE", "Age")), by = "AGE") %>%
  group_by(AGE, Age) %>%
  summarise(Nobs = n()) %>%
  {if (is_html_output()) print_table(.) else .}
AGE Age Nobs
1524 15-24 36156
1564 15-64 30444
15PLUS 15+ 9518
2554 25-54 36078
3-5 3-5 444
5564 55-64 36000
55PLUS 55+ 2160
TOTAL Total 57034

COU

Code
GENDER_EMP %>%
  left_join(GENDER_EMP_var$COU %>% 
              setNames(c("COU", "Cou")), by = "COU") %>%
  group_by(COU, Cou) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  {if (is_html_output()) datatable(., filter = 'top', rownames = F) else .}

Italy, Germany, Greece, Spain, Portugal, France

Employment / Population Level

Code
GENDER_EMP %>%
  filter(IND == "EMP2", 
         SEX == "ALL_PERSONS",
         AGE == "1564",
         COU %in% c("ITA", "DEU", "GRC", "ESP", "PRT", "FRA")) %>%
  arrange(COU, TIME) %>%
  rename(obsTime = TIME) %>%
  year_to_date %>%
  filter(date >= as.Date("2000-01-01")) %>%
  left_join(GENDER_EMP_var$COU %>% 
              setNames(c("COU", "Cou")), by = "COU") %>%
  group_by(COU) %>%
  arrange(date) %>%
  ggplot(.) + geom_line(aes(x = date, y = obsValue/100, color = Cou, linetype = Cou)) + 
  scale_color_manual(values = viridis(7)[1:6]) +
  theme_minimal() + xlab("") + ylab("") +
  scale_x_date(breaks = seq(1960, 2020, 1) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%y")) +
  theme(legend.position = c(0.25, 0.9),
        legend.title = element_blank(),
        legend.direction = "horizontal") +
  scale_y_continuous(breaks = 0.01*seq(0, 200, 5),
                     labels = scales::percent_format(accuracy = 1))

Employment / Population Index

Code
GENDER_EMP %>%
  filter(IND == "EMP2", 
         SEX == "ALL_PERSONS",
         AGE == "1564",
         COU %in% c("ITA", "DEU", "GRC", "ESP", "PRT", "FRA")) %>%
  arrange(COU, TIME) %>%
  rename(obsTime = TIME) %>%
  year_to_date %>%
  filter(date >= as.Date("2000-01-01")) %>%
  left_join(GENDER_EMP_var$COU %>% 
              setNames(c("COU", "Cou")), by = "COU") %>%
  group_by(COU) %>%
  arrange(date) %>%
  mutate(obsValue = 100 * obsValue / obsValue[date == as.Date("2007-01-01")]) %>%
  ggplot(.) + geom_line(aes(x = date, y = obsValue, color = Cou, linetype = Cou)) + 
  scale_color_manual(values = viridis(7)[1:6]) +
  theme_minimal() + xlab("") + ylab("") +
  scale_x_date(breaks = seq(1960, 2020, 1) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%y")) +
  theme(legend.position = c(0.25, 0.9),
        legend.title = element_blank(),
        legend.direction = "horizontal") +
  scale_y_log10(breaks = seq(70, 200, 5))

Unemployment Rate

Code
GENDER_EMP %>%
  filter(IND == "EMP3", 
         SEX == "ALL_PERSONS",
         AGE == "1564",
         COU %in% c("ITA", "DEU", "GRC", "ESP", "PRT", "FRA")) %>%
  arrange(COU, TIME) %>%
  rename(obsTime = TIME) %>%
  year_to_date %>%
  filter(date >= as.Date("2000-01-01")) %>%
  left_join(GENDER_EMP_var$COU %>% 
              setNames(c("COU", "Cou")), by = "COU") %>%
  group_by(COU) %>%
  arrange(date) %>%
  ggplot(.) + geom_line(aes(x = date, y = obsValue/100, color = Cou, linetype = Cou)) + 
  scale_color_manual(values = viridis(7)[1:6]) +
  theme_minimal() + xlab("") + ylab("") +
  scale_x_date(breaks = seq(1960, 2020, 1) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%y")) +
  theme(legend.position = c(0.25, 0.9),
        legend.title = element_blank(),
        legend.direction = "horizontal") +
  scale_y_continuous(breaks = 0.01*seq(0, 200, 2),
                     labels = scales::percent_format(accuracy = 1))

Unemployment Rate

Code
GENDER_EMP %>%
  filter(IND == "EMP3", 
         SEX == "ALL_PERSONS",
         AGE == "1524",
         COU %in% c("ITA", "GRC", "ESP", "PRT", "USA")) %>%
  arrange(COU, TIME) %>%
  rename(obsTime = TIME) %>%
  year_to_enddate %>%
  left_join(GENDER_EMP_var$COU %>% 
              setNames(c("COU", "Cou")), by = "COU") %>%
  group_by(COU) %>%
  arrange(date) %>%
  ggplot(.) + geom_line(aes(x = date, y = obsValue/100, color = Cou, linetype = Cou)) + 
  scale_color_manual(values = viridis(6)[1:5]) +
  theme_minimal() + xlab("") + ylab("") +
  scale_x_date(breaks = seq(1960, 2020, 1) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%y")) +
  theme(legend.position = c(0.25, 0.9),
        legend.title = element_blank(),
        legend.direction = "horizontal") +
  scale_y_continuous(breaks = 0.01*seq(0, 200, 5),
                     labels = scales::percent_format(accuracy = 1))

Germany

Part Time Work in Germany

Code
GENDER_EMP %>%
  filter(COU == "DEU", 
         IND == "EMP5", 
         SEX == "ALL_PERSONS") %>%
  left_join(GENDER_EMP_var$AGE %>% 
              setNames(c("AGE", "Age")), by = "AGE") %>%
  mutate(date = paste0(TIME, "-01-01") %>% as.Date) %>%
  ggplot() + theme_minimal() +
  geom_line(aes(x = date, y = obsValue/100, color = Age, linetype = Age)) +
  scale_color_manual(values = viridis(5)[1:4]) +
  scale_x_date(breaks = seq(1920, 2025, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%y")) +
  theme(legend.position = c(0.85, 0.2),
        legend.title = element_blank()) +
  scale_y_continuous(breaks = 0.01*seq(-7, 90, 2),
                     labels = percent_format(accuracy = 1)) +
  ylab("Share of Part-Time Employment") + xlab("")

Share of Involuntary Part Time Work in Germany

All Persons

Code
GENDER_EMP %>%
  filter(COU == "DEU", 
         IND == "EMP6", 
         SEX == "ALL_PERSONS") %>%
  left_join(GENDER_EMP_var$AGE %>% 
              setNames(c("AGE", "Age")), by = "AGE") %>%
  mutate(date = paste0(TIME, "-01-01") %>% as.Date) %>%
  mutate(obsValue = obsValue/100) %>%
  ggplot() + 
  geom_line(aes(x = date, y = obsValue, color = Age, linetype = Age)) +
  scale_color_manual(values = viridis(6)[1:5]) +
  theme_minimal() +
  scale_x_date(breaks = seq(1920, 2025, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%y")) +
  theme(legend.position = c(0.15, 0.8),
        legend.title = element_blank()) +
  scale_y_continuous(breaks = 0.01*seq(-7, 90, 1),
                     labels = percent_format(accuracy = 1)) +
  ylab("Share of Involuntary Part-Time Employment") + xlab("")

Men

Code
GENDER_EMP %>%
  filter(COU == "DEU", 
         IND == "EMP6", 
         SEX == "MEN") %>%
  left_join(GENDER_EMP_var$AGE %>% 
              setNames(c("AGE", "Age")), by = "AGE") %>%
  mutate(date = paste0(TIME, "-01-01") %>% as.Date) %>%
  mutate(obsValue = obsValue/100) %>%
  ggplot() + 
  geom_line(aes(x = date, y = obsValue, color = Age, linetype = Age)) +
  scale_color_manual(values = viridis(6)[1:5]) +
  theme_minimal() +
  scale_x_date(breaks = seq(1920, 2025, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%y")) +
  theme(legend.position = c(0.15, 0.8),
        legend.title = element_blank()) +
  scale_y_continuous(breaks = 0.01*seq(-7, 90, 1),
                     labels = percent_format(accuracy = 1)) +
  ylab("Share of Involuntary Part-Time Employment") + xlab("")

Women

Code
GENDER_EMP %>%
  filter(COU == "DEU", 
         IND == "EMP6", 
         SEX == "WOMEN") %>%
  left_join(GENDER_EMP_var$AGE %>% 
              setNames(c("AGE", "Age")), by = "AGE") %>%
  mutate(date = paste0(TIME, "-01-01") %>% as.Date) %>%
  mutate(obsValue = obsValue/100) %>%
  ggplot() + 
  geom_line(aes(x = date, y = obsValue, color = Age, linetype = Age)) +
  scale_color_manual(values = viridis(6)[1:5]) +
  theme_minimal() +
  scale_x_date(breaks = seq(1920, 2025, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%y")) +
  theme(legend.position = c(0.15, 0.8),
        legend.title = element_blank()) +
  scale_y_continuous(breaks = 0.01*seq(-7, 90, 1),
                     labels = percent_format(accuracy = 1)) +
  ylab("Share of Involuntary Part-Time Employment") + xlab("")