library(pacman); p_load(ggplot2, DT)
data$SES <- factor(data$SES, levels = c("Below $20k", "$20k - $40k", "$40k - $60k", "$60k - $80k", "$80k - $100k", "$100k - $120k", "$120k - $140k", "$140k - $160k", "$160k - $200k", "Above $200k"))
datatable(data, extensions = c("Buttons", "FixedColumns"), options = list(dom = 'Bfrtip', buttons = c('copy', 'csv', 'print'), scrollX = T, fixedColumns = list(leftColumns = 3)))
College Board data from 2011 is often cited in support of the claim of limited relevance of income to racial/ethnic gaps in SAT scores in the U.S. It would be much clearer if it were graphed differently. The original plot can be found here: https://resources.corwin.com/sites/default/files/singleton_2e_figure_3.2.pdf. I have plotted it again below, in a way that I believe facilitates comparisons.
ggplot(data, aes(x = SES, y = Score, group = Race, color = Race)) +
geom_line(size = 2) +
geom_point(size = 2) +
xlab("") + ylab("Three-Part SAT Composite Score") +
ggtitle("2011 Average SAT Scores by Parental Income and Race/Ethnicity") +
scale_color_brewer(palette = "Paired") + theme_bw() +
theme(plot.title = element_text(hjust = .5), legend.position = c(.075, .87), legend.background = element_blank())
And again without “All” and the ambiguous category “Other Ethnic”.
ggplot(data, aes(x = SES, y = Score, group = Race, color = Race)) +
geom_line(size = 2) +
geom_point(size = 2) +
xlab("") + ylab("Three-Part SAT Composite Score") +
ggtitle("2011 Average SAT Scores by Parental Income and Race/Ethnicity (Pruned)") +
scale_color_brewer(palette = "Paired") + theme_bw() +
theme(plot.title = element_text(hjust = .5), legend.position = c(.075, .9), legend.background = element_blank())
I only wish I had CIs.
First, 1995. This was leaked by La Griffe Du Lion in 2001, here: http://www.lagriffedulion.f2s.com/testing.htm
datatable(data95, extensions = c("Buttons", "FixedColumns"), options = list(dom = 'Bfrtip', buttons = c('copy', 'csv', 'print'), scrollX = T, fixedColumns = list(leftColumns = 3)))
ggplot(data95, aes(x = SES, y = Total, group = Race, color = Race)) +
geom_line(size = 2) +
geom_point(size = 2) +
xlab("") + ylab("Two-Part SAT Composite Score") +
ggtitle("1995 Average SAT Scores by Parental Income and Race/Ethnicity") +
scale_color_brewer(palette = "Paired") + theme_bw() +
theme(plot.title = element_text(hjust = .5), legend.position = c(.075, .9), legend.background = element_blank())
Next, 2003. This was published in Dixon-Roman, Everson & Mcardle (2013).
datatable(data03, extensions = c("Buttons", "FixedColumns"), options = list(dom = 'Bfrtip', buttons = c('copy', 'csv', 'print'), scrollX = T, fixedColumns = list(leftColumns = 3)))
ggplot(data03, aes(x = SES, y = Total, group = Race, color = Race)) +
geom_line(size = 2) +
geom_point(size = 2) +
xlab("") + ylab("Two-Part SAT Composite Score") +
ggtitle("2003 Average SAT Scores by Parental Income and Race/Ethnicity") +
scale_color_brewer(palette = "Paired") + theme_bw() +
theme(plot.title = element_text(hjust = .5), legend.position = c(.075, .9), legend.background = element_blank())
Finally, 2008. This was leaked by the Journal of Blacks in Higher Education, here: https://www.jbhe.com/latest/news/1-22-09/satgap.html.
datatable(data08, extensions = c("Buttons", "FixedColumns"), options = list(dom = 'Bfrtip', buttons = c('copy', 'csv', 'print'), scrollX = T, fixedColumns = list(leftColumns = 3)))
ggplot(data08, aes(x = SES, y = Score, group = Race, color = Race)) +
geom_line(size = 2) +
geom_point(size = 2) +
xlab("") + ylab("Two-Part SAT Composite Score") +
ggtitle("2008 Average SAT Scores by Parental Income and Race/Ethnicity") +
scale_color_brewer(palette = "Paired") + theme_bw() +
theme(plot.title = element_text(hjust = .5), legend.position = c(.075, .9), legend.background = element_blank())
2011: A) https://web.archive.org/web/20210222024330/https://resources.corwin.com/sites/default/files/singleton_2e_figure_3.2.pdf, B) https://archive.ph/DZkRA
1995: A) https://web.archive.org/web/20010121143300/http://www.lagriffedulion.f2s.com/testing.htm, B) https://archive.ph/pfYqS
1997: Mentioned at this link https://theunsilencedscience.blogspot.com/2013/10/black-suits-gowns-skin-sat-scores-by.html, A) https://web.archive.org/web/20131211024605/https://theunsilencedscience.blogspot.com/2013/10/black-suits-gowns-skin-sat-scores-by.html, B) https://archive.ph/UYkU8
2003: Dixon-Roman, E. J., Everson, H. T., & Mcardle, J. J. (2013). Race, Poverty and SAT Scores: Modeling the Influences of Family Income on Black and White High School Students’ SAT Performance. Teachers College Record, 115(4), 1–33. https://doi.org/10.1177/016146811311500406
2008: A) https://web.archive.org/web/20141020180526/https://www.jbhe.com/latest/news/1-22-09/satgap.html, B) https://archive.ph/n2iWk
Additional discussion: https://randomcriticalanalysis.com/2015/11/25/no-the-sat-doesnt-just-measure-income/, A) https://web.archive.org/web/20190429014911/https://randomcriticalanalysis.com/2015/11/25/no-the-sat-doesnt-just-measure-income/, B) https://archive.ph/gCZFA
Additional 2: https://randomcriticalanalysis.com/2015/04/19/understanding-the-academic-achievement-gaps/, A) https://web.archive.org/web/20200408065421/https://randomcriticalanalysis.com/2015/04/19/understanding-the-academic-achievement-gaps/, B) https://archive.ph/rQP5m
Additional 3: A) https://web.archive.org/web/20161207184435/http://thealternativehypothesis.org/index.php/2016/12/04/blacks-and-whites-with-equal-educational-attainment-differ-in-cognitive-ability/, B) https://archive.ph/LoEac
Additional 4: A) https://web.archive.org/web/20160502144851/http://thealternativehypothesis.org/index.php/2016/04/15/race-iq-and-poverty/, B) https://archive.ph/tfX3Z