Sample vs population
As an implicit comparison, we can compare each participant’s sample
representation and population inference to each other.

## Anova Table (Type II tests)
##
## Response: response
## Sum Sq Df F value Pr(>F)
## boarding 4.211 1 21.9114 0.000003992 ***
## dv 0.516 1 2.6841 0.1022
## boarding:dv 0.379 1 1.9720 0.1611
## Residuals 72.253 376
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## Anova Table (Type II tests)
##
## Response: response
## Sum Sq Df F value Pr(>F)
## boarding 1.021 1 4.7725 0.02958 *
## dv 0.475 1 2.2188 0.13723
## boarding:dv 0.415 1 1.9385 0.16471
## Residuals 75.311 352
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
There is no interaction between the boarding condition
(skewed vs not skewed, or skewed vs not skewed control) and the DV
(sample vs pop), suggesting participants in the skewed
condition did not generalize from sample to population differently than
participants in the not skewed conditions.
##
## Paired t-test
##
## data: data %>% filter(boarding == "not skewed") %>% pull(dv_sample) and data %>% filter(boarding == "not skewed") %>% pull(dv_pop)
## t = -0.25693, df = 94, p-value = 0.7978
## alternative hypothesis: true mean difference is not equal to 0
## 95 percent confidence interval:
## -0.09187349 0.07082086
## sample estimates:
## mean difference
## -0.01052632
##
## Paired t-test
##
## data: data %>% filter(boarding == "not skewed control") %>% pull(dv_sample) and data %>% filter(boarding == "not skewed control") %>% pull(dv_pop)
## t = 0, df = 82, p-value = 1
## alternative hypothesis: true mean difference is not equal to 0
## 95 percent confidence interval:
## -0.09022406 0.09022406
## sample estimates:
## mean difference
## 0
In both of the not skewed conditions, participants did not
give different responses to sample and population questions (not skewed:
t(94) = -0.26, p = 0.798, not skewed control:
t(82) = 0, p = 1). This is expected since in the not
skewed conditions, the sample and the population are identical.
##
## Paired t-test
##
## data: data %>% filter(boarding == "skewed") %>% pull(dv_sample) and data %>% filter(boarding == "skewed") %>% pull(dv_pop)
## t = -1.7402, df = 94, p-value = 0.0851
## alternative hypothesis: true mean difference is not equal to 0
## 95 percent confidence interval:
## -0.29297760 0.01929338
## sample estimates:
## mean difference
## -0.1368421
In the skewed condition, participants gave marginally
different responses to the population versus sample questions
(t(94) = -1.74, p = 0.085). This suggests that
participants may have only marginally adjusted their generalization from
the sample based on the sampling process they observed.
Order effects
Participants saw the two DVs in counterbalanced order:
pop_sample
= population DV first, then sample DV
sample_pop
= sample DV first, then population DV
There was a marginal order effect on the sample question, such that
participants made marginally taller inferences about the sample if they
were asked about the sample after the population
(pop_sample
) versus before the population
(sample_pop
).
There was also a marginal condition by order interaction on the
population question, such that participants made marginally taller
inferences about the sample if they were asked about the sample after
the population (pop_sample
) versus before the population
(sample_pop
).
In summary: * sample question then population question –> no
differences between any conditions on sample question. skewed > not
skewed control, not skewed on population question. * population question
then sample question –> no differences between any conditions on
population question. skewed, not skewed control > not skewed on
sample question.
There were no order effects on the explicit comparison question.
Sample representation order effects

