Total Consumer Credit Owned and Securitized

indicator <-fredr_series_observations(series_id = "TOTALNS",
        observation_start = as.Date("2019-01-01")) 

# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "blue4",size=1) +
  labs(title = "Total Consumer Credit Owned and Securitized, Outstanding", 
       subtitle = str_glue("from {min(indicator$date)} through {max(indicator$date)}"),
       x="Monthly", y="Billions of Dollars",
       caption = "Data source: FRED Federal Reserve. Illustration by @JoeLongSanDiego")+
    theme_economist()

Student Loans Owned and Securitized

indicator <-fredr_series_observations(series_id = "SLOAS",
        observation_start = as.Date("2019-01-01")) 

# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "red4",size=1) +
  labs(title = "Student Loans Owned and Securitized, Outstanding ", 
       subtitle = str_glue("from {min(indicator$date)} through {max(indicator$date)} _ Prior to COVID19 Pandemic"),
       x="Quarterly", y="Billions of Dollars",
       caption = "Data source: FRED Federal Reserve. Illustration by @JoeLongSanDiego")+
    theme_economist()

Motor Vehicle Loans Owned and Securitized

indicator <-fredr_series_observations(series_id = "MVLOAS",
        observation_start = as.Date("2000-01-01")) 

# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "red3",size=.8) +
  labs(title = "Motor Vehicle Loans Owned and Securitized, Outstanding ", 
       subtitle = str_glue("from {min(indicator$date)} through {max(indicator$date)} _ Prior to COVID19 Pandemic"),
       x="Quarterly", y="Billions of Dallars",
       caption = "Data source: FRED Federal Reserve. Illustration by @JoeLongSanDiego")+
    theme_economist()

Total Revolving Credit Owned and Securitized

indicator <-fredr_series_observations(series_id = "REVOLNS",
        observation_start = as.Date("2019-01-01")) 

# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "red3",size=.8) +
  labs(title = "Total Revolving Credit Owned and Securitized, Outstanding ", 
       subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Monthly", y="Millions of dollars",
       caption = "Data source: FRED Federal Reserve. Illustration by @JoeLongSanDiego")+
    theme_economist()

Total Consumer Loans Owned by Credit Unions

indicator <-fredr_series_observations(series_id = "TOTALTCU",
        observation_start = as.Date("2019-01-01")) 

# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "red3",size=.8) +
  labs(title = "Total Consumer Loans Owned by Credit Unions, Outstanding ", 
       subtitle = str_glue("from {min(indicator$date)} through {max(indicator$date)}"),
       x="Monthly", y="Billions of dollars",
       caption = "Data source: FRED Federal Reserve. Illustration by @JoeLongSanDiego")+
    theme_economist()

Commercial Bank Interest Rate on Credit Card Plans

indicator <-fredr_series_observations(series_id = "TERMCBCCALLNS",
        observation_start = as.Date("2000-01-01")) 
indicator <- na.omit(indicator)
# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "red3",size=.8) +
  labs(title = "Commercial Bank Interest Rate on Credit Card Plans", 
       subtitle = str_glue("from {min(indicator$date)} through {max(indicator$date)}  _ Prior to COVID19 Pandemic"),
       x="Monthly", y="Rate",
       caption = "Data source: FRED Federal Reserve. Illustration by @JoeLongSanDiego")+
    theme_economist()

Total Revolving Credit Owned and Securitized

indicator <-fredr_series_observations(series_id = "REVOLNS",
        observation_start = as.Date("2000-01-01")) 

# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "red3",size=.8) +
  labs(title = "Total Revolving Credit Owned and Securitized, Outstanding ", 
       subtitle = str_glue("from {min(indicator$date)} through {max(indicator$date)}  Prior to COVID19 Pandemic"),
       x="Monthly", y="Billions of Dollars",
       caption = "Data source: FRED Federal Reserve. Illustration by @JoeLongSanDiego")+
    theme_economist()

Delinquency Rate on Credit Card Loans

indicator <-fredr_series_observations(series_id = "DRCCLACBS",
        observation_start = as.Date("2000-01-01")) 

# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "red3",size=.8) +
  labs(title = "Delinquency Rate on Credit Card Loans, All Commercial Banks ", 
       subtitle = str_glue("from {min(indicator$date)} through {max(indicator$date)}         Prior to COVID19 Pandemic"),
       x="Quarterly", y="Percent",
       caption = "Data source: FRED Federal Reserve. Illustration by @JoeLongSanDiego")+
    theme_economist()

Delinquency Rate on Single-Family Residential Mortgages

indicator <-fredr_series_observations(series_id = "DRSFRMT100S",
        observation_start = as.Date("2000-01-01")) 

# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "red3",size=.8) +
  labs(title = "Delinquency Rate on Single-Family Residential Mortgages", 
       subtitle = str_glue("from {min(indicator$date)} through {max(indicator$date)}         Prior to COVID19 Pandemic"),
       x="Quarterly", y="Percent",
       caption = "Data source: FRED Federal Reserve. Illustration by @JoeLongSanDiego")+
    theme_economist()

Delinquency Rate on Consumer Loans

indicator <-fredr_series_observations(series_id = "DRCLT100S",
        observation_start = as.Date("2000-01-01")) 

# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "red3",size=.8) +
  labs(title = "Delinquency Rate on Consumer Loans", 
       subtitle = str_glue("from {min(indicator$date)} through {max(indicator$date)}         Prior to COVID19 Pandemic"),
       x="Quarterly", y="Percent",
       caption = "Data source: FRED Federal Reserve. Illustration by @JoeLongSanDiego")+
    theme_economist()