3.301 – Dépenses des administrations publiques (S13) ventilées par fonction (En milliards d’euros) - T_3301

Data - INSEE

10 - Protection sociale

Maladie, Retraite

Code
T_3301 %>%
  filter(OPERATION == "OTE",
         EXPENDITURE %in% c("GF1001", "GF1002", "GF1003")) %>%
  left_join(gdp, by = "year") %>%
  year_to_date2 %>%
  ggplot + geom_line(aes(x = date, y = value / gdp, color = Expenditure)) +
  theme_minimal() + xlab("") + ylab("% du PIB") +
  scale_x_date(breaks = seq(1960, 2100, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = 0.01*seq(0, 500, 1),
                labels = percent_format(accuracy = 1)) +
  theme(legend.position = c(0.7, 0.5),
        legend.title = element_blank())

Retraite

Code
T_3301 %>%
  filter(OPERATION == "OTE",
         EXPENDITURE %in% c("GF1002", "GF1003")) %>%
  left_join(gdp, by = "year") %>%
  year_to_date2 %>%
  ggplot + geom_line(aes(x = date, y = value / gdp, color = Expenditure)) +
  theme_minimal() + xlab("") + ylab("% du PIB") +
  scale_x_date(breaks = seq(1960, 2100, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = 0.01*seq(0, 500, 1),
                labels = percent_format(accuracy = 1)) +
  theme(legend.position = c(0.7, 0.5),
        legend.title = element_blank())

% des salaires nets

Salaires bruts, salaires nets

% du PIB

Code
T_2101 %>%
  filter(variable %in% c("D11", "D11X613CE")) %>%
  left_join(gdp, by = "year") %>%
  year_to_date2 %>%
  ggplot + geom_line(aes(x = date, y = value / gdp, color = Variable)) +
  theme_minimal() + xlab("") + ylab("% du PIB") +
  scale_x_date(breaks ="5 years",
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = 0.01*seq(-10, 100, 1),
                     labels = percent_format(accuracy = 1)) +
  theme(legend.position = c(0.2, 0.15),
        legend.title = element_blank())