forked from tidyverse/ggplot2
-
Notifications
You must be signed in to change notification settings - Fork 0
/
Copy patheconomics.R
29 lines (22 loc) · 928 Bytes
/
economics.R
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
# Download from http://research.stlouisfed.org
library(readr)
library(dplyr)
library(purrr)
library(tidyr)
library(dplyr)
series <- c("PCE", "POP", "PSAVERT", "UEMPMED", "UNEMPLOY")
url <- paste0("http://research.stlouisfed.org/fred2/series/", series, "/downloaddata/", series, ".csv")
fields <- lapply(url, read_csv)
economics <- fields %>%
map2(tolower(series), function(x, series) setNames(x, c("date", series))) %>%
reduce(inner_join, by = "date") %>%
mutate(date = structure(date, class = "Date")) # Not sure why this is lost
write.csv(economics, "data-raw/economics.csv", row.names = FALSE, quote = FALSE)
devtools::use_data(economics, overwrite = TRUE)
rescale01 <- function(x) (x - min(x)) / diff(range(x))
economics_long <- economics %>%
gather(variable, value, -date) %>%
group_by(variable) %>%
mutate(value01 = rescale01(value)) %>%
ungroup()
devtools::use_data(economics_long, overwrite = TRUE)