Federal government current receipts:

Income receipts on assets: Interest receipts (B094RC1Q027SBEA)

indicator <-fredr_series_observations(series_id = "B094RC1Q027SBEA",
        observation_start = as.Date("2016-01-01")) 

# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "000066") +
  labs(title = "Federal government current receipts: Income receipts on assets: Interest receipts", 
       subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Quarterly", y="Billions of Dollars",
       caption = "Source: FRED 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 = "Federal government current receipts: Income receipts on assets: Interest receipts",
             style = list(fontWeight = "bold", fontSize = "20px"), align = "center")  %>%
   hc_credits(enabled = TRUE,text = "Source: FRED Federal Reserve\nIllustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Billions of Dollars")) %>%
   hc_add_theme(hc_theme_economist())

Federal government current receipts:

Income receipts on Rents and royalties (B1040C1Q027SBEA)

indicator <-fredr_series_observations(series_id = "B1040C1Q027SBEA",
        observation_start = as.Date("2016-01-01")) 

# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "000066") +
  labs(title = "Federal government current Income receipts on assets: Rents and royalties", 
       subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Quarterly", y="Billions of Dollars",
       caption = "Source: FRED 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 = "Federal government current Income receipts on assets: Rents and royalties",
             style = list(fontWeight = "bold", fontSize = "20px"), align = "center")  %>%
   hc_credits(enabled = TRUE,text = "Source: FRED Federal Reserve  _ Illustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Billions of Dollars")) %>%
   hc_add_theme(hc_theme_economist())

Federal government current receipts:

Income receipts on assets: Dividends (W053RC1Q027SBEA)

indicator <-fredr_series_observations(series_id = "W053RC1Q027SBEA",
        observation_start = as.Date("2016-01-01")) 

# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "000066") +
  labs(title = "Federal government current Income receipts on assets: Dividents", 
       subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Quarterly", y="Billions of Dollars",
       caption = "Source: FRED 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 = "Federal government current Income receipts on assets: Dividents",
             style = list(fontWeight = "bold", fontSize = "20px"), align = "center")  %>%
   hc_credits(enabled = TRUE,text = "Source: FRED Federal Reserve  _ Illustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Billions of Dollars")) %>%
   hc_add_theme(hc_theme_economist())

Federal government current tax receipts:

Taxes on corporate income (B075RC1Q027SBEA)

indicator <-fredr_series_observations(series_id = "B075RC1Q027SBEA",
        observation_start = as.Date("2016-01-01")) 

# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "000066") +
  labs(title = "Taxes on corporate income", 
       subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Quarterly", y="Billions of Dollars",
       caption = "Source: FRED 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 = "Taxes on corporate income",
             style = list(fontWeight = "bold", fontSize = "20px"), align = "center")  %>%
   hc_credits(enabled = TRUE,text = "Source: FRED Federal Reserve  _ Illustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Billions of Dollars")) %>%
   hc_add_theme(hc_theme_economist())

Federal government current tax receipts:

Taxes on production and imports: Customs duties (B235RC1Q027SBEA)

indicator <-fredr_series_observations(series_id = "B235RC1Q027SBEA",
        observation_start = as.Date("2016-01-01")) 

# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "000066") +
  labs(title = "Taxes on production and imports: Customs duties", 
       subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Quarterly", y="Billions of Dollars",
       caption = "Source: FRED 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 = "Taxes on production and imports: Customs duties",
             style = list(fontWeight = "bold", fontSize = "20px"), align = "center")  %>%
   hc_credits(enabled = TRUE,text = "Source: FRED Federal Reserve  _ Illustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Billions of Dollars")) %>%
   hc_add_theme(hc_theme_economist())

Federal government current tax receipts:

Personal current taxes (A074RC1Q027SBEA)

indicator <-fredr_series_observations(series_id = "A074RC1Q027SBEA",
        observation_start = as.Date("2016-01-01")) 

# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "000066") +
  labs(title = "Personal current taxes", 
       subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Quarterly", y="Billions of Dollars",
       caption = "Source: FRED 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 = "Personal current taxes",
             style = list(fontWeight = "bold", fontSize = "20px"), align = "center")  %>%
   hc_credits(enabled = TRUE,text = "Source: FRED Federal Reserve  \nIllustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Billions of Dollars")) %>%
   hc_add_theme(hc_theme_economist())

Federal government current tax receipts:

Taxes on production and imports: Excise taxes (B234RC1Q027SBEA)

indicator <-fredr_series_observations(series_id = "B234RC1Q027SBEA",
        observation_start = as.Date("2016-01-01")) 

# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "000066") +
  labs(title = "Taxes on production and imports: Excise taxes", 
       subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Quarterly", y="Billions of Dollars",
       caption = "Source: FRED 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 = "Taxes on production and imports: Excise taxes",
             style = list(fontWeight = "bold", fontSize = "20px"), align = "center")  %>%
   hc_credits(enabled = TRUE,text = "Source: FRED Federal Reserve  _ Illustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Billions of Dollars")) %>%
   hc_add_theme(hc_theme_economist())

Taxes on production and imports (W007RC1Q027SBEA)

indicator <-fredr_series_observations(series_id = "W007RC1Q027SBEA",
        observation_start = as.Date("2016-01-01")) 

# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "000066") +
  labs(title = "Taxes on production and imports", 
       subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Quarterly", y="Billions of Dollars",
       caption = "Source: FRED 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 = "Taxes on production and imports",
             style = list(fontWeight = "bold", fontSize = "20px"), align = "center")  %>%
   hc_credits(enabled = TRUE,text = "Source: FRED Federal Reserve  _ Illustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Billions of Dollars")) %>%
   hc_add_theme(hc_theme_economist())

Contributions for government social insurance: From persons (LA0000121Q027SBEA)

indicator <-fredr_series_observations(series_id = "LA0000121Q027SBEA",
        observation_start = as.Date("2016-01-01")) 

# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "000066") +
  labs(title = "Contributions for government social insurance: From persons", 
       subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Quarterly", y="Billions of Dollars",
       caption = "Source: FRED 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 = "Contributions for government social insurance: From persons",
             style = list(fontWeight = "bold", fontSize = "20px"), align = "center")  %>%
   hc_credits(enabled = TRUE,text = "Source: FRED Federal Reserve  _ Illustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Billions of Dollars")) %>%
   hc_add_theme(hc_theme_economist())

Income receipts on assets (W009RC1Q027SBEA)

indicator <-fredr_series_observations(series_id = "W009RC1Q027SBEA",
        observation_start = as.Date("2016-01-01")) 

# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "000066") +
  labs(title = "Income receipts on assets", 
       subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Quarterly", y="Billions of Dollars",
       caption = "Source: FRED 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 = "Income receipts on assets",
             style = list(fontWeight = "bold", fontSize = "20px"), align = "center")  %>%
   hc_credits(enabled = TRUE,text = "Source: FRED Federal Reserve  _ Illustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Billions of Dollars")) %>%
   hc_add_theme(hc_theme_economist())