How does feeling toward immigration vary among Americans?

Variables: Immigration_Should_Be, Raised_In_US, Raised_Religion, Occupation, FT_Trump, Politics_OR_Current_Events


MyVoterData <- FullVoterData %>% 
  mutate(Immigration_Should_Be = ifelse(immi_makedifficult_2018 == 1, "Much Easier",
                                 ifelse(immi_makedifficult_2018 == 2, "Slightly Easier",
                                 ifelse(immi_makedifficult_2018 == 3, "No Change",
                                 ifelse(immi_makedifficult_2018 == 4, "Slightly Harder",
                                 ifelse(immi_makedifficult_2018 == 5, "Much Harder",
                                 ifelse(immi_makedifficult_2018 == 8, "Don't Know", NA)))))),
         Raised_In_US = ifelse(childhood_2018 == 1, "Yes",
                        ifelse(childhood_2018 == 2, "No", NA)),
         Raised_Religion = ifelse(relig_2018 == 1, "Protestant",
                           ifelse(relig_2018 == 2, "Roman Catholic",
                           ifelse(relig_2018 == 3, "Morman",
                           ifelse(relig_2018 == 4, "Eastern or Greek Orthodox",
                           ifelse(relig_2018 == 5, "Jewish",
                           ifelse(relig_2018 == 6, "Muslim",
                           ifelse(relig_2018 == 7, "Buddhist",
                           ifelse(relig_2018 == 8, "Hindu",
                           ifelse(relig_2018 == 9, "Atheist",
                           ifelse(relig_2018 == 10, "Agnostic",
                           ifelse(relig_2018 == 11, "Nothing in Particular",
                           ifelse(relig_2018 == 12, "Something Else", NA)))))))))))),
         Occupation = ifelse(occupationcat_baseline == 1, "Professional/Technical",
                      ifelse(occupationcat_baseline == 2, "Executive/Upper Management",
                      ifelse(occupationcat_baseline == 3, "Middle Management",
                      ifelse(occupationcat_baseline == 4, "Sales",
                      ifelse(occupationcat_baseline == 5, "Business Owner/Self-Employed",
                      ifelse(occupationcat_baseline == 6, "Clerical/Administrative",
                      ifelse(occupationcat_baseline == 7, "Military/Civilia Uniform Services",
                      ifelse(occupationcat_baseline == 8, "Retired",
                      ifelse(occupationcat_baseline == 9, "Homemaker",
                      ifelse(occupationcat_baseline == 10, "Student",
                      ifelse(occupationcat_baseline == 11, "Unemployed",
                      ifelse(occupationcat_baseline == 11, "Other", NA)))))))))))),
         FT_Trump = ifelse(trumpfeel_2018 == 1, "Like and Approve",
                    ifelse(trumpfeel_2018 == 2, "Like but Disapprove",
                    ifelse(trumpfeel_2018 == 3, "Dislike but Approve",
                    ifelse(trumpfeel_2018 == 4, "Dislike and Disapprove",
                    ifelse(trumpfeel_2018 == 8, "Not Sure", NA))))),
         Politics_OR_Current_Events = ifelse(polinterest_baseline == 1, "Very Interested",
                                      ifelse(polinterest_baseline == 2, "Somewhat Interested",
                                      ifelse(polinterest_baseline == 3, "Not Very Interested",
                                      ifelse(polinterest_baseline == 4, "Nothing", NA))))) %>% 
  select(Immigration_Should_Be, Raised_In_US, Raised_Religion, Occupation, FT_Trump, Politics_OR_Current_Events)

head(MyVoterData)


Tables

kable(prop.table(table(MyVoterData$Raised_In_US, MyVoterData$Immigration_Should_Be),1)) %>% 
  kable_styling(bootstrap_options = c("striped", "condensed"), full_width = T) %>% 
  column_spec(1, bold = T)
Don’t Know Much Easier Much Harder No Change Slightly Easier Slightly Harder
No 0.1155779 0.1206030 0.1306533 0.2713568 0.1834171 0.1783920
Yes 0.0666906 0.1096531 0.2196656 0.2455510 0.1767032 0.1817365
kable(prop.table(table(MyVoterData$Raised_Religion, MyVoterData$Immigration_Should_Be),1)) %>% 
  kable_styling(bootstrap_options = c("striped", "condensed"), full_width = T) %>% 
  column_spec(1, bold = T)
