History Embedded in Physical Spaces - Study 4: Measuring Threat

The main purpose of study 4 was to directly measure whether UVA students experience more identity threat when they are closer in physical proximity to the sites of historical wrongdoings that UVA has committed.

We have previously hypothesized that being in close proximity to the sites of an institution’s wrongdoings will produce greater threat, which will in turn prompt people to mitigate threat by perceiving institutional discontinuity or by perceiving more temporal distance between themselves and the historical wrongdoings. In study 3, we measured the distal outcomes - i.e. attempts to mitigate threat by increases in institutional discontinuity or increases in temporal distance. In study 4, we attempt to measure identity threat directly.

Participants were recruited as passerby. They were offered a free bagel for their participation in a study. Participants were recruited in two locations: in front of the West Complex and in front of Gilmer. Participants were collected between 11AM and 1PM on the following days:

WEST:

  • 04/16
  • 04/18
  • 04/21
  • 04/23

GILMER:

  • 04/28
  • 04/30

Procedure

Researchers offered passerbys a free bagel for participating in a “5 minute study” as they passed by the research team’s recruitment table. People who indicated interest approached the table, where a researcher would record their computing ID (or for non-students, their email address) and record a participant ID. A second researcher would prepare the Qualtrics survey on an iPad, then hand the iPad to the participant. When recruitment was at the West Complex, researchers would note to the participant that the study was about the West Complex, and point out that they were standing in front of the building. When recruitment was at Gilmer, no such note was shared with the participants. Participants were then encouraged to take a seat at one of five seats that were set in the shade to complete the survey.

After consenting, participants read directions that they were going to read about a story about historical events that occurred on Grounds.

Participants that were at the West complex read: “You are currently standing in front of the West Complex, a historic building on Grounds. The West Complex housed UVA’s first Medical School.”

Participants that were at Gilmer read: “You are currently standing in front of Gilmer Hall, a building that was renovated recently. Gilmer Hall houses UVA’s Psychology and Biology departments.” Due to a researcher’s error, the incorrect message appeared for some Gilmer participants. We elected to remove those participants’ data from analysis.

Participants then viewed the following article. They were not able to proceed for at least 20 seconds to encourage them to read the article in full.

Participants then responded to a number of measure to capture their experiences of identity threat and their perceptions of UVA’s institutional continuity and the temporal and physical distances between UVA’s past and present.

DVs

Perceived identity threat (Roth et al., 2017) [1 = strongly disagree, 6 = strongly agree]

  1. The content of the article makes me worried.
  2. The content of the article gives me a good feeling. reversed
  3. The content of the article makes me feel threatened.
  4. Given the article I just read, I feel threatened in my identity.
  5. The UVA history described in the article constitutes a threat to me personally.
  6. The UVA history described in the article contributes to the depreciation of my image.
  7. The UVA history described in the article contributes to the preservation of my values and customs. reversed
  8. The UVA history described in the article constitutes a cultural enrichment for me personally. reversed
  9. If many other articles like this exist, it would be worrisome to me.

Geospatial distance

  1. Think about the location where eugenics was practiced on UVa grounds. How far away does that feel to you? Use the slider below to indicate how far away where eugenics was practiced on UVa Grounds feels to you currently.

Institutional Physical Continuity [1 = totally disagree, 7 = totally agree]

  1. The physical aesthetic of UVA has remained constant over time
  2. UVa’s hallmark buildings have endured over time
  3. UVa has significantly changed its architecture throughout its history
  4. UVa has changed the way it looks throughout history 
  5. The people who run UVA today have a different vision for the university than people who have run UVA in the past
  6. UVA leadership has largely taken the same approach to running the university throughout the university’s history

Institutional continuity [1 = totally disagree, 7 = totally agree]

  1. The university’s founding values and worldview have endured over time.
  2. The University of Virginia will always be characterized by specific traditions and beliefs
  3. UVa has changed its traditions and customs throughout history reversed
  4. There is a causal link between different events in UVa history
  5. Major phases in UVa history are linked to one another
  6. There is no connection between past, present, and future events at the university reversed
  7. The value UVa places on diverse people and ideas has been stable over time
  8. The rules about who can enroll as a student are different now than when the university was founded reversed
  9. Institutional messaging about who is welcome at UVa has been continuous throughout its history

