Indices pour la révision d’un bail commercial ou professionnel

Data - INSEE

Info

source dataset .html .RData
insee ILC-ILAT-ICC 2025-01-05 2025-01-05

Formules

  • ILAT (Indice des Loyers des Activités Tertiaires). html

Données sur l’inflation en France

source dataset .html .RData
insee bdf2017 2025-01-07 2023-11-21
insee ILC-ILAT-ICC 2025-01-05 2025-01-05
insee INDICES_LOYERS 2025-01-05 2025-01-05
insee IPC-1970-1980 2025-01-05 2025-01-05
insee IPC-1990 2025-01-05 2025-01-05
insee IPC-2015 2025-01-05 2025-01-05
insee IPC-PM-2015 2025-01-05 2025-01-05
insee IPCH-2015 2025-01-07 2025-01-07
insee IPGD-2015 2025-01-05 2025-01-05
insee IPLA-IPLNA-2015 2025-01-05 2025-01-05
insee IPPI-2015 2025-01-05 2025-01-05
insee IRL 2025-01-05 2025-01-05
insee SERIES_LOYERS 2025-01-05 2025-01-05
insee T_CONSO_EFF_FONCTION 2025-01-05 2024-07-18

Données sur l’immobilier

source dataset .html .RData
acpr as151 2024-06-19 2024-04-05
bdf BSI1 2025-01-05 2025-01-05
bdf CPP 2025-01-05 2024-07-01
bdf FM 2025-01-07 2025-01-07
bdf immobilier 2025-01-05 2024-11-19
bdf MIR 2025-01-05 2024-07-01
bdf MIR1 2024-11-29 2024-12-09
bdf RPP 2025-01-05 2024-11-19
cgedd nombre-vente-maison-appartement-ancien 2024-09-26 2024-09-26
insee CONSTRUCTION-LOGEMENTS 2025-01-07 2025-01-05
insee ENQ-CONJ-ART-BAT 2025-01-07 2025-01-05
insee ENQ-CONJ-IND-BAT 2025-01-07 2025-01-05
insee ENQ-CONJ-PROMO-IMMO 2025-01-07 2025-01-05
insee ENQ-CONJ-TP 2025-01-07 2025-01-05
insee ILC-ILAT-ICC 2025-01-05 2025-01-05
insee INDICES_LOYERS 2025-01-05 2025-01-05
insee IPLA-IPLNA-2015 2025-01-05 2025-01-05
insee IRL 2025-01-05 2025-01-05
insee PARC-LOGEMENTS 2025-01-05 2023-12-03
insee SERIES_LOYERS 2025-01-05 2025-01-05
insee t_dpe_val 2025-01-05 2024-12-21
notaires arrdt 2025-01-05 2025-01-05
notaires dep 2025-01-05 2025-01-05

LAST_UPDATE

Code
`ILC-ILAT-ICC` %>%
  group_by(LAST_UPDATE) %>%
  summarise(Nobs = n()) %>%
  print_table_conditional()
LAST_UPDATE Nobs
2024-12-17 873

Last

Code
`ILC-ILAT-ICC` %>%
  group_by(TIME_PERIOD) %>%
  summarise(Nobs = n()) %>%
  arrange(desc(TIME_PERIOD)) %>%
  head(1) %>%
  print_table_conditional()
TIME_PERIOD Nobs
2024-Q3 6

INDICATEUR

Code
`ILC-ILAT-ICC` %>%
  left_join(INDICATEUR, by = "INDICATEUR") %>%
  group_by(INDICATEUR, Indicateur) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  print_table_conditional()
INDICATEUR Indicateur Nobs
ICC Indice du coût de la construction (ICC) 565
ILAT Indice des loyers et des activités tertiaires (ILAT) 154
ILC Indice des loyers commerciaux (ILC) 154

BASIND

Code
`ILC-ILAT-ICC` %>%
  left_join(BASIND, by = "BASIND") %>%
  group_by(BASIND, Basind) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  print_table_conditional()
