Reproducible Pitch

Martin Skarzynski
January 12, 2017

Introduction

For the final project of the Coursera course Developing Data Products (DDP) course, I

  • Generated a tidy version of a publicly available dataset
  • Developed and deployed a web app for analyzing the tidy dataset
  • Created and published this presentation using R presenter

Source Files:

  • The dataset is available for download here.
  • The web app is deployed here.
  • To access the source code for data cleaning script, the web app and this presentation, please visit my DDP GitHub repo.

Example Output Code

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")

User Input Sidebar and Example output

alt text

Conclusions

  • LedgEx is a web app designed for mining financial transaction data!

  • Its straightforward user interface makes interacting with the data a breeze.

  • Forget about poring over numbers in Excel…

  • Use LedgEx and get business insights from the most up-to-date data through your internet browser!