Temporal distance

  1. The past may feel quite close or far away, regardless of the amount of time that has actually passed. Think about when UVa’s eugenics practices began. How far away in time does the practice of eugenics at UVA feel to you? Use the slider below to indicate how far away in time the practice of eugenics at UVa feels from the present.

Ingroup identification [1 = not at all, 7 = very much so]

  1. How important is UVa to your own personal identity?
  2. How similar do you feel in attitudes and opinions to other UVa students?
  3. How strongly do you identify as a UVa student?

Ingroup regard [1 = strongly disagree, 7 = strongly agree]

  1. I am proud to be a UVa student
  2. I am happy to be a UVa student
  3. I feel good about UVa

Familiarity with history:

  • have you heard of this history before? [yes/no/not sure]
  • how familiar were you with this history? [1 = not familiar, 7 = very familiar]

Familiarity with the West Complex

  • Before this study, how familiar were you with the West Complex building? [i had never been to the West Complex, I have been 1 - 2 times, I have been several times, I regularly work in or attend classes]
show code
study4_raw = read.csv('study 4 - measuring threat/study4.csv', stringsAsFactors = TRUE) %>% filter(Progress == 100)

computingIDs_study4 = read.csv('study 4 - measuring threat/Bagling Participant List.csv') #download list of computing IDs from bagling
computingIDs_study3 = read.csv('study 3 - in lab study/study3.csv') %>% select(computID) #load list of computing IDs from in lab study

#which(computingIDs_study4$ComputingID.OR.email %in% computingIDs_study3$computID) #check whether any in lab participant were in baglign study. looks like PID #29 had already participated in the in lab study and should be excluded

We collected a total of 154 complete responses.

Exclusions:

  • PIDs 72 - 85 were collected at Gilmer but recorded as West, and viewed the wrong intro message. Should be excluded.

  • PID 29 had participated in the in-lab study and should be excluded

  • PIDs 28, 32, 40, 62 were not current students and should be excluded. Though 28 and 32 were incoming students, so we may revisit this decision later.. tbd)

  • PID 81: Pictures (of the historic west complex) didn’t load

Final N counts:

show code
study4_raw = study4_raw %>% filter(!PID %in% c(28, 29, 32, 40, 62, 72:85))  #exclusions

study4 = study4_raw %>% 
  mutate(across(c('threat_2', 'threat_7', 'threat_8'), ~ 7-.)) %>% #reverse score relevant items
  mutate(across(c("physicalContinuity_3","physicalContinuity_4", "physicalContinuity_5",
                  "institutionContinuit_3", "institutionContinuit_6", "institutionContinuit_8"), ~ 8 - .)) %>%  
  mutate(identityThreat = rowMeans(select(.,matches("threat")), na.rm=TRUE), #collapse relevant scales
         physicalContinuity = rowMeans(select(.,matches("physicalContinuity")), na.rm=TRUE), 
          physicalContinuity_buildingsSubscale = rowMeans(select(.,c('physicalContinuity_1','physicalContinuity_2','physicalContinuity_3','physicalContinuity_4')), na.rm=TRUE), 
          physicalContinuity_peopleSubscale = rowMeans(select(.,c("physicalContinuity_5","physicalContinuity_6")), na.rm=TRUE), 
         institutionalContinuity = rowMeans(select(.,matches("institutionContinuit")), na.rm=TRUE),
         institutionalContinuity_cultural = rowMeans(select(.,c('institutionContinuit_1', 'institutionContinuit_2', 'institutionContinuit_3')), na.rm=TRUE),
         institutionalContinuity_temporal = rowMeans(select(.,c('institutionContinuit_4', 'institutionContinuit_5', 'institutionContinuit_6')), na.rm=TRUE),
         institutionalContinuity_diversity = rowMeans(select(.,c('institutionContinuit_7', 'institutionContinuit_8', 'institutionContinuit_9')), na.rm=TRUE),
         ingroupIdentification = rowMeans(select(.,matches("ingroupID")), na.rm=TRUE),
         ingroupRegard = rowMeans(select(.,matches("ingroupUVA_regard")), na.rm=TRUE)) %>% 
  select(PID, condition, identityThreat, physicalContinuity, physicalContinuity_buildingsSubscale, physicalContinuity_peopleSubscale, institutionalContinuity, institutionalContinuity_cultural, institutionalContinuity_temporal, institutionalContinuity_diversity, ingroupIdentification, ingroupRegard, Race, year, articleTiming_Page.Submit, physicalDistance, temporalDistance, familiarWest, heardBefore) 

