I saw someone Tweet about a T-shirt with Anscombe’s Quartet plotted using a minimal design. I can’t remember where I saw it, but here’s how I recreated it. My Tmisc package includes a tidy version of the data in the quartet object.

library(Tmisc)
library(ggplot2)

ggplot(quartet, aes(x, y)) + 
  geom_point(size=5) + facet_wrap(~set) +
  geom_smooth(method="lm", se=F, col=1, lwd=1.5, fullrange=F) + 
  theme(axis.line=element_blank(),
  axis.text.x=element_blank(),
  axis.text.y=element_blank(),
  axis.ticks=element_blank(),
  axis.title.x=element_blank(),
  axis.title.y=element_blank(),
  legend.position="none",
  panel.background=element_blank(),
  panel.border=element_blank(),
  panel.grid.major=element_blank(),
  panel.grid.minor=element_blank(),
  plot.background=element_blank(),
  strip.text=element_blank(),
  strip.background=element_blank(),
  panel.margin = unit(5, "lines"))