library(survey)
library(tidyverse)
library(dplyr)
library(car)
library(ggplot2)
library(tigris)
library(classInt)
library(mapview)
library(srvyr)
library(tmap)
## Warning: package 'tmap' was built under R version 4.1.3
library(classInt)
library(janitor)
## Warning: package 'janitor' was built under R version 4.1.3
library(ipumsr)
## Warning: package 'ipumsr' was built under R version 4.1.3
ddi <- read_ipums_ddi("C:/Users/spara/OneDrive/Desktop/Gis Project/usa_00007.xml")
data <- read_ipums_micro(ddi)
## Use of data from IPUMS USA is subject to conditions including that users should
## cite the data appropriately. Use command `ipums_conditions()` for more details.
data<- haven::zap_labels(data)
names(data) <- tolower(gsub(pattern = "_",replacement = "",x = names(data)))
options(tigris_class = "sf")
pumas<-pumas(state = "CA",
year = 2019,
cb = T)
##
|
| | 0%
|
|= | 2%
|
|=== | 4%
|
|=== | 5%
|
|===== | 7%
|
|====== | 8%
|
|======= | 11%
|
|========= | 13%
|
|========== | 14%
|
|=========== | 16%
|
|============ | 17%
|
|============== | 19%
|
|================ | 23%
|
|================= | 25%
|
|================== | 26%
|
|==================== | 28%
|
|====================== | 32%
|
|======================== | 34%
|
|======================== | 35%
|
|========================== | 37%
|
|============================ | 40%
|
|============================== | 44%
|
|================================ | 46%
|
|================================== | 49%
|
|==================================== | 51%
|
|===================================== | 52%
|
|====================================== | 55%
|
|======================================== | 57%
|
|======================================== | 58%
|
|=========================================== | 61%
|
|============================================ | 63%
|
|=============================================== | 67%
|
|================================================ | 69%
|
|================================================= | 70%
|
|==================================================== | 74%
|
|===================================================== | 75%
|
|======================================================= | 79%
|
|=========================================================== | 84%
|
|============================================================= | 87%
|
|================================================================= | 93%
|
|=================================================================== | 96%
|
|======================================================================| 100%
data$pwt <- data$perwt
data$hwt <- data$hhwt
# Recode demographic variable, migration status (MIGRATE1)
data$migration <- Recode(data$migrate1, recodes = "1=1; 0=NA; else=0")
des<-svydesign(ids = ~cluster,
strata = ~ strata,
weights = ~pwt,
data = data)
puma_est_migration<-svyby(formula = ~migration,
by = ~puma,
design = des,
FUN=svymean,
na.rm = TRUE )
head(puma_est_migration)
## puma migration se
## 101 101 0.7442398 0.009366589
## 102 102 0.8259565 0.006778309
## 103 103 0.8749223 0.006679989
## 104 104 0.8904980 0.008340314
## 105 105 0.8888690 0.006785526
## 106 106 0.9227006 0.006058942
pumas$puma<-as.numeric(pumas$PUMACE10)
geo1<-left_join(pumas, puma_est_migration, by=c("puma"= "puma"))
#head(geo1)
tmap_mode("plot")
## tmap mode set to plotting
tm_basemap("OpenStreetMap.Mapnik")+
tm_shape(geo1)+
tm_polygons("migration",
style="kmeans",
title=c("percent in the same household"),
palette="Blues",
n=8,
legend.hist = TRUE) +
tm_layout(legend.outside = TRUE,
title = "percent in the same household last year \n California PUMAs 2015-2019",
title.size =1.5,
legend.frame = TRUE,
) + tm_compass(position = c("right","top")) + tm_format("World",
legend.position = c("left", "bottom"),
main.title.position =c("center")) + tm_scale_bar(position = c("left","bottom"))
tmap_mode("view")
## tmap mode set to interactive viewing
tm_basemap("OpenStreetMap.Mapnik")+
tm_shape(geo1)+
tm_polygons("migration",
style="kmeans",
title=c("percent in the same household"),
palette="Blues",
n=8,
legend.hist = TRUE) +
tm_layout(legend.outside = TRUE,
title = "Percent in the same household last year \n California PUMAs 2015-2019",
title.size =1.5,
legend.frame = TRUE,
) + tm_compass(position = c("right","top")) + tm_format("World",
legend.position = c("left", "bottom"),
main.title.position =c("center")) + tm_scale_bar(position = c("left","bottom"))
## Compass not supported in view mode.
## legend.postion is used for plot mode. Use view.legend.position in tm_view to set the legend position in view mode.