Effectifs de la fonction publique

Data - DGAFP

Tous secteur

Tous

Code
FT12_FPE_FPH_FPT %>%
  #filter(variable %in% c("FPT", "FPH", "FPE", "FP", "Emploi total")) %>%
  group_by(variable) %>%
  mutate(date = date + years(1)) %>%
  mutate(value = 100*value/value[1]) %>%
  ggplot() + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  scale_x_date(breaks = seq(1997, 2022, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = seq(0, 500, 10)) +
  #scale_color_manual(values = viridis(6)[1:5]) +
  theme(legend.position = c(0.15, 0.6),
        legend.title = element_blank())

Part public

Code
FT12_FPE_FPH_FPT %>%
  filter(grepl("part_public", variable)) %>%
  group_by(variable) %>%
  mutate(date = date + years(1)) %>%
  ggplot() + geom_line(aes(x = date, y = value/100, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  scale_x_date(breaks = seq(1997, 2022, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = 0.01*seq(0, 500, .1),
                     labels = percent_format(acc = .1)) +
  #scale_color_manual(values = viridis(6)[1:5]) +
  theme(legend.position = c(0.15, 0.7),
        legend.title = element_blank())

Tous secteurs sauf EPA

Tous

Code
FT12_FPE_FPH_FPT %>%
  filter(!(grepl("EPA", variable))) %>%
  group_by(variable) %>%
  mutate(date = date + years(1)) %>%
  mutate(value = 100*value/value[1]) %>%
  ggplot() + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  scale_x_date(breaks = seq(1997, 2022, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = seq(0, 500, 10)) +
  #scale_color_manual(values = viridis(6)[1:5]) +
  theme(legend.position = c(0.15, 0.7),
        legend.title = element_blank()) +
  geom_label_repel(data = . %>% filter(date == max(date)),
             aes(x = date, y = value, label = variable, color = variable),
             size = 2)

2010-

Code
FT12_FPE_FPH_FPT %>%
  filter(!(grepl("EPA", variable))) %>%
  group_by(variable) %>%
  mutate(date = date + years(1)) %>%
  filter(date >= as.Date("2010-01-01")) %>%
  mutate(value = 100*value/value[1]) %>%
  ggplot() + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  scale_x_date(breaks = seq(1997, 2022, 1) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = seq(0, 500, 10)) +
  #scale_color_manual(values = viridis(6)[1:5]) +
  theme(legend.position = c(0.15, 0.7),
        legend.title = element_blank()) +
  geom_label_repel(data = . %>% filter(date == max(date)),
             aes(x = date, y = value, label = variable, color = variable),
             size = 2)

Emploi total, FP

Tous

Code
FT12_FPE_FPH_FPT %>%
  filter(variable %in% c( "FP", "Emploi total")) %>%
  group_by(variable) %>%
  mutate(date = date + years(1)) %>%
  mutate(value = 100*value/value[1]) %>%
  ggplot() + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  scale_x_date(breaks = seq(1997, 2022, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = seq(0, 500, 2)) +
  #scale_color_manual(values = viridis(6)[1:5]) +
  theme(legend.position = c(0.3, 0.8),
        legend.title = element_blank())

1998-

Code
FT12_FPE_FPH_FPT %>%
  filter(variable %in% c( "FP", "Emploi total")) %>%
  group_by(variable) %>%
  mutate(date = date + years(1)) %>%
  filter(date >= as.Date("1998-01-01")) %>%
  mutate(value = 100*value/value[1]) %>%
  ggplot() + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  scale_x_date(breaks = seq(1997, 2022, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = seq(0, 500, 2)) +
  #scale_color_manual(values = viridis(6)[1:5]) +
  theme(legend.position = c(0.3, 0.8),
        legend.title = element_blank())

FPT, FPH, FPE, FP

Tous

Code
FT12_FPE_FPH_FPT %>%
  filter(variable %in% c("FPT", "FPH", "FPE", "FP", "Emploi total")) %>%
  group_by(variable) %>%
  mutate(date = date + years(1)) %>%
  mutate(value = 100*value/value[1]) %>%
  ggplot() + geom_line(aes(x = date, y = value, color = variable)) + 
  theme_minimal() + xlab("") + ylab("") +
  scale_x_date(breaks = seq(1997, 2022, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = seq(0, 500, 10)) +
  #scale_color_manual(values = viridis(6)[1:5]) +
  theme(legend.position = c(0.3, 0.8),
        legend.title = element_blank())