library(tidyqwi)
library(dplyr)
library(DT)
library(httr)
library(htmltab)
##install.packages("devtools")
##devtools::install_github("jamgreen/lehdr")
library(lehdr)
##lodes_type <- match.arg(tolower(lodes_type), c(NULL, "od", "rac", "wac"))
##agg_geo_to <- match.arg(tolower(agg_geo), c(NULL, "block", "bg", "tract", "county", "state"))
##job_type <- match.arg(job_type, c(NULL, "JT00", "JT01", "JT02", "JT03", "JT04", "JT05"))
##segment <- match.arg(segment, c(NULL, "S000", "SA01", "SA02", "SA03", "SE01", "SE02","SE03", "SI01", "SI02", "SI03"))
##state_part <- match.arg(state_part, c("","main","aux"))
### BlockGroup
la_blockJ00= grab_lodes(state = "or", year = 2017, lodes_type = "rac", job_type = "JT00", segment = "S000", state_part = "main", agg_geo = "bg")
la_blockJ01= grab_lodes(state = "or", year = 2017, lodes_type = "rac", job_type = "JT01", segment = "S000", state_part = "main", agg_geo = "bg")
dim(la_blockJ00)
## [1] 2627 44
## [1] 2627 44
### Block Group
### RAC
la_blockJ00= grab_lodes(state = "or", year = 2017, lodes_type = "rac", job_type = "JT00", segment = "S000", state_part = "main", agg_geo = "bg")
la_blockJ01= grab_lodes(state = "or", year = 2017, lodes_type = "rac", job_type = "JT01", segment = "S000", state_part = "main", agg_geo = "bg")
dim(la_blockJ00)
## [1] 2627 44
## [1] 2627 44
### WAC
la_blockJ00= grab_lodes(state = "or", year = 2017, lodes_type = "wac", job_type = "JT00", segment = "S000", state_part = "main", agg_geo = "bg")
la_blockJ01= grab_lodes(state = "or", year = 2017, lodes_type = "wac", job_type = "JT01", segment = "S000", state_part = "main", agg_geo = "bg")
dim(la_blockJ00)
## [1] 2626 54
## [1] 2626 54
### OD
la_blockJ00= grab_lodes(state = "or", year = 2017, lodes_type = "od", job_type = "JT00", segment = "S000", state_part = "main", agg_geo = "bg")
la_blockJ01= grab_lodes(state = "or", year = 2017, lodes_type = "od", job_type = "JT01", segment = "S000", state_part = "main", agg_geo = "bg")
dim(la_blockJ00)
## [1] 608941 14
## [1] 578170 14
### Tract
### RAC
la_blockJ00= grab_lodes(state = "or", year = 2017, lodes_type = "rac", job_type = "JT00", segment = "S000", state_part = "main", agg_geo = "tract")
la_blockJ01= grab_lodes(state = "or", year = 2017, lodes_type = "rac", job_type = "JT01", segment = "S000", state_part = "main", agg_geo = "tract")
dim(la_blockJ00)
## [1] 827 44
## [1] 827 44
### Tract
### RAC
la_blockJ00= grab_lodes(state = "or", year = 2017, lodes_type = "rac", job_type = "JT00", segment = "S000", state_part = "main", agg_geo = "county")
la_blockJ01= grab_lodes(state = "or", year = 2017, lodes_type = "rac", job_type = "JT01", segment = "S000", state_part = "main", agg_geo = "county")
dim(la_blockJ00)
## [1] 36 44
## [1] 36 44