BASIND Basind Nobs
1953-T4 4ème trimestre de 1953 284
1954-T3 3ème trimestre de 1954 281
SO Sans objet 150
2008-T1 1er trimestre de 2008 79
2010-T1 1er trimestre de 2010 79

NATURE

Code
`ILC-ILAT-ICC` %>%
  left_join(NATURE, by = "NATURE") %>%
  group_by(NATURE, Nature) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  print_table_conditional()
NATURE Nature Nobs
INDICE Indice 442
MOYENNE_INDICES Moyenne des quatre dernières observations 281
VARIATIONS_A Variations annuelles 150

TITLE_FR

Code
`ILC-ILAT-ICC` %>%
  group_by(IDBANK, TITLE_FR) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  print_table_conditional()
IDBANK TITLE_FR Nobs
000008630 Indice du coût de la construction des immeubles à usage d'habitation (ICC) 284
000604030 Indice du coût de la construction des immeubles à usage d'habitation (ICC) - Moyenne des 4 derniers indices 281
001532540 Indice des loyers commerciaux (ILC) - Base 100 au 1er trimestre 2008 79
001617112 Indice des loyers des activités tertiaires (ILAT) - Base 100 au 1er trimestre 2010 79
001532541 Indice des loyers commerciaux (ILC) - Variation annuelle 75
001617113 Indice des loyers des activités tertiaires (ILAT) - Variation annuelle 75

ILAT, ILC

Indice

All

Code
`ILC-ILAT-ICC` %>%
  filter(INDICATEUR %in% c("ILAT", "ILC"),
         NATURE == "INDICE") %>%
  quarter_to_date %>%
  ggplot(.) + theme_minimal() + ylab("") + xlab("") +
  geom_line(aes(x = date, y = OBS_VALUE, color = TITLE_FR)) +
  theme(legend.title = element_blank(),
        legend.position = c(0.4, 0.92)) +
  
  scale_x_date(breaks = seq(1950, 2100, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 200, 5))

2017-

Code
`ILC-ILAT-ICC` %>%
  filter(INDICATEUR %in% c("ILAT", "ILC"),
         NATURE == "INDICE") %>%
  quarter_to_date %>%
  filter(date >= as.Date("2017-01-01")) %>%
  ggplot(.) + theme_minimal() + ylab("") + xlab("") +
  geom_line(aes(x = date, y = OBS_VALUE, color = TITLE_FR)) +
  theme(legend.title = element_blank(),
        legend.position = c(0.4, 0.92)) +
  
  scale_x_date(breaks = seq(1950, 2100, 1) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = seq(0, 200, 5))

2021-

Code
`ILC-ILAT-ICC` %>%
  filter(INDICATEUR %in% c("ILAT", "ILC"),
         NATURE == "INDICE") %>%
  quarter_to_date %>%
  filter(date >= as.Date("2021-01-01")) %>%
  ggplot(.) + theme_minimal() + ylab("") + xlab("") +
  geom_line(aes(x = date, y = OBS_VALUE, color = TITLE_FR)) +
  theme(legend.title = element_blank(),
        legend.position = c(0.4, 0.92)) +
  
  scale_x_date(breaks = "3 months",
               labels = date_format("%Y %b")) +
  scale_y_log10(breaks = seq(0, 200, 2))

Variation annuelle

Code
`ILC-ILAT-ICC` %>%
  filter(INDICATEUR %in% c("ILAT", "ILC"),
         NATURE == "VARIATIONS_A") %>%
  quarter_to_date %>%
  ggplot(.) + theme_minimal() + ylab("") + xlab("") +
  geom_line(aes(x = date, y = OBS_VALUE/100, color = TITLE_FR)) +
  theme(legend.title = element_blank(),
        legend.position = c(0.55, 0.92)) +
  
  scale_x_date(breaks = seq(1950, 2100, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = 0.01*seq(-200, 200, .5),
                     labels = percent_format(acc = .1))

Indice du coût de la construction (ICC) - ICC

Indice

All

Code
`ILC-ILAT-ICC` %>%
  filter(INDICATEUR %in% c("ICC")) %>%
  left_join(NATURE, by = "NATURE") %>%
  quarter_to_date %>%
  ggplot(.) + theme_minimal() + ylab("") + xlab("") +
  geom_line(aes(x = date, y = OBS_VALUE, color = Nature)) +
  theme(legend.title = element_blank(),
        legend.position = c(0.4, 0.92)) +
  
  scale_x_date(breaks = seq(1950, 2100, 10) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 30000, 20))

