Retail Sales: Retail (Excluding Food Services) (MRTSMPCSM44000USN)

symbol <-fredr_series_observations(series_id = "MRTSMPCSM44000USN", 
      observation_start = as.Date("2000-01-01"))
      
indicator <-as.data.frame(symbol)[,c(1,3)]

tail(indicator,n=12) %>% kable() %>%
  kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
   column_spec(2:3, T, color = "blue" ) 
date value
239 2019-11-01 2.7
240 2019-12-01 11.3
241 2020-01-01 -20.0
242 2020-02-01 -0.8
243 2020-03-01 3.9
244 2020-04-01 -12.4
245 2020-05-01 22.5
246 2020-06-01 4.3
247 2020-07-01 2.5
248 2020-08-01 -0.7
249 2020-09-01 -3.0
250 2020-10-01 3.9
indicator   %>% 
    ggplot(aes(x = date, y = value)) +
   geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
                   fill = "white", alpha = 0.04)+ 
    geom_line(color = "dodgerblue4",size=.8) + 
    labs(
      x = "Monthly",
      y = "Percent Change from Preceding Period",
      title = "Retail Sales: Retail (Excluding Food Services) (MRTSMPCSM44000USN)",
      subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
      caption = "Data source: FRED St. Louis Federal Reserve \nIllustration by @JoeLongSanDiego") +
    theme_economist()

indicator2 <- filter(indicator,date >= "2019-01-01")


indicator2   %>% 
    ggplot(aes(x = date, y = value)) +
   geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
                   fill = "white", alpha = 0.04)+ 
    geom_line(color = "dodgerblue4",size=.8) + 
    geom_hline(yintercept = 0,color="red")+
    labs(
      x = "Monthly",
      y = "Percent Change from Preceding Period",
      title = "Retail Sales: Retail (Excluding Food Services) _ Short Term Trend",
      subtitle = str_glue("From {min(indicator2$date)} through {max(indicator2$date)}"), 
      caption = "Data source: FRED St. Louis Federal Reserve \nIllustration by @JoeLongSanDiego") +
    theme_economist()

Retail Sales: New Car Dealers (MRTSMPCSM44111USN)

symbol <-fredr_series_observations(series_id = "MRTSMPCSM44111USN", 
      observation_start = as.Date("2000-01-01"))
      
indicator <-as.data.frame(symbol)[,c(1,3)]

tail(indicator,n=12) %>% kable() %>%
  kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
   column_spec(2:3, T, color = "blue" ) 
date value
239 2019-11-01 -1.2
240 2019-12-01 5.0
241 2020-01-01 -13.0
242 2020-02-01 3.2
243 2020-03-01 -19.9
244 2020-04-01 -15.7
245 2020-05-01 55.1
246 2020-06-01 4.9
247 2020-07-01 3.7
248 2020-08-01 1.7
249 2020-09-01 -0.2
250 2020-10-01 1.9
indicator   %>% 
    ggplot(aes(x = date, y = value)) +
   geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
                   fill = "white", alpha = 0.04)+ 
    geom_line(color = "dodgerblue4",size=.8) + 
   geom_hline(yintercept = 0,color="red")+
    labs(
      x = "Monthly",
      y = "Percent Change from Preceding Period",
      title = " Retail Sales: New Car Dealers (MRTSMPCSM44111USN)",
      subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
      caption = "Data source: FRED St. Louis Federal Reserve \nIllustration by @JoeLongSanDiego") +
    theme_economist()

indicator2 <- filter(indicator,date >= "2019-01-01")


indicator2   %>% 
    ggplot(aes(x = date, y = value)) +
   geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
                   fill = "white", alpha = 0.04)+ 
    geom_line(color = "dodgerblue4",size=.8) + 
   geom_hline(yintercept = 0,color="red")+
    labs(
      x = "Monthly",
      y = "Percent Change from Preceding Period",
      title = "Retail Sales: New Car Dealers (MRTSMPCSM44111USN) _ Short Term Trend",
      subtitle = str_glue("From {min(indicator2$date)} through {max(indicator2$date)}"), 
      caption = "Data source: FRED St. Louis Federal Reserve \nIllustration by @JoeLongSanDiego") +
    theme_economist()

Retail Sales: New Car Dealers (MRTSSM44111USN)

symbol <-fredr_series_observations(series_id = "MRTSSM44111USN", 
      observation_start = as.Date("2000-01-01"))
      
indicator <-as.data.frame(symbol)[,c(1,3)]

tail(indicator,n=12) %>% kable() %>%
  kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
   column_spec(2:3, T, color = "blue" ) 
