the chunk below is part of initial cleaning; Im sorry to look foolish, but Im having a hard time rationalizing why "select' in the last line returns an error when the variable was renamed above. If I replace "id' with "ride_id' (the original name), it runs fine. Does this relate to working in .rmd?
names(yr1)
yr1 %>%
rename("id" = "ride_id", "type" = "rideable_type", "start time" = "started_at",
"end time" = "ended_at", "start st id" = "start_station_id", "start st
nm"= "start_station_name", "end st nm" = "end_station_name", "end st id" =
"end_station_id", "st lat" = "start_lat", "st long" = "start_lng", "end lat" = "end_lat","end long"="end_lng","mem type" = "member_casual")
names(yr1)
glimpse(yr1)
tibble(yr1)
yr1$duration <- difftime(yr1$ended_at,yr1$started_at)
tibble(yr1)
str(yr1)
yr1 %>%
select(id)