nice_table(study4 %>% group_by(condition)  %>%  count(), title = 'N per condition')
nice_table(study4 %>% group_by(familiarWest)  %>%  count(), title = "Participants' familiarity with the West complex")
nice_table(study4 %>% group_by(heardBefore)  %>%  count(), title = "Participants' familiarity with the history of the West Complex")

N per condition

condition

n

Gilmer

69

West

64

Participants' familiarity with the West complex

familiarWest

n

1

83

2

23

3

18

4

9

Participants' familiarity with the history of the West Complex

heardBefore

n

1

78

2

44

3

11

Power: N = 133 (n = 69 and n = 64) affords us 80% power to detect an effect size of at least d = 0.49 in a two-tailed t-test.

Preliminary Analyses

Time spent reading article

show code
ggdotplot(data=study4, x='condition', y = 'articleTiming_Page.Submit',color='condition', add = c("violin", "mean_se"), size=0.35, legend='none')+
  geom_hline(yintercept=20, color='black', linetype='longdash')
Bin width defaults to 1/30 of the range of the data. Pick better value with
`binwidth`.

Correlations

show code
ggcorrplot(round(cor(study4 %>% select(-condition,-PID,-Race), use='complete.obs'), 3),
           hc.order = TRUE, type = "upper", outline.color = "white", ggtheme = ggplot2::theme_gray, colors = c("#E46726", "white","#6D9EC1" ), lab=TRUE, digits=1)

Correlations of note:

  • time spent reading article (articleTiming_Page.Submit) negatively correlated with institutional continuity - driven by negative correlation with diversity continuity.

  • identity threat negatively correlated with physical distance

  • temporal distance correlated with ingroup regard

  • temporal distance correlated with physical distance

  • identity threat negatively correlated with time spent reading article

  • ingroup regard correlated with physical and temporal distance

Inspecting the threat measure

In the following analyses, items are raw and NOT reverse scored

show code
threatPCA = select(study4_raw, starts_with("threat")) %>% 
  filter(!if_any(everything(), is.na)) %>% 
  princomp(.)

threatPCA$loadings

Loadings:
         Comp.1 Comp.2 Comp.3 Comp.4 Comp.5 Comp.6 Comp.7 Comp.8 Comp.9
threat_1  0.275  0.184  0.800  0.158                0.452  0.124       
threat_2  0.165 -0.302 -0.412 -0.166  0.142 -0.282  0.730  0.211       
threat_3  0.413  0.132 -0.203  0.315               -0.111  0.501 -0.633
threat_4  0.367  0.134 -0.208  0.187         0.294 -0.153  0.312  0.745
threat_5  0.405        -0.206  0.375 -0.105  0.173  0.203 -0.751       
threat_6  0.400                       0.517 -0.636 -0.368 -0.134  0.102
threat_7  0.153 -0.688  0.163         0.453  0.495 -0.134              
threat_8  0.240 -0.554  0.186        -0.675 -0.329 -0.181              
threat_9  0.433  0.237        -0.815 -0.174  0.196               -0.113

               Comp.1 Comp.2 Comp.3 Comp.4 Comp.5 Comp.6 Comp.7 Comp.8 Comp.9
SS loadings     1.000  1.000  1.000  1.000  1.000  1.000  1.000  1.000  1.000
Proportion Var  0.111  0.111  0.111  0.111  0.111  0.111  0.111  0.111  0.111
Cumulative Var  0.111  0.222  0.333  0.444  0.556  0.667  0.778  0.889  1.000
show code
biplot(threatPCA, col=c('white','red'))

show code
plot(threatPCA, type='l')