date value
239 2019-11-01 78496
240 2019-12-01 82445
241 2020-01-01 71757
242 2020-02-01 74033
243 2020-03-01 59312
244 2020-04-01 50003
245 2020-05-01 77564
246 2020-06-01 81358
247 2020-07-01 84406
248 2020-08-01 85823
249 2020-09-01 85648
250 2020-10-01 87345
indicator   %>% 
    ggplot(aes(x = date, y = value)) +
   geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
                   fill = "white", alpha = 0.04)+ 
    geom_line(color = "dodgerblue4",size=.8) + 
 
    labs(
      x = "Monthly",
      y = "Millions of Dollars",
      title = "Retail Sales: New Car Dealers (MRTSSM44111USN)",
      subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
      caption = "Data source: FRED St. Louis Federal Reserve \nIllustration by @JoeLongSanDiego") +
    theme_economist()

indicator2 <- filter(indicator,date >= "2015-01-01")


indicator2   %>% 
    ggplot(aes(x = date, y = value)) +
   geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
                   fill = "white", alpha = 0.04)+ 
    geom_line(color = "dodgerblue4",size=.8) + 
  
    labs(
      x = "Monthly",
      y = "Millions of Dollars",
      title = "Retail Sales: New Car Dealers (MRTSSM44111USN) _ Short Term Trend",
      subtitle = str_glue("From {min(indicator2$date)} through {max(indicator2$date)}"), 
      caption = "Data source: FRED St. Louis Federal Reserve \nIllustration by @JoeLongSanDiego") +
    theme_economist()

USED CAR MARKET

Retail Sales: Used Car Dealers (MRTSMPCSM44112USN)

symbol <-fredr_series_observations(series_id = "MRTSMPCSM44112USN", 
      observation_start = as.Date("2000-01-01"))
      
indicator <-as.data.frame(symbol)[,c(1,3)]

tail(indicator,n=12) %>% kable() %>%
  kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
   column_spec(2:3, T, color = "blue" ) 
date value
239 2019-11-01 -3.5
240 2019-12-01 -7.3
241 2020-01-01 3.5
242 2020-02-01 17.8
243 2020-03-01 -12.2
244 2020-04-01 -31.0
245 2020-05-01 64.4
246 2020-06-01 11.7
247 2020-07-01 3.8
248 2020-08-01 -1.3
249 2020-09-01 -9.3
250 2020-10-01 -1.3
indicator   %>% 
    ggplot(aes(x = date, y = value)) +
   geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
                   fill = "white", alpha = 0.04)+ 
    geom_line(color = "dodgerblue4",size=.8) + 
   geom_hline(yintercept = 0,color="red")+
    labs(
      x = "Monthly",
      y = "Percent Change from Preceding Period",
      title = "Retail Sales: Used Car Dealers (MRTSMPCSM44112USN)",
      subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
      caption = "Data source: FRED St. Louis Federal Reserve \nIllustration by @JoeLongSanDiego") +
    theme_economist()

indicator2 <- filter(indicator,date >= "2019-01-01")


indicator2   %>% 
    ggplot(aes(x = date, y = value)) +
   geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
                   fill = "white", alpha = 0.04)+ 
    geom_line(color = "dodgerblue4",size=.8) + 
   geom_hline(yintercept = 0,color="red")+
    labs(
      x = "Monthly",
      y = "Percent Change from Preceding Period",
      title = "Retail Sales: Used Car Dealers (MRTSMPCSM44112USN) _ Short Term Trend",
      subtitle = str_glue("From {min(indicator2$date)} through {max(indicator2$date)}"), 
      caption = "Data source: FRED St. Louis Federal Reserve \nIllustration by @JoeLongSanDiego") +
    theme_economist()

Retail Sales: Used Car Dealers (MRTSSM44112USN)

symbol <-fredr_series_observations(series_id = "MRTSSM44112USN", 
      observation_start = as.Date("2000-01-01"))
      
indicator <-as.data.frame(symbol)[,c(1,3)]

tail(indicator,n=12) %>% kable() %>%
  kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
   column_spec(2:3, T, color = "blue" ) 
date value
239 2019-11-01 9355
240 2019-12-01 8669
241 2020-01-01 8971
242 2020-02-01 10567
243 2020-03-01 9273
244 2020-04-01 6403
245 2020-05-01 10525
246 2020-06-01 11761
247 2020-07-01 12206
248 2020-08-01 12053
249 2020-09-01 10932
250 2020-10-01 10800
indicator   %>% 
    ggplot(aes(x = date, y = value)) +
   geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
                   fill = "white", alpha = 0.04)+ 
    geom_line(color = "dodgerblue4",size=.8) + 
 
    labs(
      x = "Monthly",
      y = "Millions of dollars",
      title = "Retail Sales: Used Car Dealers (MRTSSM44112USN)",
      subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
      caption = "Data source: FRED St. Louis Federal Reserve \nIllustration by @JoeLongSanDiego") +
    theme_economist()

