library(dplyr)
##
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
##
## filter, lag
## The following objects are masked from 'package:base':
##
## intersect, setdiff, setequal, union
library(readr)
VoterData<-read_csv("/Users/juliushunte/Downloads/VOTER_Survey_July17_Release1-csv copy.csv")
## Parsed with column specification:
## cols(
## .default = col_integer(),
## weight_2017 = col_double(),
## redovote2016_t_2017 = col_character(),
## job_title_t_2017 = col_character(),
## weight_2016 = col_double(),
## izip_2016 = col_character(),
## presvote16post_t_2016 = col_character(),
## second_chance_t_2016 = col_character(),
## race_other_2016 = col_character(),
## healthcov_t_2016 = col_character(),
## employ_t_2016 = col_character(),
## pid3_t_2016 = col_character(),
## religpew_t_2016 = col_character(),
## votemeth16_rnd_2016 = col_character(),
## presvote16post_rnd_2016 = col_character(),
## vote2016_cand2_rnd_2016 = col_character(),
## Clinton_Rubio_rnd_2016 = col_character(),
## Clinton_Cruz_rnd_2016 = col_character(),
## Sanders_Trump_rnd_2016 = col_character(),
## Sanders_Rubio_rnd_2016 = col_character(),
## second_chance_rnd_2016 = col_character()
## # ... with 123 more columns
## )
## See spec(...) for full column specifications.
NewData<-rename(VoterData,
"Gender"=gender_baseline,
"Liberal"=pp_demprim16_2016,
"Conservative"=pp_repprim16_2016,
"ObamaElect"=post_presvote12_2012,
"TrumpElect"=presvote16post_2016)
head(VoterData)
## # A tibble: 6 x 867
## case_identifier weight_2017 wishvote2016_20… regretvote2016_…
## <int> <dbl> <int> <int>
## 1 779 0.438 NA 2
## 2 2108 0.366 NA 2
## 3 2597 0.550 NA 2
## 4 4148 NA NA NA
## 5 4460 0.346 NA 2
## 6 5225 0.148 NA 2
## # ... with 863 more variables: redovote2016_2017 <int>,
## # redovote2016_t_2017 <chr>, vote2018_2017 <int>,
## # vote2018_force_2017 <int>, trumpapp_2017 <int>, fav_trump_2017 <int>,
## # fav_ryan_2017 <int>, fav_obama_2017 <int>, fav_hrc_2017 <int>,
## # fav_sanders_2017 <int>, fav_putin_2017 <int>,
## # political_system_strong_leader_2 <int>,
## # political_system_army_2017 <int>,
## # political_system_democratic_2017 <int>,
## # democracy_importance_2017 <int>, democracy_preference_2017 <int>,
## # us_democracy_satisfaction_2017 <int>, pres_obey_courts_2017 <int>,
## # pres_oversight_2017 <int>, pres_news_scrutiny_2017 <int>,
## # track_2017 <int>, track_moral_climate_2017 <int>,
## # persfinretro_2017 <int>, econtrend_2017 <int>,
## # Americatrend_2017 <int>, living_standards_parents_2017 <int>,
## # futuretrend_2017 <int>, american_dream_2017 <int>,
## # values_culture_2017 <int>, US_respect_2017 <int>, stranger_2017 <int>,
## # promise_parent_2017 <int>, promise_repeal_aca_2017 <int>,
## # promise_wall_2017 <int>, promise_immigration_2017 <int>,
## # promise_tpp_2017 <int>, promise_tax_2017 <int>,
## # promise_corruption_2017 <int>, promise_success_parent_2017 <int>,
## # promise_success_repeal_aca_2017 <int>,
## # promise_success_wall_2017 <int>,
## # promise_success_immigration_2017 <int>,
## # promise_success_tpp_2017 <int>, promise_success_tax_2017 <int>,
## # promise_success_corruption_2017 <int>, blame_trump_2017 <int>,
## # blame_media_2017 <int>, blame_dems_2017 <int>, blame_reps_2017 <int>,
## # blame_courts_2017 <int>, trustgovt_2017 <int>, ft_black_2017 <int>,
## # ft_white_2017 <int>, ft_hisp_2017 <int>, ft_asian_2017 <int>,
## # ft_muslim_2017 <int>, ft_jew_2017 <int>, ft_christ_2017 <int>,
## # ft_fem_2017 <int>, ft_immig_2017 <int>, ft_gays_2017 <int>,
## # ft_unions_2017 <int>, ft_police_2017 <int>, ft_altright_2017 <int>,
## # ft_evang_2017 <int>, ft_dem_2017 <int>, ft_rep_2017 <int>,
## # imiss_a_2017 <int>, imiss_b_2017 <int>, imiss_c_2017 <int>,
## # imiss_d_2017 <int>, imiss_e_2017 <int>, imiss_f_2017 <int>,
## # imiss_g_2017 <int>, imiss_h_2017 <int>, imiss_i_2017 <int>,
## # imiss_j_2017 <int>, imiss_k_2017 <int>, imiss_l_2017 <int>,
## # imiss_m_2017 <int>, imiss_n_2017 <int>, imiss_o_2017 <int>,
## # imiss_p_2017 <int>, imiss_q_2017 <int>, imiss_r_2017 <int>,
## # imiss_s_2017 <int>, imiss_t_2017 <int>, imiss_u_2017 <int>,
## # imiss_x_2017 <int>, imiss_y_2017 <int>,
## # immi_contribution_treat_2017 <int>, immi_contribution_a_2017 <int>,
## # immi_contribution_b_2017 <int>, immi_naturalize_2017 <int>,
## # immi_makedifficult_2017 <int>, immi_muslim_2017 <int>,
## # immigration_cap_2017 <int>, culture_pref_2017 <int>,
## # contact_english_treat_2017 <int>, contact_english_a_2017 <int>, …
NewData<-select(NewData,"Gender","Liberal","Conservative","ObamaElect","TrumpElect")
head(NewData)
## # A tibble: 6 x 5
## Gender Liberal Conservative ObamaElect TrumpElect
## <int> <int> <int> <int> <int>
## 1 2 1 NA 1 1
## 2 2 NA 1 2 2
## 3 1 1 NA 2 1
## 4 1 3 NA 1 3
## 5 1 NA 4 2 2
## 6 2 1 NA 1 1
NewData2<-filter(NewData,Gender==5,Liberal==5,Conservative==5,ObamaElect==5,TrumpElect==5)
head(NewData)
## # A tibble: 6 x 5
## Gender Liberal Conservative ObamaElect TrumpElect
## <int> <int> <int> <int> <int>
## 1 2 1 NA 1 1
## 2 2 NA 1 2 2
## 3 1 1 NA 2 1
## 4 1 3 NA 1 3
## 5 1 NA 4 2 2
## 6 2 1 NA 1 1
NewData2<-mutate(NewData,Gender=ifelse(Gender==1,"Male","Female"))
head(NewData2)
## # A tibble: 6 x 5
## Gender Liberal Conservative ObamaElect TrumpElect
## <chr> <int> <int> <int> <int>
## 1 Female 1 NA 1 1
## 2 Female NA 1 2 2
## 3 Male 1 NA 2 1
## 4 Male 3 NA 1 3
## 5 Male NA 4 2 2
## 6 Female 1 NA 1 1
NewData2<-mutate(NewData,Liberal=ifelse(Liberal==1,"Hillary Clinton",
ifelse(Liberal==2,"Bernie Sanders",
ifelse(Liberal==3,"Someone else",
ifelse(Liberal==4,"Don't recall",NA)))),
Conservative=ifelse(Conservative==1,"Donald Trump",
ifelse(Conservative==2,"John Kasich",
ifelse(Conservative==3,"Ted Cruz",
ifelse(Conservative==4,"Marco Rubio",
ifelse(Conservative==5,"Someone else",
ifelse(Conservative==6,"Don't recall",NA)))))),
ObamaElect=ifelse(ObamaElect==1,"Barack Obama",
ifelse(ObamaElect==2,"Mitt Romney",
ifelse(ObamaElect==3,"Other candidate",
ifelse(ObamaElect==4,"I did not vote in this race",
ifelse(ObamaElect==5,"I did not vote",
ifelse(ObamaElect==6,"Note sure",NA)))))),
TrumpElect=ifelse(TrumpElect==1,"Hillary Clinton",
ifelse(TrumpElect==2,"Donald Trump",
ifelse(TrumpElect==3,"Gary Johnson",
ifelse(TrumpElect==4,"Jill Stein",
ifelse(TrumpElect==5,"Evan McMullin",
ifelse(TrumpElect==6,"Other",
ifelse(TrumpElect==7,"Did not vote for president",NA))))))))
prop.table(table(NewData2$Gender,NewData2$Liberal,NewData2$Conservative,NewData2$ObamaElect,NewData2$TrumpElect))
## , , = Don't recall, = Barack Obama, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = Barack Obama, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = Barack Obama, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = Barack Obama, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = Barack Obama, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = Barack Obama, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = I did not vote, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = I did not vote, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = I did not vote, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = I did not vote, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = I did not vote, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = I did not vote, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = I did not vote in this race, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = I did not vote in this race, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = I did not vote in this race, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = I did not vote in this race, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = I did not vote in this race, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = I did not vote in this race, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = Mitt Romney, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = Mitt Romney, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = Mitt Romney, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = Mitt Romney, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = Mitt Romney, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = Mitt Romney, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = Note sure, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = Note sure, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = Note sure, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = Note sure, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = Note sure, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = Note sure, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = Other candidate, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = Other candidate, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = Other candidate, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = Other candidate, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = Other candidate, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = Other candidate, = Did not vote for president
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = Barack Obama, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = Barack Obama, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = Barack Obama, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = Barack Obama, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = Barack Obama, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = Barack Obama, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = I did not vote, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = I did not vote, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = I did not vote, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = I did not vote, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = I did not vote, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = I did not vote, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = I did not vote in this race, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = I did not vote in this race, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = I did not vote in this race, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = I did not vote in this race, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = I did not vote in this race, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = I did not vote in this race, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = Mitt Romney, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = Mitt Romney, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = Mitt Romney, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = Mitt Romney, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = Mitt Romney, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = Mitt Romney, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = Note sure, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = Note sure, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = Note sure, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = Note sure, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = Note sure, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = Note sure, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = Other candidate, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = Other candidate, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = Other candidate, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = Other candidate, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = Other candidate, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = Other candidate, = Donald Trump
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = Barack Obama, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = Barack Obama, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = Barack Obama, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = Barack Obama, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = Barack Obama, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = Barack Obama, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = I did not vote, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = I did not vote, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = I did not vote, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = I did not vote, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = I did not vote, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = I did not vote, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = I did not vote in this race, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = I did not vote in this race, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = I did not vote in this race, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = I did not vote in this race, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = I did not vote in this race, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = I did not vote in this race, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = Mitt Romney, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = Mitt Romney, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = Mitt Romney, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = Mitt Romney, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = Mitt Romney, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = Mitt Romney, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = Note sure, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = Note sure, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = Note sure, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = Note sure, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = Note sure, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = Note sure, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = Other candidate, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = Other candidate, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = Other candidate, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = Other candidate, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = Other candidate, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = Other candidate, = Evan McMullin
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = Barack Obama, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = Barack Obama, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = Barack Obama, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = Barack Obama, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = Barack Obama, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = Barack Obama, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = I did not vote, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = I did not vote, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = I did not vote, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = I did not vote, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = I did not vote, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = I did not vote, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = I did not vote in this race, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = I did not vote in this race, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = I did not vote in this race, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = I did not vote in this race, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = I did not vote in this race, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = I did not vote in this race, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = Mitt Romney, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = Mitt Romney, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = Mitt Romney, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = Mitt Romney, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = Mitt Romney, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = Mitt Romney, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = Note sure, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = Note sure, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = Note sure, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = Note sure, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = Note sure, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = Note sure, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = Other candidate, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = Other candidate, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = Other candidate, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = Other candidate, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = Other candidate, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = Other candidate, = Gary Johnson
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = Barack Obama, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = Barack Obama, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = Barack Obama, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = Barack Obama, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = Barack Obama, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = Barack Obama, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = I did not vote, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = I did not vote, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = I did not vote, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = I did not vote, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = I did not vote, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = I did not vote, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = I did not vote in this race, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = I did not vote in this race, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = I did not vote in this race, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = I did not vote in this race, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = I did not vote in this race, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = I did not vote in this race, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = Mitt Romney, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = Mitt Romney, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = Mitt Romney, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = Mitt Romney, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = Mitt Romney, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = Mitt Romney, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = Note sure, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = Note sure, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = Note sure, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = Note sure, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = Note sure, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = Note sure, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = Other candidate, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = Other candidate, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = Other candidate, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = Other candidate, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = Other candidate, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = Other candidate, = Hillary Clinton
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = Barack Obama, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = Barack Obama, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = Barack Obama, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = Barack Obama, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = Barack Obama, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = Barack Obama, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = I did not vote, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = I did not vote, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = I did not vote, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = I did not vote, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = I did not vote, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = I did not vote, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = I did not vote in this race, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = I did not vote in this race, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = I did not vote in this race, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = I did not vote in this race, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = I did not vote in this race, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = I did not vote in this race, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = Mitt Romney, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = Mitt Romney, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = Mitt Romney, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = Mitt Romney, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = Mitt Romney, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = Mitt Romney, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = Note sure, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = Note sure, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = Note sure, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = Note sure, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = Note sure, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = Note sure, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = Other candidate, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = Other candidate, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = Other candidate, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = Other candidate, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = Other candidate, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = Other candidate, = Jill Stein
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = Barack Obama, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = Barack Obama, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = Barack Obama, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = Barack Obama, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = Barack Obama, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = Barack Obama, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = I did not vote, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = I did not vote, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = I did not vote, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = I did not vote, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = I did not vote, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = I did not vote, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = I did not vote in this race, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = I did not vote in this race, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = I did not vote in this race, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = I did not vote in this race, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = I did not vote in this race, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = I did not vote in this race, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = Mitt Romney, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = Mitt Romney, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = Mitt Romney, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = Mitt Romney, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = Mitt Romney, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = Mitt Romney, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = Note sure, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = Note sure, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = Note sure, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = Note sure, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = Note sure, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = Note sure, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Don't recall, = Other candidate, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Donald Trump, = Other candidate, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = John Kasich, = Other candidate, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Marco Rubio, = Other candidate, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Someone else, = Other candidate, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
##
## , , = Ted Cruz, = Other candidate, = Other
##
##
## Bernie Sanders Don't recall Hillary Clinton Someone else
## 1
## 2
head(NewData2)
## # A tibble: 6 x 5
## Gender Liberal Conservative ObamaElect TrumpElect
## <int> <chr> <chr> <chr> <chr>
## 1 2 Hillary Clinton <NA> Barack Obama Hillary Clinton
## 2 2 <NA> Donald Trump Mitt Romney Donald Trump
## 3 1 Hillary Clinton <NA> Mitt Romney Hillary Clinton
## 4 1 Someone else <NA> Barack Obama Gary Johnson
## 5 1 <NA> Marco Rubio Mitt Romney Donald Trump
## 6 2 Hillary Clinton <NA> Barack Obama Hillary Clinton