show code
cat('MEANS and SEs BY ITEM')
MEANS and SEs BY ITEM
show code
threatMeasure_long = study4_raw %>% select(starts_with("threat"),condition) %>% 
  pivot_longer(starts_with("threat"),names_to='item') 

ggerrorplot(threatMeasure_long, x = 'item', y = 'value', color='item')+
  geom_jitter(aes(color=item), alpha=0.15)+
  theme(legend.position = 'none', axis.text.x = element_text(angle = 90, vjust = 0.5, hjust=1))+
  facet_wrap('condition')

show code
nice_table(threatMeasure_long %>% group_by(item) %>%  
  t_test(value ~ condition, paired = FALSE, var.equal=TRUE) %>% mutate(p = round(p, 3)) %>% 
  inner_join(cohens_d(threatMeasure_long %>% group_by(item), value~condition, paired=FALSE))%>%  
  select(item, statistic, df, p, effsize),
  title="t tests: items by condition")

t tests: items by condition

item

statistic

df

p

effsize

threat_1

2.67

129

.009**

0.46

threat_2

1.38

130

.169

0.24

threat_3

0.76

131

.450

0.13

threat_4

1.34

130

.182

0.23

threat_5

1.48

130

.140

0.26

threat_6

1.25

131

.213

0.22

threat_7

1.83

130

.069

0.32

threat_8

1.91

131

.059

0.33

threat_9

0.72

131

.475

0.12

Perceived identity threat (Roth et al., 2017) [1 = strongly disagree, 6 = strongly agree]

  1. The content of the article makes me worried.

  2. The content of the article gives me a good feeling. reversed

  3. The content of the article makes me feel threatened.

  4. Given the article I just read, I feel threatened in my identity.

  5. The UVA history described in the article constitutes a threat to me personally.

  6. The UVA history described in the article contributes to the depreciation of my image.

  7. The UVA history described in the article contributes to the preservation of my values and customs. reversed

  8. The UVA history described in the article constitutes a cultural enrichment for me personally. reversed

  9. If many other articles like this exist, it would be worrisome to me.

Main analyses

Threat

**NOTE: Full scale is 1 - 6

show code
ggerrorplot(study4, x = 'condition', y = 'identityThreat', color='condition', ylim=c(2, 4))
nice_table(study4 %>% 
  t_test(identityThreat ~ condition, paired = FALSE, var.equal=TRUE) %>% mutate(p = round(p, 3)) %>% 
  inner_join(cohens_d(study4, identityThreat~condition, paired=FALSE)) %>%  
  select(statistic, df, p, effsize),
  title="t test: identity threat predicted by condition")

t test: identity threat predicted by condition

statistic

df

p

effsize

0.51

131

.608

0.09

Physical and temporal distance

show code
ggerrorplot(study4, x = 'condition', y = 'physicalDistance', color='condition', ylim=c(40, 60))
nice_table(study4 %>% 
  t_test(physicalDistance ~ condition, paired = FALSE, var.equal=TRUE) %>% mutate(p = round(p, 3)) %>% 
  inner_join(cohens_d(study4, physicalDistance~condition, paired=FALSE)) %>%  
  select(statistic, df, p, effsize),
  title="t test: physical distance predicted by condition")
ggerrorplot(study4, x = 'condition', y = 'temporalDistance', color='condition', ylim=c(45, 65))
nice_table(study4 %>% 
  t_test(temporalDistance ~ condition, paired = FALSE, var.equal=TRUE) %>% mutate(p = round(p, 3)) %>% 
  inner_join(cohens_d(study4, temporalDistance~condition, paired=FALSE)) %>%  
  select(statistic, df, p, effsize),
  title="t test: temporal distance predicted by condition")

t test: physical distance predicted by condition

statistic

df

p

effsize

0.71

124

.477

0.13

t test: temporal distance predicted by condition

statistic

df

p

effsize

-1.37

130

.173

-0.24

Physical space as predictor for threat, continuity, temporal distance

