Real interest rate (%)

Data - WDI

Info

source dataset .html .RData

wdi

FR.INR.RINR

2024-01-06 2024-08-28

Data on interest rates

source dataset .html .RData

bdf

FM

2024-07-26 2024-06-18

bdf

MIR

2024-07-26 2024-07-01

bdf

MIR1

2024-07-26 2024-07-01

bis

CBPOL_D

2024-08-09 2024-05-10

bis

CBPOL_M

2024-08-09 2024-04-19

ecb

FM

2024-08-22 2024-08-22

ecb

MIR

2024-06-19 2024-07-26

eurostat

ei_mfir_m

2024-08-28 2024-08-28

eurostat

irt_lt_mcby_d

2024-08-28 2024-08-28

eurostat

irt_st_m

2024-08-28 2024-08-28

fred

r

2024-08-28 2024-08-28

oecd

MEI

2024-04-16 2024-06-30

oecd

MEI_FIN

2024-07-01 2024-05-21

wdi

FR.INR.RINR

2024-01-06 2024-08-28

LAST_COMPILE

LAST_COMPILE
2024-08-28

Last

Code
FR.INR.RINR %>%
  group_by(year) %>%
  summarise(Nobs = n()) %>%
  arrange(desc(year)) %>%
  head(1) %>%
  print_table_conditional()
year Nobs
2023 84

Nobs - Javascript

Code
FR.INR.RINR %>%
  left_join(iso2c, by = "iso2c") %>%
  group_by(iso2c, Iso2c) %>%
  rename(value = `FR.INR.RINR`) %>%
  mutate(value = round(value, 2)) %>%
  summarise(Nobs = n(),
            `Year 1` = first(year),
            `Real interest rate 1` = first(value) %>% paste0(" %"),
            `Year 2` = last(year),
            `Real interest rate 2` = last(value) %>% paste0(" %")) %>%
  arrange(-Nobs) %>%
  {if (is_html_output()) datatable(., filter = 'top', rownames = F) else .}

Periods of Low Real interest rate

Code
FR.INR.RINR %>%
  filter(`FR.INR.RINR` < 0) %>%
  arrange(`FR.INR.RINR`) %>%
  mutate(`FR.INR.RINR` = round(`FR.INR.RINR`, 2)) %>%
  left_join(iso2c, by = "iso2c") %>%
  select(iso2c, Iso2c, year, `FR.INR.RINR`) %>%
  {if (is_html_output()) datatable(., filter = 'top', rownames = F) else .}

France, Italy, Germany

Code
FR.INR.RINR %>%
  filter(iso2c %in% c("FR", "DE", "IT")) %>%
  left_join(iso2c, by = "iso2c") %>%
  year_to_enddate() %>%
  ggplot(.) + geom_line() + theme_minimal() + 
  aes(x = date, y = FR.INR.RINR/100, color = Iso2c, linetype = Iso2c) + 
  xlab("") + ylab("Real interest rate") +
  scale_color_manual(values = viridis(4)[1:3]) +
  theme(legend.title = element_blank(),
        legend.position = c(0.85, 0.85)) +
  scale_x_date(breaks = seq(1900, 2020, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = 0.01*seq(-100, 10000, 2),
                     labels = percent_format(a = 1)) + 
  geom_hline(yintercept = 0, linetype = "dashed", color = "grey")

Denmark, Netherlands, Sweden

Code
FR.INR.RINR %>%
  filter(iso2c %in% c("DK", "SE", "NL")) %>%
  left_join(iso2c, by = "iso2c") %>%
  year_to_enddate() %>%
  ggplot(.) + geom_line() + theme_minimal() + 
  aes(x = date, y = FR.INR.RINR/100, color = Iso2c, linetype = Iso2c) + 
  xlab("") + ylab("Real interest rate") +
  scale_color_manual(values = viridis(4)[1:3]) +
  theme(legend.title = element_blank(),
        legend.position = c(0.85, 0.85)) +
  scale_x_date(breaks = seq(1900, 2020, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = 0.01*seq(-100, 10000, 2),
                     labels = percent_format(a = 1)) + 
  geom_hline(yintercept = 0, linetype = "dashed", color = "grey")

United States, United Kingdom, Japan

Code
FR.INR.RINR %>%
  filter(iso2c %in% c("JP", "US", "GB")) %>%
  left_join(iso2c, by = "iso2c") %>%
  year_to_enddate() %>%
  ggplot(.) + geom_line() + theme_minimal() + 
  aes(x = date, y = FR.INR.RINR/100, color = Iso2c, linetype = Iso2c) + 
  xlab("") + ylab("Real interest rate") +
  scale_color_manual(values = viridis(4)[1:3]) +
  theme(legend.title = element_blank(),
        legend.position = c(0.85, 0.85)) +
  scale_x_date(breaks = seq(1900, 2020, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = 0.01*seq(-100, 10000, 2),
                     labels = percent_format(a = 1)) + 
  geom_hline(yintercept = 0, linetype = "dashed", color = "grey")

Argentina

1996-2005

Code
FR.INR.RINR %>%
  year_to_enddate() %>%
  filter(iso2c == "AR",
         date >= as.Date("1996-01-01"),
         date <= as.Date("2005-01-01")) %>%
  ggplot(.) + geom_line() + theme_minimal() + 
  aes(x = date, y = FR.INR.RINR/100) + xlab("") + ylab("Real interest rate") +
  scale_x_date(breaks = seq(1900, 2020, 1) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = 0.01*seq(-100, 10000, 5),
                     labels = percent_format(a = 1)) + 
  geom_hline(yintercept = 0, linetype = "dashed", color = "grey")

1996-2020

Code
FR.INR.RINR %>%
  year_to_enddate() %>%
  filter(iso2c == "AR",
         date >= as.Date("1996-01-01"),
         date <= as.Date("2020-01-01")) %>%
  ggplot(.) + geom_line() + theme_minimal() + 
  aes(x = date, y = FR.INR.RINR/100) + xlab("") + ylab("Real interest rate") +
  scale_x_date(breaks = seq(1900, 2020, 1) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = 0.01*seq(-100, 10000, 5),
                     labels = percent_format(a = 1)) + 
  geom_hline(yintercept = 0, linetype = "dashed", color = "grey")

China

Code
FR.INR.RINR %>%
  filter(iso2c == "CN") %>%
  year_to_enddate() %>%
  ggplot(.) + geom_line() + theme_minimal() + 
  aes(x = date, y = FR.INR.RINR/100) + xlab("") + ylab("Real interest rate") +
  scale_x_date(breaks = seq(1900, 2020, 5) %>% paste0("-01-01") %>% as.Date,
               labels = date_format("%Y")) +
  scale_y_continuous(breaks = 0.01*seq(-100, 10000, 5),
                     labels = percent_format(a = 1)) + 
  geom_hline(yintercept = 0, linetype = "dashed", color = "grey")