Here’s space.

Let’s make space in R.
library(ggplot2)
n_stars <- 30000
stars <- data.frame(x=runif(n_stars),
y=runif(n_stars),
size=rexp(n_stars))
no_theme <- function() {
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.border=element_blank(),
panel.grid.major=element_blank(),
panel.grid.minor=element_blank())
}
ggplot(stars) +
geom_point(aes(x, y, size=size), color='white') +
scale_size_continuous(range=c(0,1)) +
theme(panel.background = element_rect(fill = 'black')) +
scale_x_continuous(expand = c(0, 0)) +
scale_y_continuous(expand = c(0, 0)) +
no_theme()

Fun!