Martin Skarzynski
January 12, 2017
For the final project of the Coursera course Developing Data Products (DDP) course, I
Source Files:
library(plotly)
library(lubridate)
library(webshot)
datFinal<-read.csv("datFinal.csv", header = TRUE)
datFinal<-datFinal[,-1]
c1k<-datFinal[which(datFinal$Credit > 1000),]
cmon<-c1k[which(month(c1k$Date) == 6),]
p<- plot_ly(cmon, labels = ~Account, values = ~cmon$Credit, type = 'pie') %>%
layout(title = 'Credits',
xaxis = list(showgrid = FALSE, zeroline = FALSE, showticklabels = FALSE),
yaxis = list(showgrid = FALSE, zeroline = FALSE, showticklabels = FALSE)
)
htmlwidgets::saveWidget(as.widget(p), file = "demo.html")