library(datasets)
library(plotly)
library(reshape2)
data("airquality") ## Load the airquality dataset
airquality$Month = as.factor(airquality$Month) ## Convert Month to factor
ozone_daily = airquality[, c(1, 5, 6)] ## Extract Ozone, Month and Day columns
## Convert Long format to Wide for input to Heatmap
ozone_daily = dcast(ozone_daily, Day ~ Month, value.var = "Ozone")
ozone_daily = as.matrix(ozone_daily[, -1]) ## Convert to Matrix
colnames(ozone_daily) = c("May", "June", "July", "August", "September")
## Plotly command
plot_ly(z = ozone_daily, colorscale = "Hot", x = colnames(ozone_daily),
type = "heatmap", colorbar = list(title = "Ozone Levels (parts per billion)")) %>%
layout(title = "Daily Ozone Levels in New York, May to September 1973",
xaxis = list(title = "Month"), yaxis = list(title = "Day"))