Last class you raised some interesting questions about:
The characteristics of political independents and partisan leaners
The implications of political context for partisan attitudes
Let’s explore these briefly with some data from the 2020 Cooperative Election Study and MIT’s Election Lab
# ----- Setup -----# Load Librarireslibrary(dataverse)library(tidyverse)library(haven)# Set dataverseSys.setenv("DATAVERSE_SERVER"="dataverse.harvard.edu")# ----- Data -----# Get 2020 CCESces <- dataverse::get_dataframe_by_name("CES20_Common_OUTPUT_vv.dta","doi:10.7910/DVN/E9N6PH",.f = haven::read_dta)# Get House Election Datahouse_df <- dataverse::get_dataframe_by_name("1976-2022-house.tab","doi:10.7910/DVN/IG0UN2")
# ----- Clean Data -----# Subset house data, combine into two-party vote sharehouse_df %>%filter(year ==2020) %>%filter(stage =="GEN") %>%filter(party %in%c("DEMOCRAT", "REPUBLICAN")) %>%group_by(state_fips, district, party) %>%summarise(party_vote =sum(candidatevotes) ) -> house_2020_df# Reshape data and calculate Dem and Rep vote shareshouse_2020_df %>%pivot_wider(names_from = party,values_from = party_vote) %>%mutate(dem_voteshare =case_when(is.na(DEMOCRAT) ~0,is.na(REPUBLICAN) ~100, T ~ DEMOCRAT/(DEMOCRAT+REPUBLICAN) *100 ),rep_voteshare =case_when(is.na(DEMOCRAT) ~100,is.na(REPUBLICAN) ~0, T ~ REPUBLICAN/(DEMOCRAT+REPUBLICAN) *100 ),winner = forcats::fct_rev(factor(ifelse(rep_voteshare > dem_voteshare,"Republican","Democrat"))) ) -> house_2020_df# ---- 2020 CES ----# Fix district numbering for merging # Single district states are 0 in house data, but 1 in CESces %>%group_by(inputstate) %>%mutate(n_districts =length(unique(cdid116)) ) -> cesces %>%ungroup() %>%mutate(# Create common variables for mergingdistrict =ifelse(n_districts ==1, 0, as.numeric(cdid116)),state_fips = inputstate,# Vote Choicevalidated_vote =ifelse(!is.na(CL_2020gvm), 1, 0),voted =ifelse(validated_vote ==1, "Voter", "Non-voter"),# Partisanshippid_7pt =ifelse(pid7 >7, NA, pid7),pid_7pt_f =as_factor(pid7),is_str_dem =ifelse(pid7 ==1, 1, 0),is_wk_dem =ifelse(pid7 ==2, 1, 0),is_ln_dem =ifelse(pid7 ==3, 1, 0),is_ind =ifelse(pid7 ==4, 1, 0),is_ln_rep =ifelse(pid7 ==5, 1, 0),is_wk_rep =ifelse(pid7 ==6, 1, 0),is_str_rep =ifelse(pid7 ==7, 1, 0),# Ideologyideology =ifelse(ideo5 ==6, NA, ideo5),medicare4all =ifelse(CC20_327a ==1, 1,0),build_the_wall =ifelse(CC20_331e ==1, 1,0),interest =ifelse( newsint >4, NA, (newsint -4)*-1 ),pk_1 =ifelse(CC20_310a ==2, 1, 0),pk_2 =ifelse(CC20_310b ==1, 1, 0),politically_aware =ifelse(pk_1 + pk_2 ==2, 1, 0) ) -> ces# ----- Merge Data ----df <- ces %>%left_join(house_2020_df)
# Figuresdf %>%filter(!is.na(pid_7pt)) %>%ggplot(aes(pid_7pt_f, politically_aware, fill = pid_7pt)) +stat_summary(,geom ="bar")+coord_flip() +theme_minimal() +scale_fill_gradient2(low ="darkblue",mid ="grey",high ="darkred", midpoint =4)+labs(x ="",y ="Percent knowing which parties control House and Sentate" ) +guides(fill ="none")+scale_y_continuous(limits =c(0,1),labels = scales::percent_format(scale =100)) -> fig1fig2 <- fig1 +facet_wrap(~voted,ncol =1)df %>%filter(!is.na(pid_7pt)) %>%ggplot(aes(rep_voteshare, medicare4all, col = pid_7pt_f, group = pid_7pt_f))+geom_smooth(method ="gam")+scale_y_continuous(limits =c(0,1),labels = scales::percent_format(scale =100))+scale_x_continuous(labels = scales::percent_format(scale =1))+scale_colour_manual(values =c("darkblue","blue","lightblue","darkgrey","pink","red","darkred"))+theme_minimal()+labs(col="",y ="",x ="Republican Vote Share",title ="Percent supporting Medicare for All by partisanship and district vote share") -> fig3df %>%filter(!is.na(pid_7pt)) %>%ggplot(aes(rep_voteshare, build_the_wall, col = pid_7pt_f, group = pid_7pt_f))+geom_smooth(method ="gam")+scale_y_continuous(limits =c(0,1),labels = scales::percent_format(scale =100))+scale_x_continuous(labels = scales::percent_format(scale =1))+scale_colour_manual(values =c("darkblue","blue","lightblue","darkgrey","pink","red","darkred"))+theme_minimal()+labs(col="",y ="",x ="Republican Vote Share",title ="Percent supporting building border wall by partisanship and district vote share") -> fig4
People categorize themselves and others based on internal and external criteria
Identification
Affinity
Membership
Comparison
We vs I, Us vs Them, In-group vs Out-group
Tend to maximize similarities with in-groups and differences with out-groups
Intersectionality of Social Identities
The term intersectionality references the critical insight that race, class, gender, sexuality, ethnicity, nation, ability, and age operate not as unitary, mutually exclusive entities, but rather as reciprocally constructing phenomena (Collins 2015)
Yes, but how do we study identities in an intersectional manner?
Social Identity and Group Interaction Cramer (2004)
When we conceptualize identity on the level of group interaction, we bridge the individual-level psychological nature of identities and the social processes that create them. (p. 53)
Talking About Politics
Talking About Politics
Talking About Politics
Social Identity Theory in Practice
Social identities are:
Socially constructed
Vary in strength and salience
Relational and intersecting
Critiquing Democracy for Realists
Critiquing Democracy for Realists
Huddy’s critiques:
Group politics is not a hollow exercise
Group-related concerns are legitimate and powerful causes for democratic action
Group-identities are not monolithic and vary in strength and effects
Group politics is not a hollow exercise
Men’s shifting positions on abortion confirm Achen and Bartels’s view that partisan loyalties are far more influential than political beliefs and ideology, leading them to conclude that “ even in the context of hot button issues” such as abortion, “ most people make their party choices based on who they are rather than what they think” But this conclusion is difficult to reconcile with the authors’ own evidence that women shifted their partisanship to identify with the party that better matched their views on abortion. This is not hollow tribal politics. (p. 4)
Group-related concerns are legitimate and powerful causes for democratic action
In sum, group-linked economic and status considerations shape partisan political preferences among group members. This process may not conform to the ideals of a fully informed democratic citizenry among whom each issue is considered on its merits, but it does suggest a reason- able basis for the public’s political decision making. Feminist women, African Americans, or Latinos who support the Democratic Party and evangelical Christians who support the Republican Party because they believe it is more likely to serve their collective interests are not entirely wrong in their estimate of which party is better for their group (Layman and Carsey 2002; Wolbrecht 2000). (p. 9)
Group-identities are not monolithic and vary in strength and effects
Levels of identification with politically relevant social groups thus vary among individuals, such that group political influence is far from monolithic. Those most strongly identified with a social group will be most likely to support the party seen to further the group’s interests. This process intensifies when social identities align, leading to an especially strong partisan identity. But there are many people who don’t conform to group dictates, do so weakly, or have cross-cutting social identities. Groups shape partisan loyalties, but with greater nuance than acknowledged by Achen and Bartels. (p. 10)
Critiquing Democracy for Realists
Huddy’s critiques:
Group politics is not a hollow exercise
Group-related concerns are legitimate and powerful causes for democratic action
Group-identities are not monolithic and vary in strength and effects
How would Achen and Bartels respond?
What other critiques would we raise?
Parties and Polarization
What’s a political party?
Many definitions of political parties:
Instrumental
Organizational
Coalitional
Instrumental: Parties Exist to Win Electoral Office
Schattschneider (1944): Parties are “first of all an organized attempt to get power”
Schlessinger (1991): “A political party is a group organized to gain control of government in the name of the group by winning election to public office.”
Organizational: PIG-PIE-PO
V.O. Key offers an organizational view of parties highlighting the distinctions between:
Parties in Government
Elected officials
Parties in the Electorate
People who identify with a party
Party Organization
People who work for local, state, and national parties
“Political parties can be seen as coalitions of elites to capture and use political office. [But] a political party is more than a coalition. A political party is an institutionalized coalition, one that has adopted rules, norms, and procedures.” (Aldrich 1995)
Parties as Coalitions of Policy Demanding Groups
Parties in the United States are best understood as coalitions of interest groups and activists seeking to capture and use government for their particular goals, which range from material self interest to high-minded idealism.
The coalition of policy-demanding groups develops an agenda of mutually acceptable policies, insists on the nomination of candidates with a demonstrated commitment to its program, and works to elect these candidates to office. (Bawn et al. 2012)
Poltical Parties
Parties are complex.
Instrumental
Organizational
Coalitional
Group-centric definitions help explain
Behavior of parties
Strength of partisanship as a social identity
Partisan Identification
Generally speaking
Do you think of yourself as a…
Democrat
Republican
Independent
Other
If Democrat/Republican
Would you call yourself a…
Not very strong Democrat/Republican
Strong Democrat/Republican
If Independent/Other
Would you consider yourself closer to…
The Republican Party
The Democratic Party
Neither
Independent leaners tend to look a lot like partisans.
The importance of party identication reects the fact that—unlike particular social identities, which may come and go as electoral forces—partisanship is relevant in nearly all elections. It shapes voting behavior, of course. But beyond that, each party organizes the thinking of its adherents. A party constructs a conceptual viewpoint by which its voters can make sense of the political world. … like particular social identities tied to the special interests of groups, the reach of partisanship is very broad. For the voters who identify with a party, partisanship pulls together conceptually nearly every aspect of electoral politics. (Achen and Bartels 2017)
Partisanship and the American Voter
Partisanship is an enduring psychological attachment:
Formed early in life
Transmitted via socialization
Acts as a screen perceptual screen
Shapes policy beliefs and vote choice
Partisanship and the American Voter
Partisanship was conceptualized as a psychological identification with a party…. , partisans are partisan because they think they are partisan. They are not necessarily partisan because they vote like a partisan, or think like a partisan, or register as a partisan, or because someone else thinks they are a partisan. In a strict sense, they are not even partisan because they like one party more than another. Partisanship as party identification is entirely a matter of self-definition” (Campbell et al. 1986)
Partisanship and the American Voter
Are voters “fools” (Key 1966) blindly following partisan attachments
How can we reconcile partisanship with retrospective voting?
Partisanship as a Running Tally
Attempt by Fiorina (1978) to offer a rational explanation for:
Stability of partisanship
Predictive power of partisanship
Conditions in which partisanship might change
Partisanship as a Running Tally
Individuals begin life as issue voters, but how to process tidal wave of issues?
Partisanship acts as a running tally, a summary of voter’s retrospective evaluations
Evidence:
Simple retrospective evaluations predict partisan identification (voters direct experiences)
Mediated retrospective evaluations (voters experiences mediated through evaluations)
How has affective polarization changed since 2016?
How does affective polarization vary by partisan strenght?
library(tidyverse)library(haven)library(ggridges)load("../files/data/nes_affectivepol.rda")df %>%filter(!is.na(affective_polarization)) %>%ggplot(aes(year, ft_in_party, col ="In Party"))+stat_summary()+stat_summary(aes(y=ft_out_party, col ="Out Party"))+stat_summary(aes(y=affective_polarization, col ="Affective Polarization"))+theme_minimal()+labs(col ="",y="Feeling Thermometer Ratitings",x="Year") -> fig_ap1fig_ap1 +facet_wrap(~pid_7pt_f)+theme(legend.position ="bottom") -> fig_ap2df %>%ggplot(aes(x=ft_in_party, factor(year)))+geom_density_ridges(fill="blue",alpha=.5)+geom_density_ridges(aes(x=ft_out_party), fill="red", alpha=.5)+labs(y="",x ="Feelings toward Out Party (Red) and In Party (Blue)") -> fig_ap3
Implicit Association Tests
Implicit Association Tests Reveal Partisan Bias
Partisan Bias Larger With Explicit Measures
Implicit Partisan Bias May be Larger than Implicit Racial Bias
Affective Polarization Has Behavioral Consequences
Origins of Affective Polarization
Potential causes of affective polarization:
Partisan sorting → reinforcing social identities
High Choice/Polarized Media environment
Political campaigns
Homophily and social networks
However the evidence is often mixed or conflicting reflecting ongoing debates and research
Consequences of Affective Polarization
Iyengar et al. highlight the potential non-political consequences of affective polarization in a number of areas:
Relationships and social interactions
Economic decisions
Medical decisions
Did anything strike you as particularly important, concerning, or questionable?
Druckman et al. (2022)
(Mis)estimating Affective Polarization
Take a few moments to review
What’s the research question
What’s the theoretical framework
What’s the empirical design
What are the results
What are the conclusions
What’s the research question
How much of affective polarization is due to misperceptions of the other party’s voters?
What’s the theoretical framework
Druckman et al. are contributing to the broader debate on affective polarization. They make four claims
H1. People overestimate the ideology and political engagement of out-partisans.
H2. Out-party animus will be higher when out-party targets are ideologically extreme
H3. Out-party animus will be higher when out-party targets are more politically engaged
H4. Affective polarization will differ according to whether the out-party targets are ideologically extreme and engaged.
What’s the empirical design
Survey Experimental Design with a 3-wave panel
Outcome: Summary scale of four measures of affective polarization
Experimental Treatment
## What are the results
What’s the evidence people:
overestimate the ideological extremity and enagement of outpartisans
this leads to greater out-party animus
which is greater than if folks had more accurate views
People overestimate the ideology and political engagement of out-partisans.
## {.smaller} ### Outparty Extremity and Engagement Increases Affective polarization
When people think of the out-party, they’re imagining the extremes
What are the conclusions
Affective polarization is an “illusion” in the sense that when people are asked to evaluate a more accurate version of the out party, they do so more positively
The irony seems to be that folk-theory type citizen (engaged, ideological) exacerbates affective polarization.
If it looks like you’re copying and pasting from a LLM, we will have a chat…
References
References
Achen, Christopher H, and Larry M Bartels. 2017. Democracy for realists: Why elections do not produce responsive government. Princeton University Press.
Druckman, James N, Samara Klar, Yanna Krupnikov, Matthew Levendusky, and John Barry Ryan. 2022. “(Mis)estimating Affective Polarization.”The Journal of Politics 84 (2): 1106–17.
Huddy, Leonie. 2018. “The Group Foundations of Democratic Political Behavior.”Critical Review 30 (1-2): 71–86.
Iyengar, Shanto, Yphtach Lelkes, Matthew Levendusky, Neil Malhotra, and Sean J Westwood. 2019. “The Origins and Consequences of Affective Polarization in the United States.”Annual Review of Political Science 22 (1): 129–46.
West, Emily A, and Shanto Iyengar. 2022. “Partisanship as a social identity: Implications for polarization.”Political Behavior 44 (2): 807–38.
Social Identity Theory