show code
#identity threat
ggscatter(study4, x='physicalDistance', y = 'identityThreat', color='condition', position='jitter',add = 'reg.line', alpha=0.3, title='Identity Threat')
summary(lm(data=study4, identityThreat ~ physicalDistance * condition))
#institutional continuity
ggscatter(study4, x='physicalDistance', y = 'institutionalContinuity', color='condition', position='jitter',add = 'reg.line', alpha=0.3, title='Institutional Continuity')
summary(lm(data=study4, institutionalContinuity ~ physicalDistance * condition))
#temporal distasnce
ggscatter(study4, x='physicalDistance', y = 'temporalDistance', color='condition', position='jitter',add = 'reg.line', alpha=0.3, title='Temporal Distance')
summary(lm(data=study4, institutionalContinuity ~ temporalDistance * condition))


Call:
lm(formula = identityThreat ~ physicalDistance * condition, data = study4)

Residuals:
     Min       1Q   Median       3Q      Max 
-1.74578 -0.45510  0.01026  0.41712  1.98912 

Coefficients:
                                Estimate Std. Error t value Pr(>|t|)    
(Intercept)                     3.915063   0.179544  21.806  < 2e-16 ***
physicalDistance               -0.008464   0.003204  -2.642  0.00932 ** 
conditionWest                  -0.251671   0.241192  -1.043  0.29881    
physicalDistance:conditionWest  0.003129   0.004356   0.718  0.47391    
---
Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

Residual standard error: 0.6829 on 122 degrees of freedom
  (7 observations deleted due to missingness)
Multiple R-squared:  0.08033,   Adjusted R-squared:  0.05771 
F-statistic: 3.552 on 3 and 122 DF,  p-value: 0.0165


Call:
lm(formula = institutionalContinuity ~ physicalDistance * condition, 
    data = study4)

Residuals:
     Min       1Q   Median       3Q      Max 
-1.53300 -0.40599  0.08202  0.29836  1.36106 

Coefficients:
                                Estimate Std. Error t value Pr(>|t|)    
(Intercept)                     3.703751   0.150827  24.556   <2e-16 ***
physicalDistance                0.001463   0.002691   0.544    0.588    
conditionWest                   0.266803   0.202615   1.317    0.190    
physicalDistance:conditionWest -0.001377   0.003659  -0.376    0.707    
---
Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

Residual standard error: 0.5736 on 122 degrees of freedom
  (7 observations deleted due to missingness)
Multiple R-squared:  0.03222,   Adjusted R-squared:  0.008426 
F-statistic: 1.354 on 3 and 122 DF,  p-value: 0.2601


Call:
lm(formula = institutionalContinuity ~ temporalDistance * condition, 
    data = study4)

Residuals:
     Min       1Q   Median       3Q      Max 
-1.44880 -0.33742  0.04754  0.32264  1.47311 

Coefficients:
                                Estimate Std. Error t value Pr(>|t|)    
(Intercept)                     4.155431   0.177783  23.374   <2e-16 ***
temporalDistance               -0.006640   0.003107  -2.137   0.0345 *  
conditionWest                   0.012926   0.256127   0.050   0.9598    
temporalDistance:conditionWest  0.002972   0.004255   0.698   0.4862    
---
Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

Residual standard error: 0.5716 on 128 degrees of freedom
  (1 observation deleted due to missingness)
Multiple R-squared:  0.06156,   Adjusted R-squared:  0.03956 
F-statistic: 2.799 on 3 and 128 DF,  p-value: 0.04274

Ingroup ID

show code
#ingroup id
ggerrorplot(study4, x = 'condition', y = 'ingroupIdentification', color='condition', ylim=c(3, 5))

show code
#ingroup regard
ggerrorplot(study4, x = 'condition', y = 'ingroupRegard', color='condition', ylim=c(3, 5))

show code
#ingroup ID X threat
ggscatter(study4, x='ingroupIdentification', y = 'identityThreat', color='condition', position='jitter',add = 'reg.line', alpha=0.3, title='threat predicted by ingroup ID',conf.int = TRUE)

show code
#ingroup regard X threat
ggscatter(study4, x='identityThreat', y = 'ingroupRegard', color='condition', position='jitter',add = 'reg.line', alpha=0.3, title='threat predicted by ingroup regard',conf.int = TRUE)

show code
summary(lm(data=subset(study4, condition=='West'), ingroupRegard~identityThreat))

