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 29289208

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 10448806
M Males 9591277
F Females 9249125

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 10571180
FT Full-time 10179103
PT Part-time 8157566
NRP No response 381359

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 4795871
NCFAM Employed persons except contributing family workers 4783733
SAL Employees 4704880
NSAL Employed persons except employees 3640397
SELF Self-employed persons 3573744
SELF_NS Self-employed persons without employees (own-account workers) 3375981
SELF_S Self-employed persons with employees (employers) 2662446
CFAM Contributing family workers 1617910
NRP No response 134246

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 1903816
G Wholesale and retail trade; repair of motor vehicles and motorcycles 1686506
A Agriculture, forestry and fishing 1663387
C Manufacturing 1576445
M Professional, scientific and technical activities 1570012
I Accommodation and food service activities 1548711
S Other service activities 1521633
F Construction 1518490
Q Human health and social work activities 1498078
N Administrative and support service activities 1463729
H Transportation and storage 1431153
R Arts, entertainment and recreation 1431136
P Education 1413155
J Information and communication 1385270
K Financial and insurance activities 1257301
L Real estate activities 1252126
E Water supply; sewerage, waste management and remediation activities 944405
O Public administration and defence; compulsory social security 906901
T Activities of households as employers; undifferentiated goods- and services-producing activities of households for own use 816745
D Electricity, gas, steam and air conditioning supply 803539
B Mining and quarrying 670601
NRP No response 597715
U Activities of extraterritorial organisations and bodies 428354

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")