En décembre 2021, les prix à la consommation augmentent de 0,2 % sur un mois et de 2,8 % sur un an - IPC_009_12_2021_detaillees

Data - INSEE

Info

  • En décembre 2021, les prix à la consommation augmentent de 0,2 % sur un mois et de 2,8 % sur un an. html / pdf

Unir avec budget des familles

326 produits

Code
tm106 %>%
  filter(DECUC %in% c("TOT")) %>%
  left_join(DECUC, by = "DECUC") %>%
  left_join(NOMENCLATURE, by = "NOMENCLATURE") %>%
  select(NOMENCLATURE, Nomenclature, Decuc, CONSO) %>%
  spread(Decuc, CONSO) %>%
  mutate_at(vars(-1, -2), funs(round(100*./.[NOMENCLATURE == "CTOTALE"],2))) %>%
  print_table_conditional()

12 produits

Code
tm106 %>%
  filter(DECUC %in% c("TOT")) %>%
  filter(nchar(NOMENCLATURE) == 2 | NOMENCLATURE == "CTOTALE") %>%
  left_join(DECUC, by = "DECUC") %>%
  left_join(NOMENCLATURE, by = "NOMENCLATURE") %>%
  select(NOMENCLATURE, Nomenclature, Decuc, CONSO) %>%
  spread(Decuc, CONSO) %>%
  mutate_at(vars(-1, -2), funs(round(100*./.[NOMENCLATURE == "CTOTALE"],2))) %>%
  print_table_conditional()
NOMENCLATURE Nomenclature Ensemble
01 01 - PRODUITS ALIMENTAIRES ET BOISSONS NON-ALCOOLISEES 16.08
02 02 - BOISSONS ALCOOLISEES ET TABAC 2.89
03 03 - ARTICLES D’HABILLEMENT ET CHAUSSURES 5.00
04 04 - LOGEMENT, EAU, GAZ, ELECTRICITE ET AUTRES COMBUSTIBLES 16.29
05 05 - MEUBLES, ARTICLES DE MENAGE ET ENTRETIEN COURANT DE LA MAISON 5.67
06 06 - SANTE 1.85
07 07 - TRANSPORTS 16.28
08 08 - COMMUNICATIONS 2.66
09 09 - LOISIRS ET CULTURE 9.40
10 10 - ENSEIGNEMENT 0.78
11 11 - RESTAURATION ET HÔTELS 7.23
12 12 - BIENS ET SERVICES DIVERS 15.87
13 13 - HORS CHAMP DE LA CONSOMMATION (IMPOTS ET TAXES, GROS TRAVAUX, REMBOURSEMENT PRET, CADEAUX) 34.97
CTOTALE TOTAL DE LA CONSOMMATION - CHAMP COMPTABILITE NATIONALE 100.00

54 produits

Code
tm106 %>%
  filter(DECUC %in% c("TOT")) %>%
  filter(nchar(NOMENCLATURE) == 3 | NOMENCLATURE == "CTOTALE") %>%
  left_join(DECUC, by = "DECUC") %>%
  left_join(NOMENCLATURE, by = "NOMENCLATURE") %>%
  select(NOMENCLATURE, Nomenclature, Decuc, CONSO) %>%
  spread(Decuc, CONSO) %>%
  mutate_at(vars(-1, -2), funs(round(100*./.[NOMENCLATURE == "CTOTALE"],2))) %>%
  print_table_conditional()

114 produits

Code
tm106 %>%
  filter(DECUC %in% c("TOT")) %>%
  filter(nchar(NOMENCLATURE) == 4 | NOMENCLATURE == "CTOTALE") %>%
  left_join(DECUC, by = "DECUC") %>%
  left_join(NOMENCLATURE, by = "NOMENCLATURE") %>%
  select(NOMENCLATURE, Nomenclature, Decuc, CONSO) %>%
  spread(Decuc, CONSO) %>%
  mutate_at(vars(-1, -2), funs(round(100*./.[NOMENCLATURE == "CTOTALE"],2))) %>%
  print_table_conditional()

147 produits

Code
tm106 %>%
  filter(DECUC %in% c("TOT")) %>%
  filter(nchar(NOMENCLATURE) == 5 | NOMENCLATURE == "CTOTALE") %>%
  left_join(DECUC, by = "DECUC") %>%
  left_join(NOMENCLATURE, by = "NOMENCLATURE") %>%
  select(NOMENCLATURE, Nomenclature, Decuc, CONSO) %>%
  spread(Decuc, CONSO) %>%
  mutate_at(vars(-1, -2), funs(round(100*./.[NOMENCLATURE == "CTOTALE"],2))) %>%
  print_table_conditional()

Données

413 produits

Code
IPC_009_12_2021_detaillees %>%
  select(1, 2, 3, 11) %>%
  print_table_conditional()

12 produits

Code
IPC_009_12_2021_detaillees %>%
  filter(nchar(IDENT) == 2, IDENT != "00") %>%
  select(1, 2, 3, 11) %>%
  setNames(c("IDENT", "Regroupements", "Ponderation", "Variation")) %>%
  mutate(Contribution = Ponderation * Variation/10000) %>%
  print_table_conditional()