Call:
lm(formula = ingroupRegard ~ identityThreat, data = subset(study4, 
    condition == "West"))

Residuals:
    Min      1Q  Median      3Q     Max 
-1.8619 -0.7353  0.1546  0.6957  1.6979 

Coefficients:
               Estimate Std. Error t value Pr(>|t|)    
(Intercept)      5.9155     0.5934   9.969 1.68e-14 ***
identityThreat  -0.2963     0.1691  -1.752   0.0847 .  
---
Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

Residual standard error: 0.9256 on 62 degrees of freedom
Multiple R-squared:  0.04717,   Adjusted R-squared:  0.03181 
F-statistic:  3.07 on 1 and 62 DF,  p-value: 0.08472
show code
summary(lm(data=subset(study4, condition=='Gilmer'), ingroupRegard~identityThreat))

Call:
lm(formula = ingroupRegard ~ identityThreat, data = subset(study4, 
    condition == "Gilmer"))

Residuals:
    Min      1Q  Median      3Q     Max 
-3.8358 -0.5681  0.0767  0.7981  1.2845 

Coefficients:
               Estimate Std. Error t value Pr(>|t|)    
(Intercept)     4.52953    0.59919   7.559  1.5e-10 ***
identityThreat  0.09844    0.16768   0.587    0.559    
---
Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

Residual standard error: 0.9801 on 67 degrees of freedom
Multiple R-squared:  0.005117,  Adjusted R-squared:  -0.009732 
F-statistic: 0.3446 on 1 and 67 DF,  p-value: 0.5591
show code
#threat * physical distance -> ingroup regard
ggscatter(study4, x='identityThreat', y = 'ingroupRegard', color='condition', position='jitter',add = 'reg.line', alpha=0.3, title='threat predicted by ingroup regard',conf.int = TRUE)

show code
interaction_model=lm(data=study4, ingroupRegard~identityThreat*physicalDistance)

interact_plot(interaction_model, pred = 'physicalDistance', modx='identityThreat', interval=TRUE, plot.points=TRUE)

show code
interaction_model=lm(data=study4, identityThreat~ingroupRegard*physicalDistance)

interact_plot(interaction_model, pred = 'ingroupRegard', modx='physicalDistance', interval=TRUE, plot.points=TRUE)

Physical Continuity subscale

show code
ggerrorplot(study4, x = 'condition', y = 'physicalContinuity', color='condition', ylim=c(3, 5))

show code
summary(lm(data=study4, physicalContinuity ~ condition))

Call:
lm(formula = physicalContinuity ~ condition, data = study4)

Residuals:
     Min       1Q   Median       3Q      Max 
-1.61979 -0.45312 -0.01932  0.38021  1.98068 

Coefficients:
              Estimate Std. Error t value Pr(>|t|)    
(Intercept)    4.01932    0.07605  52.851   <2e-16 ***
conditionWest  0.26713    0.10963   2.437   0.0162 *  
---
Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

Residual standard error: 0.6317 on 131 degrees of freedom
Multiple R-squared:  0.04336,   Adjusted R-squared:  0.03606 
F-statistic: 5.937 on 1 and 131 DF,  p-value: 0.01617
show code
physicalContinuityPCA = select(study4_raw, starts_with("physicalContinuity")) %>% 
  filter(!if_any(everything(), is.na)) %>% 
  princomp(.)

physicalContinuityPCA$loadings

Loadings:
                     Comp.1 Comp.2 Comp.3 Comp.4 Comp.5 Comp.6
physicalContinuity_1  0.356  0.122  0.657         0.454  0.468
physicalContinuity_2  0.105  0.140  0.339 -0.291  0.276 -0.833
physicalContinuity_3 -0.667 -0.199 -0.128 -0.242  0.651  0.131
physicalContinuity_4 -0.628  0.219  0.530  0.426 -0.300       
physicalContinuity_5 -0.148  0.529        -0.735 -0.302  0.251
physicalContinuity_6        -0.773  0.390 -0.366 -0.337       

               Comp.1 Comp.2 Comp.3 Comp.4 Comp.5 Comp.6
