Plotly for ggplot2 is now entirely open source, free, and self-hosted.Plotly graphs are interactive. Click on the legend entries to toggle traces, click and drag on the canvas to zoom, shift and click to pan.
library(plotly)
dsamp = diamonds[sample(nrow(diamonds), 1000),]
q = qplot(carat, price, data=dsamp, colour=clarity)
ggplotly()
set.seed(100)
d <- diamonds[sample(nrow(diamonds), 1000), ]
p <- ggplot(data = d, aes(x = carat, y = price)) +
geom_point(aes(text = paste("Clarity:", clarity)), size = 1.5) +
geom_smooth(aes(colour = cut, fill = cut),lwd=0.1) + facet_wrap(~ cut)
(gg <- ggplotly(p))