Velocity of M1 Money Stock (M1V)

Calculated as the ratio of quarterly nominal GDP (https://fred.stlouisfed.org/series/GDP) to the quarterly average of M1 money stock (https://fred.stlouisfed.org/series/M1SL).

indicator <-fredr_series_observations(series_id = "M1V",
        observation_start = as.Date("2010-01-01")) 

# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "blue4",size=1) +
  labs(title = "Velocity of M1 Money Stock (M1V)", 
       subtitle = str_glue("from {min(indicator$date)} through {max(indicator$date)}"),
       x="Quarterly", y="Ratio",
       caption = "Data source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego")+
    theme_economist()

indicator%>%
    hchart( type = "column",hcaes(x = date, y = value)) %>% hc_colors("steelblue") %>%
    hc_subtitle(text=str_glue("from {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
     hc_title(text = "Velocity of M1 Money Stock (M1V)",
             style = list(fontWeight = "bold", fontSize = "20px"),
             align = "center")  %>%
  hc_credits(enabled = TRUE,text = "Source: FRED Federal Reserve (CALEIH) _ Illustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Ratio")) %>%
   hc_add_theme(hc_theme_economist())
## Warning: `parse_quosure()` is deprecated as of rlang 0.2.0.
## Please use `parse_quo()` instead.
## This warning is displayed once per session.
## Warning: `group_by_()` is deprecated as of dplyr 0.7.0.
## Please use `group_by()` instead.
## See vignette('programming') for more help
## This warning is displayed once every 8 hours.
## Call `lifecycle::last_warnings()` to see where this warning was generated.
## Warning: `select_()` is deprecated as of dplyr 0.7.0.
## Please use `select()` instead.
## This warning is displayed once every 8 hours.
## Call `lifecycle::last_warnings()` to see where this warning was generated.
## Warning: `as_data_frame()` is deprecated as of tibble 2.0.0.
## Please use `as_tibble()` instead.
## The signature and semantics have changed, see `?as_tibble`.
## This warning is displayed once every 8 hours.
## Call `lifecycle::last_warnings()` to see where this warning was generated.

Velocity of M2 Money Stock (M2V)

indicator <-fredr_series_observations(series_id = "M2V",
        observation_start = as.Date("2010-01-01")) 

# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "red4",size=1) +
  labs(title = "Velocity of M2 Money Stock (M2V)", 
       subtitle = str_glue("from {min(indicator$date)} through {max(indicator$date)}"),
       x="Quarterly", y="Ration",
       caption = "Data source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego")+
    theme_economist()

indicator%>%
    hchart( type = "column",hcaes(x = date, y = value)) %>% hc_colors("steelblue") %>%
    hc_subtitle(text=str_glue("from {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
     hc_title(text = "Velocity of M2 Money Stock (M2V)",
             style = list(fontWeight = "bold", fontSize = "20px"),
             align = "center")  %>%
  hc_credits(enabled = TRUE,text = "Source: FRED Federal Reserve (CALEIH) _ Illustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Ratio")) %>%
   hc_add_theme(hc_theme_economist())

Total Assets (Less Eliminations from Consolidation): Wednesday Level (WALCL)

indicator <-fredr_series_observations(series_id = "WALCL",
        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 Assets (Less Eliminations from Consolidation)", 
       subtitle = str_glue("from {min(indicator$date)} through {max(indicator$date)}"),
       x="Quarterly", y="Ratio",
       caption = "Data source: FRED Federal Reserve. Illustration by @JoeLongSanDiego")+
    theme_economist()

Assets: U.S. Treasury Securities: (WSHOBL)

indicator <-fredr_series_observations(series_id = "WSHOBL",
        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 = "U.S. Treasury Securities held by Federal Reserve", 
       subtitle = str_glue("from {min(indicator$date)} through {max(indicator$date)}"),
       x="Weekly", y="Millions of dollars",
       caption = "Data source: FRED Federal Reserve. Illustration by @JoeLongSanDiego")+
    theme_economist()

Assets: Securities Held Outright: Mortgage-Backed Securities: Week Average (WMBSEC)

indicator <-fredr_series_observations(series_id = "WMBSEC",
        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 = "Mortgage-Backed Securities held by Federal Reserve", 
       subtitle = str_glue("from {min(indicator$date)} through {max(indicator$date)}"),
       x="Weekly", y="Millions of dollars",
       caption = "Data source: FRED Federal Reserve. Illustration by @JoeLongSanDiego")+
    theme_economist()

University of Michigan: Consumer Sentiment (UMCSENT)

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

# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "blue3",size=.8) +
  labs(title = "University of Michigan: Consumer Sentiment (UMCSENT)", 
       subtitle = str_glue("from {min(indicator$date)} through {max(indicator$date)}"),
       x="Weekly", y="Millions of dollars",
       caption = "Data source: FRED Federal Reserve\nIllustration by @JoeLongSanDiego")+
    theme_economist()