ETL Step 1 - Raw Data Refresh

Published

April 10, 2024

This notebook uses the bikeHelpR package to update a database with the latest bike share data. The package pulls data from https://capitalbikeshare.com which provides an API to access bike share data. The raw data is written to the Content DB database to the bike_raw_data table.

Get data from API

Use the the bikeHelpR package to get the latest data from https://capitalbikeshare.com.

Station status

feeds_station_status <- 
  bikeHelpR::feeds_urls() %>% 
  filter(name == "station_status") %>% 
  pull(url) %>% 
  bikeHelpR::get_data() 

station_status <- 
  feeds_station_status %>%
  magrittr::extract2("data") %>%
  dplyr::mutate(time = feeds_station_status$last_updated) %>%
  dplyr::select(
    is_installed, 
    num_bikes_available, 
    last_reported, 
    is_renting, 
    eightd_has_available_keys, 
    num_docks_available, 
    num_docks_disabled, 
    is_returning, 
    station_id, num_ebikes_available, 
    num_bikes_disabled, 
    time
  )

glimpse(station_status)
Rows: 774
Columns: 12
$ is_installed              <int> 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1,…
$ num_bikes_available       <int> 22, 17, 6, 16, 14, 4, 3, 5, 10, 6, 1, 3, 6, …
$ last_reported             <int> 1712735988, 1712735988, 1712735987, 17127359…
$ is_renting                <int> 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1,…
$ eightd_has_available_keys <lgl> FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FA…
$ num_docks_available       <int> 2, 2, 28, 5, 17, 11, 16, 6, 10, 13, 18, 12, …
$ num_docks_disabled        <int> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,…
$ is_returning              <int> 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1,…
$ station_id                <chr> "2a43f4e2-4102-482e-8879-245cf7555c6b", "082…
$ num_ebikes_available      <int> 1, 0, 3, 1, 1, 1, 1, 4, 0, 1, 0, 1, 2, 1, 1,…
$ num_bikes_disabled        <int> 0, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1,…
$ time                      <dttm> 2024-04-10 08:01:17, 2024-04-10 08:01:17, 2…

Station info

# The station information endpoint.
station_information_url <- 
  bikeHelpR::feeds_urls() %>% 
  filter(name == "station_information") %>% 
  pull(url)

# Call the endpoint to obtain the JSON data.
request <- httr2::request(station_information_url)
response <- httr2::req_perform(request)
json_data <- httr2::resp_body_json(response)

# Convert the JSON data into a tibble.
station_info <- 
  json_data$data %>%
  as_tibble() %>%
  tidyr::unnest_wider(stations) %>%
  select(station_id, name, lat, lon) %>%
  distinct() %>%
  mutate(
    last_updated = as.POSIXct(
      json_data$last_updated,
      origin = "1970-01-01 00:00:00 UTC"
    )
  )

glimpse(station_info)
Rows: 774
Columns: 5
$ station_id   <chr> "2a43f4e2-4102-482e-8879-245cf7555c6b", "0826183f-1f3f-11…
$ name         <chr> "14th & Otis Pl NW", "16th & R St NW", "Smithsonian-Natio…
$ lat          <dbl> 38.93440, 38.91265, 38.88877, 38.92320, 38.91679, 38.9287…
$ lon          <dbl> -77.03269, -77.03628, -77.02869, -77.04764, -77.02814, -7…
$ last_updated <dttm> 2024-04-10 08:01:17, 2024-04-10 08:01:17, 2024-04-10 08:…

Update database

Write the new data from the API to the database.

con <- dbConnect(odbc(), "Content DB", timeout = 10)
dbWriteTable(con, "bike_raw_data", station_status, append = TRUE)
dbWriteTable(con, "bike_station_info", station_info, overwrite = TRUE)
dbDisconnect(con)
print("Raw data updated 🎉")
[1] "Raw data updated 🎉"

Update the pin

Station info will also be written to a pin. This pin will be accessed by the shiny app so that it can easily get the bike station info without connecting to the database.

board <- pins::board_rsconnect(
  server = Sys.getenv("CONNECT_SERVER"),
  key = Sys.getenv("CONNECT_API_KEY"),
  versioned = TRUE
)

# Write the model to the board.
pins::pin_write(
  board,
  x = station_info,
  type = "csv",
  name = "bike-predict-r-station-info-pin",
  title = "Bike Predict - ETL - Pinned Station Info",
  description = "Bike station info from https://capitalbikeshare.com."
)

print("Pin 🎉")
[1] "Pin 🎉"