IAT: absolute d of 0.15, 0.35, and 0.65 are considered small, medium, and large level of bias for individual scores. Positive d means bias towards arts / against Math.
iat = read_csv(here::here(params$arquivo_dados), col_types = "cccdc")
iat = iat %>%
mutate(sex = factor(sex, levels = c("m", "f"), ordered = TRUE))
glimpse(iat)
## Rows: 179
## Columns: 5
## $ session_id <chr> "2421401", "2421408", "2421415", "2421419", "2421535", "24~
## $ referrer <chr> "tamu", "tamu", "tamu", "tamu", "tamu", "tamu", "tamu", "t~
## $ sex <ord> f, m, f, f, f, f, f, f, f, f, m, f, f, m, m, f, m, m, f, f~
## $ d_art <dbl> 0.66404173, 0.28330852, 0.91158827, 0.40696666, 0.14532187~
## $ iat_exclude <chr> "Include", "Include", "Include", "Include", "Include", "In~
iat %>%
ggplot(aes(x = d_art, fill = sex, color = sex)) +
geom_histogram(binwidth = .2, alpha = .4, boundary = 0) +
geom_rug() +
facet_grid(sex ~ ., scales = "free_y") +
labs(title = "Distribuição de d_art") +
theme(legend.position = "None")
iat %>%
ggplot(aes(x = sex, y = d_art)) +
geom_quasirandom(width = .1)
iat %>%
ggplot(aes(x = sex, y = d_art)) +
geom_quasirandom(width = .1) +
stat_summary(geom = "point", fun = "mean", color = "red", size = 5) +
labs(title = "Distribuição e média (ponto vermelho) de d_art na amostra")
agrupado = iat %>%
group_by(sex) %>%
summarise(media = mean(d_art),
.groups = "drop")
agrupado
## # A tibble: 2 x 2
## sex media
## <ord> <dbl>
## 1 m 0.236
## 2 f 0.420
m = agrupado %>% filter(sex == "m") %>% pull(media)
f = agrupado %>% filter(sex == "f") %>% pull(media)
m - f
## [1] -0.1841804
library(boot)
theta <- function(d, i) {
agrupado = d %>%
slice(i) %>%
group_by(sex) %>%
summarise(media = mean(d_art), .groups = "drop")
m = agrupado %>% filter(sex == "m") %>% pull(media)
f = agrupado %>% filter(sex == "f") %>% pull(media)
m - f
}
booted <- boot(data = iat,
statistic = theta,
R = 2000)
ci = tidy(booted,
conf.level = .95,
conf.method = "bca",
conf.int = TRUE)
glimpse(ci)
## Rows: 1
## Columns: 5
## $ statistic <dbl> -0.1841804
## $ bias <dbl> -0.0003428784
## $ std.error <dbl> 0.07059307
## $ conf.low <dbl> -0.3268166
## $ conf.high <dbl> -0.04364264
ci %>%
ggplot(aes(
x = "",
y = statistic,
ymin = conf.low,
ymax = conf.high
)) +
geom_pointrange() +
geom_point(size = 3) +
scale_y_continuous(limits = c(-1.5, 1.5)) +
labs(x = "Diferença das médias",
y = "IAT homens - mulheres")
p1 = iat %>%
ggplot(aes(x = sex, y = d_art)) +
geom_quasirandom(width = .1, alpha = .7) +
stat_summary(geom = "point", fun = "mean", color = "red", size = 5) +
stat_summary(geom = "point", fun = "sd", color = "orange", size = 5)
p2 = ci %>%
ggplot(aes(
x = "",
y = statistic,
ymin = conf.low,
ymax = conf.high
)) +
geom_pointrange() +
geom_point(size = 3) +
ylim(-1, 1) +
labs(x = "Diferença",
y = "IAT homens - mulheres")
grid.arrange(p1, p2, ncol = 2)
# Desvio padrão todos
iat %>%
summarise(sd = sd(d_art))
## # A tibble: 1 x 1
## sd
## <dbl>
## 1 0.467
# Média todos
iat %>%
summarise(mean = mean(d_art))
## # A tibble: 1 x 1
## mean
## <dbl>
## 1 0.361
# Desvio padrão homens
iat %>%
filter(sex == "m") %>%
summarise(sd = sd(d_art))
## # A tibble: 1 x 1
## sd
## <dbl>
## 1 0.452
# Média homens
iat %>%
filter(sex == "m") %>%
summarise(mean = mean(d_art))
## # A tibble: 1 x 1
## mean
## <dbl>
## 1 0.236
# Desvio padrão mulheres
iat %>%
filter(sex == "f") %>%
summarise(sd = sd(d_art))
## # A tibble: 1 x 1
## sd
## <dbl>
## 1 0.465
# Média mulheres
iat %>%
filter(sex == "f") %>%
summarise(mean = mean(d_art))
## # A tibble: 1 x 1
## mean
## <dbl>
## 1 0.420
Em média, as mulheres que participaram do experimento tiveram uma associação implícita (medida pelo IAT) com a matemática negativa e média (média 0.42, desv. padrão 0.465, N = 121). Homens tiveram uma associação negativa e fraca com a matemática, portanto menor que a das mulheres (média 0.236, desv. padrão 0.452, N = 58). Houve portanto uma pequena diferença entre homens e mulheres (diferença das médias -0.184, 95% CI [-0.32, -0.05]). Os dados de nosso experimento portanto apontam que mulheres têm uma associação negativa mais forte, essa diferença é pequena e provavelmente está entre -0.32 e -0.05 ponto na escala IAT, o suficiente para diferenciar uma associação fraca de uma média contra a matemática.
Exemplos de possíveis conclusões para completar