library(ISLR) ; data(Auto)
rCharts
and ShinyApp's interactive graphing capabilitesggplot(auto, aes(Year, Weight, color = Origin, group = Origin)) +
geom_point() + geom_smooth(method = lm, se = FALSE, lwd = 1.25) +
ggtitle("Sample App Chart 2") +
theme(plot.title = element_text(size=20,lineheight=.8,
vjust=2,family="Calibri"))