Units: Index Jan 2000=100, Not Seasonally Adjusted
Frequency: Monthly
For more information regarding the index, please visit Standard & Poor’s. There is more information about home price sales pairs in the Methodology section. Copyright, 2016, Standard & Poor’s Financial Services LLC. Reprinted with permission.
Suggested Citation: S&P Dow Jones Indices LLC, S&P/Case-Shiller U.S. National Home Price Index [CSUSHPINSA], retrieved from FRED, Federal Reserve Bank of St. Louis; https://fred.stlouisfed.org/series/CSUSHPINSA, September 29, 2020.
indicator <- fredr(series_id = "CSUSHPINSA", observation_start = as.Date("2010-01-01"))
ggplot(data = indicator, mapping = aes(x = date, y = value)) +
geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('22-09-2020'), ymin = -Inf, ymax = Inf),
fill = "lightyellow", alpha = 0.02)+
geom_line(mapping = aes(x=date,y=value),
color = "blue4") +
labs(title = "Case-Shiller Index _ U.S. National Home Price",
subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
x="", y="Index Jan 2000=100",
caption = "Data source: FRED Federal Reserve Bank of St. Louis. Illustration by @JoeLongSanDiego")+
theme_economist()
tail(indicator,n=60) %>%
ggplot(mapping = aes(x = date, y = value)) +
geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('22-09-2020'), ymin = -Inf, ymax = Inf),
fill = "lightyellow", alpha = 0.02)+
geom_line(mapping = aes(x=date,y=value),
color = "blue4") +
labs(title = "Case-Shiller Index _ U.S. National Home Price",
subtitle = "Past 5 years\n",
x="", y="Index Jan 2000=100",
caption = "Data source: FRED Federal Reserve Bank of St. Louis\nIllustration by @JoeLongSanDiego")+
theme_economist()
indicator1 <- tail(indicator,n=24)
highchart() %>%
hc_chart(type = "column") %>%
hc_xAxis(categories = indicator1$date) %>%
hc_add_series(name="",data = indicator1$value) %>%
hc_subtitle(text=str_glue("From {min(indicator1$date)} through {max(indicator1$date)}"), align = "center") %>%
hc_title(text = "Case-Shiller Index _ U.S. National Home Price ",
style = list(fontWeight = "bold", fontSize = "20px"),
align = "center") %>%
hc_credits(enabled = TRUE,text = "Data Source: FRED St. Louis Federal Reserve\n Illustration by @JoeLongSanDiego") %>%
hc_yAxis(title = list(text = "Index Jan 2000=100")) %>%
hc_add_theme(hc_theme_economist())