1990-

Code
`ILC-ILAT-ICC` %>%
  filter(INDICATEUR %in% c("ICC")) %>%
  left_join(NATURE, by = "NATURE") %>%
  quarter_to_date %>%
  filter(date >= as.Date("1990-01-01")) %>%
  arrange(date) %>%
  mutate(OBS_VALUE = 100*OBS_VALUE/OBS_VALUE[1]) %>%
  ggplot(.) + theme_minimal() + ylab("") + xlab("") +
  geom_line(aes(x = date, y = OBS_VALUE, color = Nature)) +
  theme(legend.title = element_blank(),
        legend.position = c(0.4, 0.92)) +
  
  scale_x_date(breaks = seq(1950, 2100, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 30000, 10))

1995-

Code
`ILC-ILAT-ICC` %>%
  filter(INDICATEUR %in% c("ICC")) %>%
  left_join(NATURE, by = "NATURE") %>%
  quarter_to_date %>%
  filter(date >= as.Date("1995-01-01")) %>%
  arrange(date) %>%
  mutate(OBS_VALUE = 100*OBS_VALUE/OBS_VALUE[1]) %>%
  ggplot(.) + theme_minimal() + ylab("") + xlab("") +
  geom_line(aes(x = date, y = OBS_VALUE, color = Nature)) +
  theme(legend.title = element_blank(),
        legend.position = c(0.4, 0.92)) +
  
  scale_x_date(breaks = seq(1950, 2100, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 30000, 10))

1998-

Code
`ILC-ILAT-ICC` %>%
  filter(INDICATEUR %in% c("ICC")) %>%
  left_join(NATURE, by = "NATURE") %>%
  quarter_to_date %>%
  filter(date >= as.Date("1998-01-01")) %>%
  arrange(date) %>%
  mutate(OBS_VALUE = 100*OBS_VALUE/OBS_VALUE[1]) %>%
  ggplot(.) + theme_minimal() + ylab("") + xlab("") +
  geom_line(aes(x = date, y = OBS_VALUE, color = Nature)) +
  theme(legend.title = element_blank(),
        legend.position = c(0.4, 0.92)) +
  
  scale_x_date(breaks = seq(1950, 2100,2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 30000, 10))

2000-

Code
`ILC-ILAT-ICC` %>%
  filter(INDICATEUR %in% c("ICC")) %>%
  left_join(NATURE, by = "NATURE") %>%
  quarter_to_date %>%
  filter(date >= as.Date("2000-01-01")) %>%
  arrange(date) %>%
  mutate(OBS_VALUE = 100*OBS_VALUE/OBS_VALUE[1]) %>%
  ggplot(.) + theme_minimal() + ylab("") + xlab("") +
  geom_line(aes(x = date, y = OBS_VALUE, color = Nature)) +
  theme(legend.title = element_blank(),
        legend.position = c(0.4, 0.92)) +
  
  scale_x_date(breaks = seq(1950, 2100,2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 30000, 10))

2015-