SS loadings     1.000  1.000  1.000  1.000  1.000  1.000
Proportion Var  0.167  0.167  0.167  0.167  0.167  0.167
Cumulative Var  0.167  0.333  0.500  0.667  0.833  1.000
show code
biplot(physicalContinuityPCA, col=c('white','red'))

show code
plot(physicalContinuityPCA, type='l')

show code
### identity threat predicted by physical continuity
ggscatter(study4, x='physicalContinuity', y = 'identityThreat', color='condition', position='jitter',add = 'reg.line', alpha=0.3, title='threat predicted by physical continuity',conf.int = TRUE)

show code
summary(lm(data=study4, identityThreat~physicalContinuity))

Call:
lm(formula = identityThreat ~ physicalContinuity, data = study4)

Residuals:
     Min       1Q   Median       3Q      Max 
-1.68609 -0.44244  0.04884  0.44644  1.93773 

Coefficients:
                   Estimate Std. Error t value Pr(>|t|)    
(Intercept)         3.20679    0.39690    8.08 3.74e-13 ***
physicalContinuity  0.06427    0.09456    0.68    0.498    
---
Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

Residual standard error: 0.6991 on 131 degrees of freedom
Multiple R-squared:  0.003514,  Adjusted R-squared:  -0.004093 
F-statistic: 0.4619 on 1 and 131 DF,  p-value: 0.4979
show code
#threat predicted by physical continuity subscales - building subscale
ggscatter(study4, x='physicalContinuity_buildingsSubscale', y = 'identityThreat', color='condition', position='jitter',add = 'reg.line', alpha=0.3, title='threat predicted by physical continuity; buildings subscale',conf.int = TRUE)

show code
summary(lm(data=study4, identityThreat~physicalContinuity_buildingsSubscale))

Call:
lm(formula = identityThreat ~ physicalContinuity_buildingsSubscale, 
    data = study4)

Residuals:
     Min       1Q   Median       3Q      Max 
-1.70968 -0.45448  0.04831  0.44101  1.96359 

Coefficients:
                                     Estimate Std. Error t value Pr(>|t|)    
(Intercept)                           3.34895    0.36245   9.240 5.82e-16 ***
physicalContinuity_buildingsSubscale  0.02638    0.07577   0.348    0.728    
---
Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

Residual standard error: 0.7 on 131 degrees of freedom
Multiple R-squared:  0.0009247, Adjusted R-squared:  -0.006702 
F-statistic: 0.1212 on 1 and 131 DF,  p-value: 0.7282
show code
#threat predicted by physical continuity subscales - people subscale
ggscatter(study4, x='physicalContinuity_peopleSubscale', y = 'identityThreat', color='condition', position='jitter',add = 'reg.line', alpha=0.3, title='threat predicted by physical continuity; people subscale',conf.int = TRUE)

show code
summary(lm(data=study4, identityThreat~physicalContinuity_peopleSubscale*condition))

Call:
lm(formula = identityThreat ~ physicalContinuity_peopleSubscale * 
    condition, data = study4)

Residuals:
    Min      1Q  Median      3Q     Max 
-1.6718 -0.4365  0.0001  0.4445  2.0079 

Coefficients:
                                                Estimate Std. Error t value
(Intercept)                                      3.21790    0.25591  12.575
physicalContinuity_peopleSubscale                0.09900    0.08376   1.182
conditionWest                                    0.23947    0.38011   0.630
physicalContinuity_peopleSubscale:conditionWest -0.10421    0.11921  -0.874
                                                Pr(>|t|)    
(Intercept)                                       <2e-16 ***
physicalContinuity_peopleSubscale                  0.239    
conditionWest                                      0.530    
physicalContinuity_peopleSubscale:conditionWest    0.384    
---
Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

Residual standard error: 0.7012 on 129 degrees of freedom
Multiple R-squared:  0.01273,   Adjusted R-squared:  -0.01023 
F-statistic: 0.5547 on 3 and 129 DF,  p-value: 0.6459

To do:

  • make new threat scale by combining ingroup regard and threat, e.g. “reading this article made me feel worse about being a UVA student”

  • have ingroup regard on pretest, then have more targeted ingroup regard threat measure as a result of reading the article

  • reconsider using sliders when tabling iPads