PDF of the Lévy alpha-stable distribution for various \(\beta\). A reproduction of the figure on Wikipedia.

library(purrr)
library(ggplot2)
x = seq(-4, 4, by = 0.01)
beta = seq(0, 1, by = 0.25) %>% setNames(., .)

data = map_dfr(
    beta, .id = 'beta',
    ~ list(x = x, y = stabledist::dstable(x, 0.5, .x, 1, pm = 1)),
)
pretty_label = function (beta) {
    bquote(beta == .(sprintf('%0.02f', as.numeric(beta))))
}

ggplot(data) +
    aes(x, y, color = beta) +
    geom_path() +
    scale_color_discrete('', labels = function (b) map(b, pretty_label))