library(plotly)
## Loading required package: ggplot2
## 
## Attaching package: 'plotly'
## The following object is masked from 'package:ggplot2':
## 
##     last_plot
## The following object is masked from 'package:stats':
## 
##     filter
## The following object is masked from 'package:graphics':
## 
##     layout
library(dplyr)
## 
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
## 
##     filter, lag
## The following objects are masked from 'package:base':
## 
##     intersect, setdiff, setequal, union
load(".RData")
p <- ggplot(taxi_SD, aes(eyeballs, rides,col=weekday)) + geom_point() + geom_smooth(method = lm,se=F)
ggplotly(p)
## We recommend that you use the dev version of ggplot2 with `ggplotly()`
## Install it with: `devtools::install_github('hadley/ggplot2')`
p2 <- ggplot(taxi_SD, aes(drivers.online, rides,col=weekday)) + geom_point() + geom_smooth(method = lm,se=F)
ggplotly(p2)
## We recommend that you use the dev version of ggplot2 with `ggplotly()`
## Install it with: `devtools::install_github('hadley/ggplot2')`
p3 <- ggplot(taxi_SD, aes(eyeballs,drivers.online,col=weekday)) + geom_point() + geom_smooth(method = lm,se=F)
ggplotly(p3)
## We recommend that you use the dev version of ggplot2 with `ggplotly()`
## Install it with: `devtools::install_github('hadley/ggplot2')`
pp <- ggplot(taxi_SD, aes(x=weekday, y=rides, color=weekday)) + geom_boxplot() +geom_jitter()
ggplotly(pp)
## We recommend that you use the dev version of ggplot2 with `ggplotly()`
## Install it with: `devtools::install_github('hadley/ggplot2')`
pp2 <- ggplot(taxi_SD, aes(x=weekday, y=eyeballs, color=weekday)) + geom_boxplot() +geom_jitter()
ggplotly(pp2)
## We recommend that you use the dev version of ggplot2 with `ggplotly()`
## Install it with: `devtools::install_github('hadley/ggplot2')`
pp3 <- ggplot(taxi_SD, aes(x=weekday, y=drivers.online, color=weekday)) + geom_boxplot() +geom_jitter()
ggplotly(pp3)
## We recommend that you use the dev version of ggplot2 with `ggplotly()`
## Install it with: `devtools::install_github('hadley/ggplot2')`
ppp <- ggplot(taxi_SD, aes(x=rides,color=weekday)) + geom_density()
ggplotly(ppp)
## We recommend that you use the dev version of ggplot2 with `ggplotly()`
## Install it with: `devtools::install_github('hadley/ggplot2')`
ppp2 <- ggplot(taxi_SD, aes(x=eyeballs, color=weekday)) + geom_density()
ggplotly(ppp2)
## We recommend that you use the dev version of ggplot2 with `ggplotly()`
## Install it with: `devtools::install_github('hadley/ggplot2')`
ppp3 <- ggplot(taxi_SD, aes(x=drivers.online, color=weekday)) + geom_density()
ggplotly(ppp3)
## We recommend that you use the dev version of ggplot2 with `ggplotly()`
## Install it with: `devtools::install_github('hadley/ggplot2')`