Décès et mortalité

Data - INSEE

Info

source dataset .html .RData

insee

DECES-MORTALITE

2024-09-14 2024-09-15

Données sur la demographie

source dataset .html .RData

eurostat

demo_minfind

2024-09-15 2024-09-15

ined

fm_t70_2019.fr

2024-06-20 2022-01-31

ined

fm_t70_2021.fr

2024-06-20 2023-10-10

ined

p2d_2019.fr

2024-06-20 2021-12-18

insee

DECES-MORTALITE

2024-09-14 2024-09-15

insee

NAISSANCES-FECONDITE

2024-09-14 2024-09-15

oecd

FAMILY

2024-09-15 2024-02-13

Définitions

  • Espérance de vie à la naissance. L’espérance de vie à la naissance est égale à la durée de vie moyenne d’une génération fictive qui connaîtrait tout au long de son existence les conditions de mortalité par âge de l’année considérée. C’est un indicateur synthétique des taux de mortalité par âge de l’année considérée.

TITLE_FR

Code
`DECES-MORTALITE` %>%
  group_by(IDBANK, TITLE_FR) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  print_table_conditional()

INDICATEUR

Code
`DECES-MORTALITE` %>%
  left_join(INDICATEUR,  by = "INDICATEUR") %>%
  group_by(INDICATEUR, Indicateur) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  print_table_conditional()
INDICATEUR Indicateur Nobs
ESPERANCE_VIE Espérance de vie 42792
TAUX_BRUT_MORTALITE Taux brut de mortalité 11078
TAUX_MORTALITE Taux de mortalité 8631
TAUX_MORTALITE_STANDARDISE Taux de mortalité standardisé 6052
DECES_DOMICILIES Décès domiciliés 5516
NOMBRE_DECES Nombre de décès 2871

DEMOGRAPHIE

Code
`DECES-MORTALITE` %>%
  left_join(DEMOGRAPHIE,  by = "DEMOGRAPHIE") %>%
  group_by(DEMOGRAPHIE, Demographie) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  print_table_conditional()
DEMOGRAPHIE Demographie Nobs
SO Sans objet 18739
ESPV Espérance de vie à la naissance 10644
ESPV-20 Espérance de vie à 20 ans 10644
ESPV-40 Espérance de vie à 40 ans 10644
ESPV-60 Espérance de vie à 60 ans 10644
DECES-DOM Décès de tous âges, domiciliés 5516
TXMSG Taux de mortalité pour différents groupes d'âges, par sexe 5040
DECES Décès de tous âges 1500
DECES-1A Décès de moins d'un an 1371
TXMOR Taux de mortalité 1127
TXMORINF Taux de mortalité infantile 855
ESPV-01 Espérance de vie à 1 an 216

AGE

Code
`DECES-MORTALITE` %>%
  left_join(AGE,  by = "AGE") %>%
  group_by(AGE, Age) %>%
  summarise(Nobs = n()) %>%
  print_table_conditional()
AGE Age Nobs
00- Ensemble 180
00-01 Moins d'un an 1879
00-64 De 0 à 64 ans 3026
01-04 De 1 à 4 ans 270
05-09 De 5 à 9 ans 270
10-14 De 10 à 14 ans 270
15-19 De 15 à 19 ans 270
20-24 De 20 à 24 ans 270
25-29 De 25 à 29 ans 270
30-34 De 30 à 34 ans 270
35-39 De 35 à 39 ans 270
40-44 De 40 à 44 ans 270
45-49 De 45 à 49 ans 270
50-54 De 50 à 54 ans 270
55-59 De 55 à 59 ans 270
60-64 De 60 à 64 ans 270
65- 65 ans et plus 3026
65-69 De 65 à 69 ans 270
70-79 De 70 à 79 ans 270
80-89 De 80 à 89 ans 270
90- 90 ans et plus 270
SO Sans objet 64239

Espérance de vie à la naissance

