Funded Pensions Indicators - PNNI_NEW

Data - OECD


VAR

Code
PNNI_NEW %>%
  left_join(PNNI_NEW_var$VAR %>%
              setNames(c("VAR", "Var")), by = "VAR") %>%
  group_by(VAR, Var) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  {if (is_html_output()) datatable(., filter = 'top', rownames = F) else .}

PPTYP

Code
PNNI_NEW %>%
  left_join(PNNI_NEW_var$PPTYP %>%
              setNames(c("PPTYP", "Pptyp")), by = "PPTYP") %>%
  group_by(PPTYP, Pptyp) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  {if (is_html_output()) print_table(.) else .}
PPTYP Pptyp Nobs
APLANS Total, by pension plan type 752857
OCC Occupational pension plans 698459
PER Personal pension plans 421144
PER_EMPLYMT_LINKED Personal pension plans, to which access can be linked to employment or professional activity 53235
PER_NOT_EMPLYMT_LINKED Personal pension plans, to which access is not linked to employment or professional activity 50572

DTYP

Code
PNNI_NEW %>%
  left_join(PNNI_NEW_var$DTYP %>%
              setNames(c("DTYP", "Dtyp")), by = "DTYP") %>%
  group_by(DTYP, Dtyp) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  {if (is_html_output()) print_table(.) else .}
DTYP Dtyp Nobs
ADEF Total, by definition type 582281
DCU Defined contribution (unprotected) 478568
DCP Defined contribution (protected) 423784
DBH Defined benefit (hybrid/mixed) 254790
DB Defined benefit (traditional) 236844

IND

Code
PNNI_NEW %>%
  left_join(PNNI_NEW_var$IND %>%
              setNames(c("IND", "Ind")), by = "IND") %>%
  group_by(IND, Ind) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  {if (is_html_output()) datatable(., filter = 'top', rownames = F) else .}

CTYP

Code
PNNI_NEW %>%
  left_join(PNNI_NEW_var$CTYP %>%
              setNames(c("CTYP", "Ctyp")), by = "CTYP") %>%
  group_by(CTYP, Ctyp) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  {if (is_html_output()) print_table(.) else .}
CTYP Ctyp Nobs
PF Pension funds (autonomous) 436065
ACONT Total all funds 430532
PIC Pension insurance contracts 354734
INV Investment companies managed funds 291573
BANK Banks managed funds 288741
BR Book reserve (non-autonomous) 145274
OTHER Other 29348

COU

Code
PNNI_NEW %>%
  left_join(PNNI_NEW_var$COU %>%
              setNames(c("COU", "Cou")), by = "COU") %>%
  group_by(COU, Cou) %>%
  summarise(Nobs = n()) %>%
  arrange(-Nobs) %>%
  {if (is_html_output()) datatable(., filter = 'top', rownames = F) else .}

Table 1

Code
PNNI_NEW %>%
  filter(PPTYP == "APLANS",
         DTYP == "ADEF",
         CTYP == "PF",
         VAR == "1000",
         IND == "GDP",
         obsTime %in% c("2000", "2005", "2010", "2015")) %>%
  left_join(PNNI_NEW_var$COU %>%
              setNames(c("COU", "Cou")), by = "COU") %>%
  select(COU, Cou, obsTime, obsValue) %>%
  mutate(obsValue = round(obsValue, 1)) %>%
  spread(obsTime, obsValue) %>%
  arrange(-`2010`) %>%
  {if (is_html_output()) datatable(., filter = 'top', rownames = F) else .}