Risk Assessment Indicators
Data - ECB
Info
- Data Structure Definition. (DSD) html
Data on monetary policy
source | dataset | .html | .RData |
---|---|---|---|
bdf | FM | 2024-12-28 | 2024-12-28 |
bdf | MIR | 2024-07-26 | 2024-07-01 |
bdf | MIR1 | 2024-11-29 | 2024-12-09 |
bis | CBPOL | 2024-12-19 | 2024-12-29 |
ecb | BSI | 2024-12-29 | 2024-11-19 |
ecb | BSI_PUB | 2024-12-29 | 2024-12-29 |
ecb | FM | 2024-12-29 | 2024-12-29 |
ecb | ILM | 2024-12-29 | 2024-12-29 |
ecb | ILM_PUB | 2024-12-29 | 2024-09-10 |
ecb | liq_daily | 2024-12-29 | 2024-09-11 |
ecb | MIR | 2024-06-19 | 2024-12-29 |
ecb | RAI | 2024-12-28 | 2024-12-29 |
ecb | SUP | 2024-12-28 | 2024-12-29 |
ecb | YC | 2024-12-28 | 2024-11-19 |
ecb | YC_PUB | 2024-12-28 | 2024-12-29 |
eurostat | ei_mfir_m | 2024-12-28 | 2024-12-28 |
eurostat | irt_st_m | 2024-12-28 | 2024-12-29 |
fred | r | 2024-12-29 | 2024-12-29 |
oecd | MEI | 2024-04-16 | 2024-06-30 |
oecd | MEI_FIN | 2024-09-15 | 2024-12-22 |
Data on interest rates
source | dataset | .html | .RData |
---|---|---|---|
bdf | FM | 2024-12-28 | 2024-12-28 |
bdf | MIR | 2024-07-26 | 2024-07-01 |
bdf | MIR1 | 2024-11-29 | 2024-12-09 |
bis | CBPOL_D | 2024-12-28 | 2024-05-10 |
bis | CBPOL_M | 2024-12-28 | 2024-04-19 |
ecb | FM | 2024-12-29 | 2024-12-29 |
ecb | MIR | 2024-06-19 | 2024-12-29 |
eurostat | ei_mfir_m | 2024-12-28 | 2024-12-28 |
eurostat | irt_lt_mcby_d | 2024-12-28 | 2024-12-28 |
eurostat | irt_st_m | 2024-12-28 | 2024-12-29 |
fred | r | 2024-12-29 | 2024-12-29 |
oecd | MEI | 2024-04-16 | 2024-06-30 |
oecd | MEI_FIN | 2024-09-15 | 2024-12-22 |
wdi | FR.INR.RINR | 2024-12-28 | 2024-12-28 |
LAST_COMPILE
LAST_COMPILE |
---|
2024-12-29 |
Last
TIME_PERIOD | FREQ | Nobs |
---|---|---|
2024-Q3 | Q | 116 |
2024-10 | M | 366 |
DD_ECON_CONCEPT
Code
%>%
RAI left_join(DD_ECON_CONCEPT, by = "DD_ECON_CONCEPT") %>%
group_by(DD_ECON_CONCEPT, Dd_econ_concept) %>%
summarise(Nobs = n()) %>%
arrange(-Nobs) %>%
print_table_conditional()
DD_ECON_CONCEPT | Dd_econ_concept | Nobs |
---|---|---|
LMGBLNFCH | Lending margin on new business loans to non-financial corporations and households | 7923 |
LMGOLNFCH | Lending margin on outstanding loans to non-financial corporations and households | 7900 |
IBL1TL | Share of interbank loans in total loans | 7865 |
LEVR | Leverage ratio | 7794 |
NDEPFUN | Non-deposit funding | 7722 |
CT1DGGV | Share of other MFIs credit to domestic general government in total assets, excluding remaining assets | 7523 |
LC1DHHS | Share of other MFIs loans to domestic households for house purchase in total credit to other domestic residents | 7446 |
SVLHPHH | Share of new loans to households for house purchase with a floating rate or an initial rate fixation period of up to one year in total new loans from MFIs to households | 6987 |
SVLHHNFC | Share of new loans with a floating rate or an initial rate fixation period of up to one year in total new loans from MFIs to households and non-financial corporations | 6718 |
LMGLHH | MFIs lending margins on loans for house purchase | 6625 |
LMGLNFC | MFIs lending margins on loans to non-financial corporations (NFC) | 6625 |
ST1TMF | Share of short-term funding in total market funding | 6009 |
GRNLHHNFC | Annual growth rate of MFIs new loans to households and non-financial corporations | 5931 |
MMTCH | Maturity mismatch | 5401 |
FXL1TL | Share of other MFI FX loans in total loans (excluding inter-MFI loans) | 2624 |
LTD | Loans to deposits ratio | 2577 |
LA1STL | Share of liquid assets in short term liabilities | 2177 |
OTHOFI1 | Total assets of other financial institutions (OFIs) excluding financial vehicle corporations (FVCs), outstanding amounts at the end of the period (stocks) | 1798 |
OTHOFI4 | Total assets of other financial institutions (OFIs) excluding financial vehicle corporations (FVCs), financial transactions (flows) | 1796 |
SVLOAHH | NA | 1566 |
SVLOANFC | NA | 1566 |
IFOFI1 | Total assets of MMF and non-MMF investment funds and other financial institutions (OFIs), outstanding amounts at the end of the period (stocks) | 270 |
IFOFI4 | Total assets of MMF and non-MMF investment funds and other financial institutions (OFIs), financial transactions (flows) | 270 |
CRED1 | Credit institutions (MFIs excluding the ESCB and MMFs), outstanding amounts at the end of the period (stocks) | 182 |
CREDA | Growth rate of total assets of credit institutions (MFIs excluding the ESCB and MMFs) | 174 |
ICPFA | Growth rate of total assets of insurance corporations and pension funds | 172 |
IFOFIA | Growth rate of total assets of MMF and non-MMF investment funds and other financial institutions (OFIs) | 172 |
DD_SUFFIX
Code
%>%
RAI left_join(DD_SUFFIX, by = "DD_SUFFIX") %>%
group_by(DD_SUFFIX, Dd_suffix) %>%
summarise(Nobs = n()) %>%
arrange(-Nobs) %>%
print_table_conditional()
DD_SUFFIX | Dd_suffix | Nobs |
---|---|---|
Z | Not applicable | 106873 |
E | Euro | 4316 |
P10 | Currency ratio on total currency | 2624 |
SOURCE_DATA
Code
%>%
RAI left_join(SOURCE_DATA, by = "SOURCE_DATA") %>%
group_by(SOURCE_DATA, Source_data) %>%
summarise(Nobs = n()) %>%
arrange(-Nobs) %>%
print_table_conditional()
SOURCE_DATA | Source_data | Nobs |
---|---|---|
BSI | Based on BSI data | 60626 |
MIR | Based on MIR data | 48709 |
QSA | Based on quarterly sector accounts data | 4306 |
ICPF | Based on ICPF data | 172 |
DD_SUFFIX
Code
%>%
RAI left_join(DD_SUFFIX, by = "DD_SUFFIX") %>%
group_by(DD_SUFFIX, Dd_suffix) %>%
summarise(Nobs = n()) %>%
arrange(-Nobs) %>%
print_table_conditional()
DD_SUFFIX | Dd_suffix | Nobs |
---|---|---|
Z | Not applicable | 106873 |
E | Euro | 4316 |
P10 | Currency ratio on total currency | 2624 |
FREQ
Code
%>%
RAI left_join(FREQ, by = "FREQ") %>%
group_by(FREQ, Freq) %>%
summarise(Nobs = n()) %>%
arrange(-Nobs) %>%
print_table_conditional()
FREQ | Freq | Nobs |
---|---|---|
M | Monthly | 98469 |
Q | Quarterly | 15344 |
REF_AREA
Code
%>%
RAI left_join(REF_AREA, by = "REF_AREA") %>%
group_by(REF_AREA, Ref_area) %>%
summarise(Nobs = n()) %>%
arrange(-Nobs) %>%
mutate(Flag = gsub(" ", "-", str_to_lower(gsub(" ", "-", Ref_area))),
Flag = paste0('<img src="../../icon/flag/vsmall/', Flag, '.png" alt="Flag">')) %>%
select(Flag, everything()) %>%
if (is_html_output()) datatable(., filter = 'top', rownames = F, escape = F) else .} {
Table: Average 2016-2022
Code
%>%
RAI filter(FREQ == "M") %>%
left_join(REF_AREA, by = "REF_AREA") %>%
left_join(DD_ECON_CONCEPT, by = "DD_ECON_CONCEPT") %>%
%>%
month_to_date filter(date >= as.Date("2016-01-01")) %>%
group_by(DD_ECON_CONCEPT, Dd_econ_concept, REF_AREA, Ref_area) %>%
summarise(OBS_VALUE = mean(OBS_VALUE),
Nobs = n()) %>%
print_table_conditional()
France
Table
Code
%>%
RAI filter(FREQ == "M",
%in% c("FR", "U2")) %>%
REF_AREA select_if(~ n_distinct(.) > 1) %>%
left_join(REF_AREA, by = "REF_AREA") %>%
group_by(DD_ECON_CONCEPT, Ref_area) %>%
filter(TIME_PERIOD == max(TIME_PERIOD)) %>%
left_join(DD_ECON_CONCEPT, by = "DD_ECON_CONCEPT") %>%
select(Ref_area, DD_ECON_CONCEPT, OBS_VALUE) %>%
spread(Ref_area, OBS_VALUE) %>%
arrange(-`France`) %>%
print_table_conditional()
DD_ECON_CONCEPT | Euro area (Member States and Institutions of the Euro Area) changing composition | France |
---|---|---|
MMTCH | 76.280995 | 77.4975287 |
ST1TMF | 67.183436 | 76.0626582 |
SVLHHNFC | 63.355829 | 41.2072859 |
LC1DHHS | NA | 37.2657108 |
IBL1TL | 23.335726 | 35.7373371 |
NDEPFUN | 15.310631 | 16.2601517 |
LEVR | 8.314453 | 7.0913574 |
SVLHPHH | 14.613695 | 4.2515295 |
CT1DGGV | NA | 4.1117422 |
LMGLNFC | NA | 1.1712065 |
LMGBLNFCH | NA | 0.8567785 |
LMGLHH | NA | 0.0401372 |
LMGOLNFCH | NA | -0.3805586 |
GRNLHHNFC | NA | -6.8548724 |
SVLHHNFC, LC1DHHS
Code
%>%
RAI filter(DD_ECON_CONCEPT %in% c("SVLHHNFC", "LC1DHHS"),
%in% c("FR", "U2")) %>%
REF_AREA left_join(REF_AREA, by = "REF_AREA") %>%
left_join(DD_ECON_CONCEPT, by = "DD_ECON_CONCEPT") %>%
%>%
month_to_date select_if(~n_distinct(.) > 1) %>%
mutate(Ref_area = ifelse(REF_AREA == "U2", "Europe", Ref_area)) %>%
left_join(colors, by = c("Ref_area" = "country")) %>%
mutate(OBS_VALUE = OBS_VALUE/100) %>%
ggplot(.) + theme_minimal() + xlab("") + ylab("Share of variable rate") +
geom_line(aes(x = date, y = OBS_VALUE, color = color, linetype = Dd_econ_concept)) +
add_flags(3) + scale_color_identity() +
scale_x_date(breaks = seq(1960, 2030, 2) %>% paste0("-01-01") %>% as.Date,
labels = date_format("%Y")) +
theme(legend.position = c(0.7, 0.9),
legend.title = element_blank()) +
scale_y_continuous(breaks = 0.01*seq(-10, 100, 5),
labels = percent_format(accuracy = 1))
CT1DGGV, SVLHPHH
Code
%>%
RAI filter(DD_ECON_CONCEPT %in% c("CT1DGGV", "SVLHPHH"),
%in% c("FR", "U2")) %>%
REF_AREA left_join(REF_AREA, by = "REF_AREA") %>%
left_join(DD_ECON_CONCEPT, by = "DD_ECON_CONCEPT") %>%
%>%
month_to_date select_if(~n_distinct(.) > 1) %>%
mutate(Ref_area = ifelse(REF_AREA == "U2", "Europe", Ref_area)) %>%
left_join(colors, by = c("Ref_area" = "country")) %>%
mutate(OBS_VALUE = OBS_VALUE/100) %>%
ggplot(.) + theme_minimal() + xlab("") + ylab("Share of variable rate") +
geom_line(aes(x = date, y = OBS_VALUE, color = color, linetype = Dd_econ_concept)) +
add_flags(3) + scale_color_identity() +
scale_x_date(breaks = seq(1960, 2030, 2) %>% paste0("-01-01") %>% as.Date,
labels = date_format("%Y")) +
theme(legend.position = c(0.7, 0.9),
legend.title = element_blank()) +
scale_y_continuous(breaks = 0.01*seq(-10, 100, 5),
labels = percent_format(accuracy = 1))