Code
`ILC-ILAT-ICC` %>%
  filter(INDICATEUR %in% c("ICC")) %>%
  left_join(NATURE, by = "NATURE") %>%
  quarter_to_date %>%
  filter(date >= as.Date("2015-01-01")) %>%
  arrange(date) %>%
  mutate(OBS_VALUE = 100*OBS_VALUE/OBS_VALUE[1]) %>%
  ggplot(.) + theme_minimal() + ylab("") + xlab("") +
  geom_line(aes(x = date, y = OBS_VALUE, color = Nature)) +
  theme(legend.title = element_blank(),
        legend.position = c(0.4, 0.92)) +
  
  scale_x_date(breaks = seq(1950, 2100, 1) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_log10(breaks = seq(0, 30000, 2))

2021-

Code
`ILC-ILAT-ICC` %>%
  filter(INDICATEUR %in% c("ICC")) %>%
  left_join(NATURE, by = "NATURE") %>%
  quarter_to_date %>%
  filter(date >= as.Date("2021-01-01")) %>%
  arrange(date) %>%
  mutate(OBS_VALUE = 100*OBS_VALUE/OBS_VALUE[1]) %>%
  ggplot(.) + theme_minimal() + ylab("") + xlab("") +
  geom_line(aes(x = date, y = OBS_VALUE, color = Nature)) +
  theme(legend.title = element_blank(),
        legend.position = c(0.4, 0.92)) +
  
  scale_x_date(breaks = "3 months",
               labels = date_format("%b %Y")) +
  scale_y_log10(breaks = seq(0, 30000, 2))

Variation annuelle

1990-

Code
`ILC-ILAT-ICC` %>%
  filter(INDICATEUR %in% c("ICC")) %>%
  left_join(NATURE, by = "NATURE") %>%
  quarter_to_date %>%
  filter(date >= as.Date("1990-01-01")) %>%
  arrange(date) %>%
  group_by(NATURE) %>%
  mutate(OBS_VALUE = OBS_VALUE/lag(OBS_VALUE, 4)-1) %>%
  ggplot(.) + theme_minimal() + ylab("") + xlab("") +
  geom_line(aes(x = date, y = OBS_VALUE, color = Nature)) +
  theme(legend.title = element_blank(),
        legend.position = c(0.4, 0.92)) +
  
  scale_x_date(breaks = seq(1950, 2100, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = 0.01*seq(-200, 200, 2),
                     labels = percent_format(acc = 1))

2000-

Code
`ILC-ILAT-ICC` %>%
  filter(INDICATEUR %in% c("ICC")) %>%
  left_join(NATURE, by = "NATURE") %>%
  quarter_to_date %>%
  arrange(date) %>%
  group_by(NATURE) %>%
  mutate(OBS_VALUE = OBS_VALUE/lag(OBS_VALUE, 4)-1) %>%
  filter(date >= as.Date("2000-01-01")) %>%
  ggplot(.) + theme_minimal() + ylab("Variation annuelle de l'ICC \n(Indice du Coût de la Construction)") + xlab("") +
  geom_line(aes(x = date, y = OBS_VALUE, color = Nature)) +
  theme(legend.title = element_blank(),
        legend.position = c(0.4, 0.92)) +
  geom_vline(xintercept = as.Date("2006-01-01"), linetype = "dashed") +
  geom_vline(xintercept = as.Date("2008-01-01"), linetype = "dashed") +
  
  scale_x_date(breaks = seq(1950, 2100, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = 0.01*seq(-200, 200, 1),
                     labels = percent_format(acc = 1))

2008-

Code
`ILC-ILAT-ICC` %>%
  filter(INDICATEUR %in% c("ICC")) %>%
  left_join(NATURE, by = "NATURE") %>%
  quarter_to_date %>%
  arrange(date) %>%
  group_by(NATURE) %>%
  mutate(OBS_VALUE = OBS_VALUE/lag(OBS_VALUE, 4)-1) %>%
  filter(date >= as.Date("2008-01-01")) %>%
  ggplot(.) + theme_minimal() + ylab("Variation annuelle de l'ICC \n(Indice du Coût de la Construction)") + xlab("") +
  geom_line(aes(x = date, y = OBS_VALUE, color = Nature)) +
  theme(legend.title = element_blank(),
        legend.position = c(0.4, 0.92)) +
  
  scale_x_date(breaks = seq(1950, 2100, 2) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = 0.01*seq(-200, 200, 1),
                     labels = percent_format(acc = 1))