Date of data release : October 19, 2020 by St. Louis Federal Reserve

Real Gross Domestic Product (Euro/ECU series) for Austria (CLVMEURNSAB1GQAT)

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

tail(indicator) %>% kable() %>%
  kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
   column_spec(2, T, color = "red" ) 
date value
37 2019-01-01 83223
38 2019-04-01 83829
39 2019-07-01 84554
40 2019-10-01 87229
41 2020-01-01 80361
42 2020-04-01 71837
indicator <-as.data.frame(symbol)[,c(1,3)]

indicator %>% ggplot() + 
    geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
                   fill = "white", alpha = 0.02)+
  geom_line(mapping = aes(x=date,y=value),color="red",size=1)  +
     labs(title = "Austria: Real Gross Domestic Product ", 
          subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Quartely", y="Millions of Chained 2010 Euros",
       caption = "Data source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego")+
    theme_economist()

Real Gross Domestic Product (Euro/ECU series) for Belgium (CLVMEURNSAB1GQBE)

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

tail(indicator) %>% kable() %>%
  kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
   column_spec(2, T, color = "red" ) 
date value
37 2019-01-01 99762
38 2019-04-01 104124
39 2019-07-01 99600
40 2019-10-01 108742
41 2020-01-01 97459
42 2020-04-01 89069
indicator <-as.data.frame(symbol)[,c(1,3)]

indicator %>% ggplot() + 
    geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
                   fill = "white", alpha = 0.02)+
  geom_line(mapping = aes(x=date,y=value),color="red",size=1)  +
     labs(title = "Belgium: Real Gross Domestic Product ", 
          subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Quartely", y="Millions of Chained 2010 Euros",
       caption = "Data source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego")+
    theme_economist()

Real Gross Domestic Product (Euro/ECU series) for Germany (CLVMEURNSAB1GQDE)

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

tail(indicator) %>% kable() %>%
  kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
   column_spec(2, T, color = "red" ) 
date value
37 2019-01-01 741369
38 2019-04-01 734398
39 2019-07-01 750988
40 2019-10-01 751336
41 2020-01-01 727916
42 2020-04-01 651451
indicator <-as.data.frame(symbol)[,c(1,3)]

indicator %>% ggplot() + 
    geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
                   fill = "white", alpha = 0.02)+
  geom_line(mapping = aes(x=date,y=value),color="red",size=1)  +
     labs(title = "Germany: Real Gross Domestic Product ", 
          subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Quartely", y="Millions of Chained 2010 Euros",
       caption = "Data source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego")+
    theme_economist()

Real Gross Domestic Product (Euro/ECU series) for Switzerland (CLVMEURNSAB1GQCH)

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

tail(indicator) %>% kable() %>%
  kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
   column_spec(2, T, color = "red" ) 
date value
37 2019-01-01 126501
38 2019-04-01 129189
39 2019-07-01 129556
40 2019-10-01 130836
41 2020-01-01 125566
42 2020-04-01 117133
indicator <-as.data.frame(symbol)[,c(1,3)]

indicator %>% ggplot() + 
    geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
                   fill = "white", alpha = 0.02)+
  geom_line(mapping = aes(x=date,y=value),color="red",size=1)  +
     labs(title = "Switzerland: Real Gross Domestic Product ", 
          subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Quartely", y="Millions of Chained 2010 Euros",
       caption = "Data source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego")+
    theme_economist()

Real Gross Domestic Product (Euro/ECU series) for Denmark (CLVMEURNSAB1GQDK)

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

tail(indicator) %>% kable() %>%
  kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
   column_spec(2, T, color = "red" ) 
date value
37 2019-01-01 69741
38 2019-04-01 73152
39 2019-07-01 71727
40 2019-10-01 74599
41 2020-01-01 69738
42 2020-04-01 67584
indicator <-as.data.frame(symbol)[,c(1,3)]

indicator %>% ggplot() + 
    geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
                   fill = "white", alpha = 0.02)+
  geom_line(mapping = aes(x=date,y=value),color="red",size=1)  +
     labs(title = "Denmark: Real Gross Domestic Product ", 
          subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Quartely", y="Millions of Chained 2010 Euros",
       caption = "Data source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego")+
    theme_economist()

Real Gross Domestic Product (Euro/ECU series) for Czech Republic (CLVMEURNSAB1GQCZ)

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

tail(indicator) %>% kable() %>%
  kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
   column_spec(2, T, color = "red" ) 
date value
37 2019-01-01 45878
38 2019-04-01 49289
39 2019-07-01 49997
40 2019-10-01 50405
41 2020-01-01 45128
42 2020-04-01 43953
indicator <-as.data.frame(symbol)[,c(1,3)]

indicator %>% ggplot() + 
    geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
                   fill = "white", alpha = 0.02)+
  geom_line(mapping = aes(x=date,y=value),color="red",size=1)  +
     labs(title = "Czech Republic: Real Gross Domestic Product ", 
          subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Quartely", y="Millions of Chained 2010 Euros",
       caption = "Data source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego")+
    theme_economist()