The condition effect on the sample representation was consistent,
regardless of DV order, as evidenced by a main effect of boarding
condition and no effect of DV order or interaction between the two.
## Anova Table (Type II tests)
##
## Response: dv_sample
## Sum Sq Df F value Pr(>F)
## boarding 1.1406 2 5.1811 0.006201 **
## cb_dvorder 0.2145 1 1.9486 0.163896
## boarding:cb_dvorder 0.3558 2 1.6163 0.200561
## Residuals 29.3906 267
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
If you run pairwise comparisons anyway: when the sample question was
asked second (after the population question), participants made taller
inferences about the sample in the skewed condition and in the not
skewed control conditions compared to the not skewed condition. No
condition differences between sample representations were found when the
sample question was asked first (before the population question).
## cb_dvorder = pop_sample:
## contrast estimate SE df t.ratio p.value
## not skewed - not skewed control -0.1957 0.0732 267 -2.674 0.0119
## not skewed - skewed -0.2153 0.0654 267 -3.293 0.0034
## not skewed control - skewed -0.0196 0.0735 267 -0.267 0.7897
##
## cb_dvorder = sample_pop:
## contrast estimate SE df t.ratio p.value
## not skewed - not skewed control -0.0380 0.0693 267 -0.548 0.6670
## not skewed - skewed -0.0677 0.0711 267 -0.951 0.6670
## not skewed control - skewed -0.0297 0.0689 267 -0.431 0.6670
##
## P value adjustment: fdr method for 3 tests
When people were asked about the height of the sample before being
asked about the population, participants all three conditions responded
no differently from the true mean (6).
##
## One Sample t-test
##
## data: data %>% filter(cb_dvorder == "sample_pop" & boarding == "not skewed") %>% select(dv_sample)
## t = 1, df = 42, p-value = 0.323
## alternative hypothesis: true mean is not equal to 6
## 95 percent confidence interval:
## 5.976324 6.070188
## sample estimates:
## mean of x
## 6.023256
##
## One Sample t-test
##
## data: data %>% filter(cb_dvorder == "sample_pop" & boarding == "not skewed control") %>% select(dv_sample)
## t = 1.7693, df = 48, p-value = 0.0832
## alternative hypothesis: true mean is not equal to 6
## 95 percent confidence interval:
## 5.991649 6.130800
## sample estimates:
## mean of x
## 6.061224
##
## One Sample t-test
##
## data: data %>% filter(cb_dvorder == "sample_pop" & boarding == "skewed") %>% select(dv_sample)
## t = 1.6656, df = 43, p-value = 0.1031
## alternative hypothesis: true mean is not equal to 6
## 95 percent confidence interval:
## 5.980837 6.200982
## sample estimates:
## mean of x
## 6.090909
When people were asked about the height of the sample after being
asked about the population, participants in the not skewed condition
responded no differently from the true mean (6), but participants in the
not skewed control condition responded marginally higher than the true
mean, and participants in the skewed condition responded significantly
higher than the true mean.
##
## One Sample t-test
##
## data: data %>% filter(cb_dvorder == "pop_sample" & boarding == "not skewed") %>% select(dv_sample)
## t = -0.57361, df = 51, p-value = 0.5688
## alternative hypothesis: true mean is not equal to 6
## 95 percent confidence interval:
## 5.913464 6.048075
## sample estimates:
## mean of x
## 5.980769
##
## One Sample t-test
##
## data: data %>% filter(cb_dvorder == "pop_sample" & boarding == "not skewed control") %>% select(dv_sample)
## t = 1.9768, df = 33, p-value = 0.05647
## alternative hypothesis: true mean is not equal to 6
## 95 percent confidence interval:
## 5.994851 6.358090
## sample estimates:
## mean of x
## 6.176471
##
## One Sample t-test
##
## data: data %>% filter(cb_dvorder == "pop_sample" & boarding == "skewed") %>% select(dv_sample)
## t = 3.4922, df = 50, p-value = 0.001012
## alternative hypothesis: true mean is not equal to 6
## 95 percent confidence interval:
## 6.083301 6.308856
## sample estimates:
## mean of x
## 6.196078
Population inference order effects
There was a marginal interaction between condition and DV order on
population representations, such that when population was asked first
(before the sample question), participants in the three conditions did
not give different responses from each other, but when population was
asked second (after the sample question), participants in the skewed
condition gave taller responses than those in the not skewed control
condition, which in turn gave taller responses than those in the not
skewed condition.
##
## Call:
## lm(formula = dv_pop ~ boarding * cb_dvorder, data = data)
##
## Residuals:
## Min 1Q Median 3Q Max
## -2.17647 -0.17647 -0.08163 0.00000 1.98077
##
## Coefficients:
## Estimate Std. Error t value
## (Intercept) 6.01923 0.06627 90.834
## boardingnot skewed control 0.12783 0.10539 1.213
## boardingskewed 0.15724 0.09417 1.670
## cb_dvordersample_pop -0.01923 0.09850 -0.195
## boardingnot skewed control:cb_dvordersample_pop -0.04620 0.14518 -0.318
## boardingskewed:cb_dvordersample_pop 0.25185 0.13917 1.810
## Pr(>|t|)
## (Intercept) <0.0000000000000002 ***
## boardingnot skewed control 0.2262
## boardingskewed 0.0962 .
## cb_dvordersample_pop 0.8454
## boardingnot skewed control:cb_dvordersample_pop 0.7506
## boardingskewed:cb_dvordersample_pop 0.0715 .
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
##
## Residual standard error: 0.4779 on 267 degrees of freedom
## Multiple R-squared: 0.07605, Adjusted R-squared: 0.05875
## F-statistic: 4.395 on 5 and 267 DF, p-value: 0.0007307
## cb_dvorder = pop_sample:
## contrast estimate SE df t.ratio p.value
## not skewed - not skewed control -0.1278 0.1054 267 -1.213 0.3394
## not skewed - skewed -0.1572 0.0942 267 -1.670 0.2885
## not skewed control - skewed -0.0294 0.1058 267 -0.278 0.7812
##
## cb_dvorder = sample_pop:
## contrast estimate SE df t.ratio p.value
## not skewed - not skewed control -0.0816 0.0999 267 -0.818 0.4143
## not skewed - skewed -0.4091 0.1025 267 -3.992 0.0003
## not skewed control - skewed -0.3275 0.0992 267 -3.299 0.0017
##
## P value adjustment: fdr method for 3 tests
Explicit comparison order effects
There are no order effects on the explicit comparison question.

