Hello World

Here we are, showing a histogram of some normally distributed random data.

set.seed(2015-03-21)
data <- data.frame(r = rnorm(1000))

library(ggplot2)
ggplot(data, aes(x = r)) + 
    geom_histogram(breaks = pretty(data$r, n = nclass.Sturges(data$r), min.n = 1),
                   fill="green", colour="black")

And this is an update to it!