# A tibble: 4 × 3
# Groups: Test Identifier [2]
`Test Identifier` GradeGroup student_count
<chr> <chr> <int>
1 MC0-100_2025 Year 1A 1295
2 MC0-100_2025 Year 1B 1089
3 MC0-20_2025 Foundation A 1263
4 MC0-20_2025 Foundation B 1203
student_metrics_long <- student_metrics %>%select(Identifier, `Test Identifier`, Accuracy, RCPM) %>%pivot_longer(cols =c(Accuracy, RCPM),names_to ="Metric",values_to ="Value" )ggplot(student_metrics_long, aes(x =`Test Identifier`, y = Value, fill =`Test Identifier`)) +geom_violin(alpha =0.5, colour =NA) +geom_boxplot(width =0.1, position =position_dodge(width =0.9)) +facet_wrap(~ Metric, scales ="free_y") +labs(title ="Distribution of Accuracy and RCPM by Test",x =NULL,y =NULL,fill ="Test" ) +theme_minimal(base_size =12) +theme(legend.position ="none",axis.text.x =element_text(angle =45, hjust =1) )
Mean and spread test
Welch’s two-sample t-test in case of non-homogeneity of variance, and the two groups are independent (no overlap in students). Levene’s test for spread as distribution is not normal (required for F-test).
No evidence of difference in average accuracy and Levene’s more robust test for variance finds no significant spread difference. Both groups have essentially the same mean and the same variability in accuracy.
Small but statistically significant speed difference (RCPM) and borderline (p≈0.06) variance difference on Levene’s test. i.e. Statistically significant though small difference in mean speed (MC 0–100 > MC 0–20), and any difference in spread is at best marginal.
Code
ggqqplot( student_metrics,x ="Accuracy",color ="Test Identifier",facet.by ="Test Identifier",title ="Q–Q Plot of Accuracy by Test")
Code
ggqqplot( student_metrics,x ="RCPM",color ="Test Identifier",facet.by ="Test Identifier",title ="Q–Q Plot of RCPM by Test")
[[1]]
Welch Two Sample t-test
data: Accuracy by Test Identifier
t = -0.1235, df = 4847.7, p-value = 0.9017
alternative hypothesis: true difference in means between group MC0-100_2025 and group MC0-20_2025 is not equal to 0
95 percent confidence interval:
-0.010627170 0.009367607
sample estimates:
mean in group MC0-100_2025 mean in group MC0-20_2025
0.8272641 0.8278939
[[2]]
Welch Two Sample t-test
data: RCPM by Test Identifier
t = 2.9179, df = 4816.3, p-value = 0.00354
alternative hypothesis: true difference in means between group MC0-100_2025 and group MC0-20_2025 is not equal to 0
95 percent confidence interval:
0.2371036 1.2080688
sample estimates:
mean in group MC0-100_2025 mean in group MC0-20_2025
17.76444 17.04185
[[3]]
F test to compare two variances
data: Accuracy by Test Identifier
F = 0.91889, num df = 2383, denom df = 2465, p-value = 0.03746
alternative hypothesis: true ratio of variances is not equal to 1
95 percent confidence interval:
0.8485680 0.9951034
sample estimates:
ratio of variances
0.9188944
[[4]]
F test to compare two variances
data: RCPM by Test Identifier
F = 1.0995, num df = 2383, denom df = 2465, p-value = 0.01957
alternative hypothesis: true ratio of variances is not equal to 1
95 percent confidence interval:
1.015334 1.190667
sample estimates:
ratio of variances
1.099481
[[5]]
Levene's Test for Homogeneity of Variance (center = median)
Df F value Pr(>F)
group 1 0.2647 0.6069
4848
[[6]]
Levene's Test for Homogeneity of Variance (center = median)
Df F value Pr(>F)
group 1 3.4659 0.06271 .
4848
---
Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1