04.10.2018
“Aesthetics, in the original Greek sense, offers principles for relating sensory attributes (color, shape, sound, etc.) to abstractions.”
library("ggplot2") pie <- ggplot(data = da) pie
pie <- pie + geom_bar(width = 1, position = "fill", color = "black", aes(x = "", fill = factor(Gender))) pie
pie + coord_polar(theta = "y")
pie + coord_polar(theta = "y")+theme_void()
library(plotly) data(diamonds) diamonds <- diamonds[sample(nrow(diamonds), 1000),] gg <- ggplot(data = diamonds)+ geom_point(aes(x = carat, y = price, colour = price), alpha = 0.1) gg
ggplotly(gg)
plot_ly(diamonds, x = ~carat, y = ~price, color = ~carat, size = ~carat)
http://gallery.htmlwidgets.org/