indicator2 <- filter(indicator,date >= "2015-01-01")


indicator2   %>% 
    ggplot(aes(x = date, y = value)) +
   geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
                   fill = "white", alpha = 0.04)+ 
    geom_line(color = "dodgerblue4",size=.8) + 
  
    labs(
      x = "Monthly",
      y = "Millions of dollars",
      title = "Retail Sales: Used Car Dealers (MRTSSM44112USN) _ Short Term Trend",
      subtitle = str_glue("From {min(indicator2$date)} through {max(indicator2$date)}"), 
      caption = "Data source: FRED St. Louis Federal Reserve \nIllustration by @JoeLongSanDiego") +
    theme_economist()

# GENERAL CAR HARDWARE MARKET

Retail Sales: Automotive Parts, Accessories, and Tire Stores (MRTSMPCSM4413USN)

symbol <-fredr_series_observations(series_id = "MRTSMPCSM4413USN", 
      observation_start = as.Date("2019-01-01"))
      
indicator <-as.data.frame(symbol)[,c(1,3)]

tail(indicator,n=12) %>% kable(caption = "Retail Sales: Automotive Parts, Accessories, and Tire Stores") %>%
  kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
   column_spec(2:3, T, color = "blue" ) 
Retail Sales: Automotive Parts, Accessories, and Tire Stores
date value
11 2019-11-01 -8.0
12 2019-12-01 -6.0
13 2020-01-01 0.7
14 2020-02-01 -3.9
15 2020-03-01 3.1
16 2020-04-01 -6.9
17 2020-05-01 21.6
18 2020-06-01 9.2
19 2020-07-01 -0.4
20 2020-08-01 -1.6
21 2020-09-01 -3.9
22 2020-10-01 1.6
indicator   %>% 
    ggplot(aes(x = date, y = value)) +
   geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
                   fill = "white", alpha = 0.04)+ 
    geom_line(color = "dodgerblue4",size=.8) + 
   geom_hline(yintercept = 0,color="red")+
    labs(
      x = "Quarterly",
      y = "Percent Change ",
      title = "Retail Sales: Automotive Parts, Accessories, and Tire Stores (MRTSMPCSM4413USN)",
      subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
      caption = "Data source: FRED St. Louis Federal Reserve \nIllustration by @JoeLongSanDiego") +
    theme_economist()

Retail Sales: Automotive Parts, Accessories, and Tire Stores (MRTSSM4413USN)

symbol <-fredr_series_observations(series_id = "MRTSSM4413USN", 
      observation_start = as.Date("2000-01-01"))
      
indicator <-as.data.frame(symbol)[,c(1,3)]

tail(indicator,n=12) %>% kable() %>%
  kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
   column_spec(2:3, T, color = "blue" ) 
date value
239 2019-11-01 7859
240 2019-12-01 7390
241 2020-01-01 7445
242 2020-02-01 7158
243 2020-03-01 7379
244 2020-04-01 6873
245 2020-05-01 8358
246 2020-06-01 9130
247 2020-07-01 9097
248 2020-08-01 8952
249 2020-09-01 8607
250 2020-10-01 8747
indicator   %>% 
    ggplot(aes(x = date, y = value)) +
   geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
                   fill = "white", alpha = 0.04)+ 
    geom_line(color = "dodgerblue4",size=.8) + 
 
    labs(
      x = "Monthly",
      y = "Millions of dollars",
      title = "Retail Sales: Automotive Parts, Accessories, and Tire Stores (MRTSSM4413USN)",
      subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
      caption = "Data source: FRED St. Louis Federal Reserve \nIllustration by @JoeLongSanDiego") +
    theme_economist()

indicator2 <- filter(indicator,date >= "2015-01-01")


indicator2   %>% 
    ggplot(aes(x = date, y = value)) +
   geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
                   fill = "white", alpha = 0.04)+ 
    geom_line(color = "dodgerblue4",size=.8) + 
  
    labs(
      x = "Monthly",
      y = "Millions of dollars",
      title = "Retail Sales: Automotive Parts, Accessories, and Tire Stores _ Short Term Trend",
      subtitle = str_glue("From {min(indicator2$date)} through {max(indicator2$date)}"), 
      caption = "Data source: FRED St. Louis Federal Reserve \nIllustration by @JoeLongSanDiego") +
    theme_economist()