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: 81
## Columns: 5
## $ session_id <chr> "2443384", "2443392", "2443401", "2443436", "2443445", "24~
## $ referrer <chr> "uva", "uva", "uva", "uva", "uva", "uva", "uva", "uva", "u~
## $ sex <ord> f, m, f, f, m, f, m, f, f, f, m, m, f, f, m, f, f, f, f, f~
## $ d_art <dbl> 0.96727471, 0.36139986, 0.49682691, 0.70144695, 0.92737860~
## $ 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), desvio=sd(d_art), n=n(),
.groups = "drop")
agrupado
## # A tibble: 2 x 4
## sex media desvio n
## <ord> <dbl> <dbl> <int>
## 1 m 0.0992 0.522 24
## 2 f 0.623 0.432 57
m = agrupado %>% filter(sex == "m") %>% pull(media)
f = agrupado %>% filter(sex == "f") %>% pull(media)
m - f
## [1] -0.5241867
set.seed(444)
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.5241867
## $ bias <dbl> 0.002491744
## $ std.error <dbl> 0.1188724
## $ conf.low <dbl> -0.748242
## $ conf.high <dbl> -0.2813876
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)
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)
Em média, as mulheres tendem a ter mais aversão a matemática (média(IAT) = 0,62..) do que os homens (média(IAT) = 0,09..). Ou seja, na amostra, mulheres tendem a preferir mais artes quando comparadas aos homens. De acordo com CI [-0.748242, -0.2813876], utilizando uma confiança de 95%, podemos afirmar que há uma diferença entre os sexos, sendo ela média/moderadamente forte com uma diferença que, provavelmente em valores absolutos, está entre 0.2 e 0.78 ponto na escala IAT. Em resumo, há uma probabilidade alta de que mulheres tendem a ter aversão a matemática, deixando essa diferença numericamente negativa.