ESPV

Tous

Code
`DECES-MORTALITE` %>%
  filter(INDICATEUR == "ESPERANCE_VIE",
         REF_AREA == "FM",
         DEMOGRAPHIE != "ESPV-01") %>%
  select_if(~ n_distinct(.) > 1) %>%
  year_to_date %>%
  arrange(date) %>%
  #filter(date >= as.Date("1981-01-01")) %>%
  arrange(date) %>%
  left_join(DEMOGRAPHIE, by = "DEMOGRAPHIE") %>%
  left_join(SEXE, by = "SEXE") %>%
  unique %>%
  mutate(Demographie = gsub("Espérance de vie", "... ", Demographie)) %>%
  mutate(Demographie = ifelse(DEMOGRAPHIE == "ESPV", "... à 0 ans", Demographie)) %>%
  arrange(Demographie) %>%
  ggplot() + geom_line(aes(x = date, y = OBS_VALUE, color = Demographie)) +
  scale_x_date(breaks = seq(1940, 2100, 10) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = seq(0, 100, 10),
                     labels = dollar_format(pre = "", su = " ans")) +
  theme_minimal() + xlab("") + ylab("") +
  geom_label(data = . %>% filter(date %in% c(max(date), min(date))),
             aes(x = date, y = OBS_VALUE, color = Demographie, label = paste0(OBS_VALUE))) +
  theme(legend.position = "top",
        axis.text.x = element_text(angle = 45, vjust = 1, hjust = 1)) + labs(x = "", y = "", color = "Espérance de vie: ") +
  facet_wrap(~ Sexe)

1981-

Code
`DECES-MORTALITE` %>%
  filter(INDICATEUR == "ESPERANCE_VIE",
         REF_AREA == "FM",
         DEMOGRAPHIE != "ESPV-01") %>%
  select_if(~ n_distinct(.) > 1) %>%
  year_to_date %>%
  arrange(date) %>%
  filter(date >= as.Date("1981-01-01")) %>%
  arrange(date) %>%
  left_join(DEMOGRAPHIE, by = "DEMOGRAPHIE") %>%
  left_join(SEXE, by = "SEXE") %>%
  unique %>%
  mutate(Demographie = gsub("Espérance de vie", "... ", Demographie)) %>%
  mutate(Demographie = ifelse(DEMOGRAPHIE == "ESPV", "... à 0 ans", Demographie)) %>%
  arrange(Demographie) %>%
  ggplot() + geom_line(aes(x = date, y = OBS_VALUE, color = Demographie)) +
  scale_x_date(breaks = seq(1981, 2023, 3) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y"),
               limits = c(1980, 2024) %>% paste0("-01-01") %>% as.Date) +
  scale_y_continuous(breaks = seq(0, 100, 10),
                     labels = dollar_format(pre = "", su = " ans")) +
  theme_minimal() + xlab("") + ylab("") +
  geom_label(data = . %>% filter(date %in% c(max(date), min(date))),
             aes(x = date, y = OBS_VALUE, color = Demographie, label = paste0(OBS_VALUE))) +
  theme(legend.position = "top",
        axis.text.x = element_text(angle = 45, vjust = 1, hjust = 1)) + labs(x = "", y = "", color = "Espérance de vie: ") +
  facet_wrap(~ Sexe)

Démographie - Nombre de naissances vivantes

Par an (glissement)

Tous