IDENT Regroupements Ponderation Variation Contribution
01 PROD. ALIM. ET BOISSONS NON ALCOOLISEES 1578 1.4139174 0.2231162
02 BOISSONS ALCOOL., TABAC ET STUPÉFIANTS 450 0.3856239 0.0173531
03 ARTICLE D'HABILLEMENT ET CHAUSSURES 367 3.2181639 0.1181066
04 LOG., EAU, GAZ, ÉLEC. ET AUT COMB. 1527 6.7928098 1.0372621
05 MEUB., ART. MEN. ET ENTRETIEN DU FOYER 526 2.3144929 0.1217423
06 SANTE 1121 -2.0125916 -0.2256115
07 TRANSPORTS 1333 6.3436705 0.8456113
08 COMMUNICATIONS 286 2.2909881 0.0655223
09 LOISIRS ET CULTURE 838 1.9407061 0.1626312
10 ENSEIGNEMENT 4 2.0009179 0.0008004
11 RESTAURANTS ET HÔTELS 599 2.3517287 0.1408685
12 BIENS ET SERVICES DIVERS 1371 1.8348624 0.2515596

40 produits

Code
IPC_009_12_2021_detaillees %>%
  filter(nchar(IDENT) == 3) %>%
  select(1, 2, 3, 11) %>%
  setNames(c("IDENT", "Regroupements", "Ponderation", "Variation")) %>%
  mutate(Contribution = Ponderation * Variation/10000) %>%
  print_table_conditional()

103 produits

Code
IPC_009_12_2021_detaillees %>%
  filter(nchar(IDENT) == 4) %>%
  select(1, 2, 3, 11) %>%
  setNames(c("IDENT", "Regroupements", "Ponderation", "Variation")) %>%
  mutate(Contribution = Ponderation * Variation/10000) %>%
  print_table_conditional()

257 produits

Code
IPC_009_12_2021_detaillees %>%
  filter(nchar(IDENT) == 5) %>%
  select(1, 2, 3, 11) %>%
  setNames(c("IDENT", "Regroupements", "Ponderation", "Variation")) %>%
  mutate(Contribution = Ponderation * Variation/10000) %>%
  print_table_conditional()

Inflation agrégée

12 produits

Code
IPC_009_12_2021_detaillees %>%
  filter(nchar(IDENT) == 2, IDENT != "00") %>%
  select(1, 2, 3, 11) %>%
  setNames(c("IDENT", "Regroupements", "Ponderation", "Variation")) %>%
  mutate(Contribution = Ponderation * Variation/10000) %>%
  summarise(Inflation = sum(Contribution)) %>%
  print_table_conditional()
Inflation
2.758962

40 produits

Code
IPC_009_12_2021_detaillees %>%
  filter(nchar(IDENT) == 3) %>%
  select(1, 2, 3, 11) %>%
  setNames(c("IDENT", "Regroupements", "Ponderation", "Variation")) %>%
  mutate(Contribution = Ponderation * Variation/10000) %>%
  summarise(Inflation = sum(Contribution)) %>%
  print_table_conditional()
Inflation
2.759252

103 produits

Code
IPC_009_12_2021_detaillees %>%
  filter(nchar(IDENT) == 4) %>%
  select(1, 2, 3, 11) %>%
  setNames(c("IDENT", "Regroupements", "Ponderation", "Variation")) %>%
  mutate(Contribution = Ponderation * Variation/10000) %>%
  summarise(Inflation = sum(Contribution)) %>%
  print_table_conditional()
Inflation
2.756278

257 produits

Code
IPC_009_12_2021_detaillees %>%
  filter(nchar(IDENT) == 5) %>%
  select(1, 2, 3, 11) %>%
  setNames(c("IDENT", "Regroupements", "Ponderation", "Variation")) %>%
  mutate(Contribution = Ponderation * Variation/10000) %>%
  filter(!is.na(Contribution)) %>%
  summarise(Inflation = sum(Contribution)) %>%
  print_table_conditional()
Inflation
2.758191

By Decile

Gaz et combustibles

Code
tm106 %>%
  filter(NOMENCLATURE %in% c("0452", "0453", "CTOTALE")) %>%
  left_join(NOMENCLATURE, by = "NOMENCLATURE") %>%
  mutate(DECUC = DECUC %>% as.numeric) %>%
  group_by(DECUC) %>%
  mutate(CONSO = CONSO/CONSO[NOMENCLATURE == "CTOTALE"]) %>%
  filter(NOMENCLATURE != "CTOTALE") %>%
  ggplot + geom_line(aes(x = DECUC, y = CONSO, color = Nomenclature)) +
  theme_minimal() + xlab("Décile") + ylab("% de la Consommation Totale") +
  scale_y_continuous(breaks = 0.01*seq(-30, 50, 0.1),
                     labels = percent_format(accuracy = .1)) +
  scale_x_continuous(breaks = seq(0, 10, 1)) +
  scale_color_manual(values = viridis(3)[1:2]) +
  theme(legend.position = c(0.4, 0.1),
        legend.title = element_blank())