## # weights: 21 (12 variable)
## initial value 299.921155
## iter 10 value 166.439452
## iter 20 value 165.300655
## final value 165.300653
## converged
## Call:
## multinom(formula = dv_comp ~ boarding * cb_dvorder, data = data)
##
## Coefficients:
## (Intercept) boardingnot skewed control boardingskewed
## the same 2.72994855875 -0.02187805960 -1.631314
## taller -0.00006176681 0.00008991661 0.865074
## cb_dvordersample_pop boardingnot skewed control:cb_dvordersample_pop
## the same -0.7284555 0.4182594
## taller -1.6095077 0.2231417
## boardingskewed:cb_dvordersample_pop
## the same 2.072139
## taller 2.995761
##
## Std. Errors:
## (Intercept) boardingnot skewed control boardingskewed
## the same 0.5958587 0.9425448 0.7222991
## taller 0.8164786 1.2909852 0.9188422
## cb_dvordersample_pop boardingnot skewed control:cb_dvordersample_pop
## the same 0.7629392 1.178194
## taller 1.3663011 2.028991
## boardingskewed:cb_dvordersample_pop
## the same 1.136754
## taller 1.611531
##
## Residual Deviance: 330.6013
## AIC: 354.6013
## Analysis of Deviance Table (Type II tests)
##
## Response: dv_comp
## LR Chisq Df Pr(>Chisq)
## boarding 60.930 4 0.00000000000185 ***
## cb_dvorder 0.135 2 0.9349
## boarding:cb_dvorder 5.859 4 0.2099
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1