Don’t Know Much Easier Much Harder No Change Slightly Easier Slightly Harder
Agnostic 0.0985915 0.1690141 0.0704225 0.2676056 0.2535211 0.1408451
Atheist 0.0677966 0.2881356 0.1016949 0.1525424 0.2542373 0.1355932
Buddhist 0.0434783 0.0434783 0.2608696 0.3043478 0.1739130 0.1739130
Eastern or Greek Orthodox 0.0256410 0.1538462 0.1282051 0.2564103 0.1538462 0.2820513
Hindu 0.1818182 0.2727273 0.0909091 0.2727273 0.0909091 0.0909091
Jewish 0.0485437 0.1699029 0.1650485 0.2427184 0.2233010 0.1504854
Morman 0.1041667 0.2187500 0.1458333 0.2291667 0.1875000 0.1145833
Muslim 0.0000000 0.2000000 0.0400000 0.3200000 0.2000000 0.2400000
Nothing in Particular 0.1034031 0.1426702 0.2002618 0.2159686 0.1806283 0.1570681
Protestant 0.0506035 0.0974930 0.2265552 0.2720520 0.1648097 0.1884865
Roman Catholic 0.0583376 0.0991224 0.2250903 0.2364481 0.1899845 0.1910170
Something Else 0.1385965 0.0842105 0.2192982 0.2403509 0.1385965 0.1789474
kable(prop.table(table(MyVoterData$Occupation, MyVoterData$Immigration_Should_Be),1)) %>% 
  kable_styling(bootstrap_options = c("striped", "condensed"), full_width = T) %>% 
  column_spec(1, bold = T)
Don’t Know Much Easier Much Harder No Change Slightly Easier Slightly Harder
Business Owner/Self-Employed 0.0347222 0.0486111 0.2187500 0.2986111 0.2222222 0.1770833
Clerical/Administrative 0.0648379 0.0748130 0.2618454 0.2618454 0.1596010 0.1770574
Executive/Upper Management 0.0358974 0.1230769 0.2153846 0.2102564 0.1846154 0.2307692
Homemaker 0.0840108 0.0433604 0.3116531 0.2439024 0.1300813 0.1869919
Middle Management 0.0443213 0.0886427 0.2049861 0.2493075 0.1523546 0.2603878
Military/Civilia Uniform Services 0.0526316 0.0701754 0.2280702 0.2631579 0.1228070 0.2631579
Professional/Technical 0.0467005 0.1137056 0.2060914 0.2670051 0.2020305 0.1644670
Retired 0.0336352 0.0970246 0.2574386 0.2522639 0.1526520 0.2069858
Sales 0.0394737 0.0701754 0.2763158 0.2456140 0.1710526 0.1973684
Student 0.1012658 0.1772152 0.1392405 0.1772152 0.3037975 0.1012658
Unemployed 0.0923567 0.0923567 0.2547771 0.2420382 0.1401274 0.1783439
kable(prop.table(table(MyVoterData$FT_Trump, MyVoterData$Immigration_Should_Be),1)) %>% 
  kable_styling(bootstrap_options = c("striped", "condensed"), full_width = T) %>% 
  column_spec(1, bold = T)
Don’t Know Much Easier Much Harder No Change Slightly Easier Slightly Harder
Dislike and Disapprove 0.0743445 0.1778958 0.0935944 0.2704945 0.2379688 0.1457020
Dislike but Approve 0.0511022 0.0490982 0.2885772 0.2464930 0.1342685 0.2304609
Like and Approve 0.0231176 0.0323646 0.4194188 0.2080581 0.1010568 0.2159841
Like but Disapprove 0.0898876 0.0561798 0.1629213 0.3033708 0.1460674 0.2415730
Not Sure 0.3518519 0.0555556 0.1518519 0.1740741 0.0962963 0.1703704
kable(prop.table(table(MyVoterData$Politics_OR_Current_Events, MyVoterData$Immigration_Should_Be),1)) %>% 
  kable_styling(bootstrap_options = c("striped", "condensed"), full_width = T) %>% 
  column_spec(1, bold = T)
Don’t Know Much Easier Much Harder No Change Slightly Easier Slightly Harder
Not Very Interested 0.1262458 0.0431894 0.2757475 0.2458472 0.0996678 0.2093023
Nothing 0.2702703 0.0540541 0.2432432 0.2162162 0.0270270 0.1891892
Somewhat Interested 0.0736767 0.0608011 0.2517883 0.2703863 0.1330472 0.2103004
Very Interested 0.0351708 0.1051742 0.2346973 0.2522827 0.1961447 0.1765303