First, I clean the data – excluding cases that did not have necessary responses on key variable.
I then recode the recommendation scale to a numerical scale.
d$'recommend.scale' <- recode(d$`recommend-scale`, 'Definitely\nwill not recommend'= 1,'Not very probably recommend' = 2, 'Probably not recommend' = 3, 'Might or\nmight not recommend' = 4, 'Probably recommend' = 5, 'Very probably recommend' =6, 'Definitely will recommend' = 7)
I then create a variable for the ex-employee resume condition and the ex-founder resume condition, because the survey is a 2 x 2 study.
d = d %>%
select('recommend.scale', starts_with('resumes_randomization'), 'attention-binary-qs') %>%
mutate(employee_condition = ifelse(is.na(d$'resumes_randomization_DO_male-employee')== FALSE |
is.na(d$'resumes_randomization_DO_female-employee')==FALSE,
'employee', 'founder')) %>%
mutate(gender = ifelse((d$'resumes_randomization_DO_female-employee'==1) | (d$'resumes_randomization_DO_female-founder'==1), 'female', 'male')) %>%
mutate(gender = ifelse(is.na(gender), 'male', 'female'))
I exclude 51 cases that do not pass the attention check.
d$attention.check <- recode(d$`attention-binary-qs`, 'Yes, an ex-founder'= "founder",'No, not an ex-founder' = 'employee')
d = d %>%
filter(attention.check == employee_condition)
Let’s plot this out! The histogram suggests that ex-employees on average seem to receive a higher number of positive recommendations compared to ex-founders. For example, there are greater number of individuals who responded that they would very probably recommend (“6” on the recommend scale) or definitely recommend (“7” on the recommend scale) when given resumes about ex-employees than about ex-founders.
ggplot(d, aes(x = recommend.scale, fill=gender)) +
geom_bar(position = position_dodge(width = 1)) +
facet_grid(~employee_condition)
t.test(d$recommend.scale[d$employee_condition=='founder'],
d$recommend.scale[d$employee_condition=='employee'])
##
## Welch Two Sample t-test
##
## data: d$recommend.scale[d$employee_condition == "founder"] and d$recommend.scale[d$employee_condition == "employee"]
## t = -0.80127, df = 155.59, p-value = 0.4242
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
## -0.4466889 0.1888792
## sample estimates:
## mean of x mean of y
## 5.531646 5.660550
d$female <- ifelse(d$gender=='female', 1,0)
d$founder <- ifelse(d$employee_condition=='founder', 1,0)
model1 <- lm(recommend.scale ~ founder, data = d)
model2 <- lm(recommend.scale ~ founder + female + founder*female, data = d)
stargazer(model1,model2, type = "html", title = "Replication of Kacperczyk & Younkin (2021)")
| Dependent variable: | ||
| recommend.scale | ||
| (1) | (2) | |
| founder | -0.129 | -0.425** |
| (0.158) | (0.215) | |
| female | -0.147 | |
| (0.203) | ||
| founder:female | 0.659** | |
| (0.315) | ||
| Constant | 5.661*** | 5.736*** |
| (0.102) | (0.145) | |
| Observations | 188 | 188 |
| R2 | 0.004 | 0.030 |
| Adjusted R2 | -0.002 | 0.014 |
| Residual Std. Error | 1.068 (df = 186) | 1.059 (df = 184) |
| F Statistic | 0.667 (df = 1; 186) | 1.911 (df = 3; 184) |
| Note: | p<0.1; p<0.05; p<0.01 | |