Hours worked per week of part-time employment - lfsq_ewhun2

Data - Eurostat

unit

Code
lfsq_ewhun2 %>%
  left_join(unit, by = "unit") %>%
  group_by(unit, Unit) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  {if (is_html_output()) print_table(.) else .}
unit Unit Nobs
HR Hour 28312371

sex

Code
lfsq_ewhun2 %>%
  left_join(sex, by = "sex") %>%
  group_by(sex, Sex) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  {if (is_html_output()) print_table(.) else .}
sex Sex Nobs
T Total 10098590
M Males 9269380
F Females 8944401

worktime

Code
lfsq_ewhun2 %>%
  left_join(worktime, by = "worktime") %>%
  group_by(worktime, Worktime) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  {if (is_html_output()) print_table(.) else .}
worktime Worktime Nobs
TOTAL Total 10216083
FT Full-time 9836712
PT Part-time 7901497
NRP No response 358079

wstatus

Code
lfsq_ewhun2 %>%
  left_join(wstatus, by = "wstatus") %>%
  group_by(wstatus, Wstatus) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  {if (is_html_output()) print_table(.) else .}
wstatus Wstatus Nobs
EMP Employed persons 4632706
NCFAM Employed persons except contributing family workers 4621163
SAL Employees 4545970
NSAL Employed persons except employees 3518149
SELF Self-employed persons 3453822
SELF_NS Self-employed persons without employees (own-account workers) 3263376
SELF_S Self-employed persons with employees (employers) 2577013
CFAM Contributing family workers 1569097
NRP No response 131075

nace_r2

Code
lfsq_ewhun2 %>%
  left_join(nace_r2, by = "nace_r2") %>%
  group_by(nace_r2, Nace_r2) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  {if (is_html_output()) print_table(.) else .}
nace_r2 Nace_r2 Nobs
TOTAL Total - all NACE activities 1838111
G Wholesale and retail trade; repair of motor vehicles and motorcycles 1629075
A Agriculture, forestry and fishing 1605698
C Manufacturing 1522868
M Professional, scientific and technical activities 1517512
I Accommodation and food service activities 1496764
S Other service activities 1469204
F Construction 1466651
Q Human health and social work activities 1448440
N Administrative and support service activities 1414155
H Transportation and storage 1382496
R Arts, entertainment and recreation 1382489
P Education 1367215
J Information and communication 1338096
K Financial and insurance activities 1216373
L Real estate activities 1212865
E Water supply; sewerage, waste management and remediation activities 912558
O Public administration and defence; compulsory social security 879764
T Activities of households as employers; undifferentiated goods- and services-producing activities of households for own use 791504
D Electricity, gas, steam and air conditioning supply 776783
B Mining and quarrying 649731
NRP No response 579627
U Activities of extraterritorial organisations and bodies 414392

geo

Code
lfsq_ewhun2 %>%
  left_join(geo, by = "geo") %>%
  group_by(geo, Geo) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  {if (is_html_output()) datatable(., filter = 'top', rownames = F) else .}

France, Germany, Portugal

Code
lfsq_ewhun2 %>%
  filter(geo %in% c("FR", "DE", "PT"),
         nace_r2 == "TOTAL",
         wstatus == "SAL",
         sex == "T",
         worktime == "TOTAL") %>%
  quarter_to_date %>%
  left_join(geo, by = "geo") %>%
  ggplot + geom_line() + theme_minimal()  +
  aes(x = date, y = values, color = Geo, linetype = Geo) +
  scale_color_manual(values = viridis(4)[1:3]) +
  scale_x_date(breaks = as.Date(paste0(seq(1960, 2020, 1), "-01-01")),
               labels = date_format("%y")) +
  scale_y_continuous(breaks = seq(0, 44, 1)) +
  theme(legend.position = c(0.3, 0.85),
        legend.title = element_blank()) +
  xlab("") + ylab("Hours worked per week of part-time employment")

France, Italy, Greece

Code
lfsq_ewhun2 %>%
  filter(geo %in% c("FR", "IT", "EL"),
         nace_r2 == "TOTAL",
         wstatus == "SAL",
         sex == "T",
         worktime == "TOTAL") %>%
  quarter_to_date %>%
  left_join(geo, by = "geo") %>%
  ggplot + geom_line() + theme_minimal()  +
  aes(x = date, y = values, color = Geo, linetype = Geo) +
  scale_color_manual(values = viridis(4)[1:3]) +
  scale_x_date(breaks = as.Date(paste0(seq(1960, 2020, 1), "-01-01")),
               labels = date_format("%y")) +
  scale_y_continuous(breaks = seq(0, 50, 0.5)) +
  theme(legend.position = c(0.15, 0.55),
        legend.title = element_blank()) +
  xlab("") + ylab("Hours worked per week of part-time employment")