Code
`DECES-MORTALITE` %>%
  filter(IDBANK == "000436394") %>%
  month_to_date %>%
  arrange(date) %>%
  mutate(OBS_VALUE = rollsum(x = OBS_VALUE, 12, align = "right", fill = NA)) %>%
  ggplot() + geom_line(aes(x = date, y = OBS_VALUE)) +
  scale_x_date(breaks = seq(1880, 2100, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = seq(0, 1000000, 20000),
                     labels = dollar_format(pre = "")) +
  theme_minimal() + xlab("") + ylab("Nombre sur les 12 derniers mois")

Deces vs. naissances

France Métropolitaine

12 mois

Tous

Code
`DECES-MORTALITE` %>%
  bind_rows(`NAISSANCES-FECONDITE`) %>%
  filter(IDBANK %in% c("000436394", "000436391")) %>%
  month_to_date %>%
  group_by(TITLE_FR) %>%
  arrange(date) %>%
  mutate(OBS_VALUE = rollsum(x = OBS_VALUE, 12, align = "right", fill = NA),
         DEMOGRAPHIE2 = ifelse(DEMOGRAPHIE == "DECES", "Décès", "Naissances")) %>%
  ggplot() + geom_line(aes(x = date, y = OBS_VALUE, color = TITLE_FR)) +
  scale_x_date(breaks = seq(1880, 2100, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = seq(0, 1000000, 20000),
                     labels = dollar_format(pre = "")) +
  theme_minimal() + xlab("") + ylab("Nombre sur les 12 derniers mois") +
  theme(legend.position = "none") +
  geom_label(data = . %>% filter(date == as.Date("2005-01-01")), aes(x = date, y = OBS_VALUE, label = DEMOGRAPHIE2, color = TITLE_FR)) +
  ggtitle("Naissances et décès sur les 12 derniers mois - France Métropolitaine")

1990-

Code
`DECES-MORTALITE` %>%
  bind_rows(`NAISSANCES-FECONDITE`) %>%
  filter(IDBANK %in% c("000436394", "000436391")) %>%
  month_to_date %>%
  group_by(TITLE_FR) %>%
  arrange(date) %>%
  mutate(OBS_VALUE = rollsum(x = OBS_VALUE, 12, align = "right", fill = NA),
         DEMOGRAPHIE2 = ifelse(DEMOGRAPHIE == "DECES", "Décès", "Naissances")) %>%
  filter(date >= as.Date("1990-01-01")) %>%
  ggplot() + geom_line(aes(x = date, y = OBS_VALUE, color = TITLE_FR)) +
  scale_x_date(breaks = seq(1880, 2100, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = seq(0, 1000000, 20000),
                     labels = dollar_format(pre = "")) +
  theme_minimal() + xlab("") + ylab("Nombre sur les 12 derniers mois") +
  theme(legend.position = "none") +
  geom_label(data = . %>% filter(date == as.Date("2005-01-01")), aes(x = date, y = OBS_VALUE, label = DEMOGRAPHIE2, color = TITLE_FR)) +
  ggtitle("Naissances et décès sur les 12 derniers mois - France Métropolitaine")

2009-

Code
`DECES-MORTALITE` %>%
  bind_rows(`NAISSANCES-FECONDITE`) %>%
  filter(IDBANK %in% c("000436394", "000436391")) %>%
  month_to_date %>%
  group_by(TITLE_FR) %>%
  arrange(date) %>%
  mutate(OBS_VALUE = rollsum(x = OBS_VALUE, 12, align = "right", fill = NA),
         DEMOGRAPHIE2 = ifelse(DEMOGRAPHIE == "DECES", "Décès", "Naissances")) %>%
  filter(date >= as.Date("2009-01-01")) %>%
  ggplot() + geom_line(aes(x = date, y = OBS_VALUE, color = TITLE_FR)) +
  scale_x_date(breaks = seq(1880, 2100, 1) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = seq(0, 1000000, 20000),
                     labels = dollar_format(pre = "")) +
  theme_minimal() + xlab("") + ylab("Nombre sur les 12 derniers mois") +
  theme(legend.position = "none") +
  geom_label(data = . %>% filter(date == as.Date("2015-01-01")), aes(x = date, y = OBS_VALUE, label = DEMOGRAPHIE2, color = TITLE_FR)) +
  ggtitle("Naissances et décès sur les 12 derniers mois - France Métropolitaine")

2017-

Code
`DECES-MORTALITE` %>%
  bind_rows(`NAISSANCES-FECONDITE`) %>%
  filter(IDBANK %in% c("000436394", "000436391")) %>%
  month_to_date %>%
  group_by(TITLE_FR) %>%
  arrange(date) %>%
  mutate(OBS_VALUE = rollsum(x = OBS_VALUE, 12, align = "right", fill = NA),
         DEMOGRAPHIE2 = ifelse(DEMOGRAPHIE == "DECES", "Décès", "Naissances")) %>%
  filter(date >= as.Date("2017-01-01")) %>%
  ggplot() + geom_line(aes(x = date, y = OBS_VALUE, color = TITLE_FR)) +
  scale_x_date(breaks = seq(1880, 2100, 1) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = seq(0, 1000000, 20000),
                     labels = dollar_format(pre = "")) +
  theme_minimal() + xlab("") + ylab("Nombre sur les 12 derniers mois") +
  theme(legend.position = "none") +
  geom_label(data = . %>% filter(date == as.Date("2015-01-01")), aes(x = date, y = OBS_VALUE, label = DEMOGRAPHIE2, color = TITLE_FR)) +
  ggtitle("Naissances et décès sur les 12 derniers mois - France Métropolitaine")

6 mois

Code
`DECES-MORTALITE` %>%
  bind_rows(`NAISSANCES-FECONDITE`) %>%
  filter(IDBANK %in% c("000436394", "000436391")) %>%
  month_to_date %>%
  group_by(TITLE_FR) %>%
  arrange(date) %>%
  mutate(OBS_VALUE = rollsum(x = OBS_VALUE, 6, align = "right", fill = NA)) %>%
  ggplot() + geom_line(aes(x = date, y = OBS_VALUE, color = TITLE_FR)) +
  scale_x_date(breaks = seq(1880, 2100, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = seq(0, 1000000, 20000),
                     labels = dollar_format(pre = "")) +
  theme_minimal() + xlab("") + ylab("Nombre sur les 6 derniers mois") +
  theme(legend.position = c(0.4, 0.5),
        legend.title = element_blank(),
        legend.direction = "vertical")

France Entière

12 mois

Code
`DECES-MORTALITE` %>%
  bind_rows(`NAISSANCES-FECONDITE`) %>%
  filter(IDBANK %in% c("001641603", "001641601")) %>%
  month_to_date %>%
  group_by(TITLE_FR) %>%
  arrange(date) %>%
  mutate(OBS_VALUE = rollsum(x = OBS_VALUE, 12, align = "right", fill = NA)) %>%
  ggplot() + geom_line(aes(x = date, y = OBS_VALUE, color = TITLE_FR)) +
  scale_x_date(breaks = seq(1880, 2100, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = seq(0, 1000000, 20000),
                     labels = dollar_format(pre = "")) +
  theme_minimal() + xlab("") + ylab("Nombre sur les 12 derniers mois") +
  theme(legend.position = c(0.4, 0.5),
        legend.title = element_blank(),
        legend.direction = "vertical")

6 mois

Code
`DECES-MORTALITE` %>%
  bind_rows(`NAISSANCES-FECONDITE`) %>%
  filter(IDBANK %in% c("001641603", "001641601")) %>%
  month_to_date %>%
  group_by(TITLE_FR) %>%
  arrange(date) %>%
  mutate(OBS_VALUE = rollsum(x = OBS_VALUE, 6, align = "right", fill = NA)) %>%
  ggplot() + geom_line(aes(x = date, y = OBS_VALUE, color = TITLE_FR)) +
  scale_x_date(breaks = seq(1880, 2100, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = seq(0, 1000000, 20000),
                     labels = dollar_format(pre = "")) +
  theme_minimal() + xlab("") + ylab("Nombre sur les 6 derniers mois") +
  theme(legend.position = c(0.4, 0.5),
        legend.title = element_blank(),
        legend.direction = "vertical")