googleVis on shiny

Lancaster University, 21 May 2013

Markus Gesmann
Maintainer of the googleVis and ChainLadder packages

Download

Disclaimer

  1. I am an autodidact
  2. What I present here works for me
  3. Read and follow the official shiny tutorial for the truth
  4. Sometimes you have re-load this presentation for the charts to appear

Introduction of shiny

  • R Package shiny from RStudio supplies:
    • interactive web application / dynamic HTML-Pages with plain R
    • GUI for own needs
    • Website as server

What makes shiny special ?

  • Very Simple: Ready to Use Components (widgets)
  • event-driven (reactive programming): input <-> output
  • communication bidirectional with web sockets (HTTP)
  • JavaScript with JQuery (HTML)
  • CSS with bootstrap

Getting started: Setup

  1. R> install.packages("shiny") from CRAN
  2. Create directory HelloShiny
  3. Edit global.r
  4. Edit ui.r
  5. Edit server.r
  6. R> shiny::runApp("HelloShiny")

Getting started: global.R

This file contains global variables, libraries etc. [optional]

## E.g.
library(googleVis)
The_Answer <- 42

Getting started: server.R

The Core Component with functionality for input and output as plots, tables and plain text.

shinyServer(function(input, output) {
       output$distPlot <- renderPlot({
         dist <- rnorm(input$obs)
         hist(dist)
         })
})

Getting started: ui.R

This file creates the structure of HTML

shinyUI(pageWithSidebar(
   headerPanel("Example Hello Shiny"),
   sidebarPanel(
      sliderInput("obs",  "", 0, 1000, 500)
   ),
   mainPanel(
      plotOutput("distPlot")
   )
))

Getting strated: runApp

R> shiny::runApp('HelloShiny')

Select data for a scatter chart

Example 1: server.R

# Contributed by Joe Cheng, February 2013  
# Requires googleVis version 0.4 and shiny 0.4 or greater
library(googleVis)

shinyServer(function(input, output) {
  datasetInput <- reactive({
    switch(input$dataset,
           "rock" = rock,
           "pressure" = pressure,
           "cars" = cars)
  })  
  output$view <- renderGvis({ # instead of renderPlot
    gvisScatterChart(datasetInput(), options=list(width=400, height=400))
  })
})

Example 1: ui.R

shinyUI(pageWithSidebar(
  headerPanel("Example 1: scatter chart"),
  sidebarPanel(
    selectInput("dataset", "Choose a dataset:", 
                choices = c("rock", "pressure", "cars"))
  ),
  mainPanel(
    htmlOutput("view") ## not plotOut!
  )
))

Interactive table

Example 2: server.R

# Diego de Casillo, February 2013
library(datasets)
library(googleVis)
shinyServer(function(input, output) {
  myOptions <- reactive({
    list(
      page=ifelse(input$pageable==TRUE,'enable','disable'),
      pageSize=input$pagesize,
      height=400
    )
  })
  output$myTable <- renderGvis({
    gvisTable(Population[,1:5],options=myOptions())         
  })
})

Example 2: ui.R

shinyUI(pageWithSidebar(
  headerPanel("Example 2: pageable table"),
  sidebarPanel(
    checkboxInput(inputId = "pageable", label = "Pageable"),
    conditionalPanel("input.pageable==true",
                     numericInput(inputId = "pagesize",
                                  label = "Countries per page",10))    
  ),
  mainPanel(
    htmlOutput("myTable")
  )
))

Animated geo chart

Example 3: loaddata.R

## Markus Gesmann, February 2013
## Prepare data to be displayed
## Load presidential election data by state from 1932 - 2012
library(RCurl)
url <- "https://raw.githubusercontent.com/mages/diesunddas/master/Data/US%20Presidential%20Elections.csv"
dat <- getURL(url, ssl.verifypeer=0L, followlocation=1L)
dat <- read.csv(text=dat)
## Add min and max values to the data
datminmax = data.frame(state=rep(c("Min", "Max"),21), 
                       demVote=rep(c(0, 100),21),
                       year=sort(rep(seq(1932,2012,4),2)))
dat <- rbind(dat[,1:3], datminmax)
require(googleVis)

Example 3: server.R

source('loaddata.R', local=TRUE)
shinyServer(function(input, output) {
  myYear <- reactive({
    input$Year
  })
  output$year <- renderText({
    paste("Democratic share of the presidential vote in", myYear())
  })
  output$gvis <- renderGvis({
    myData <- subset(dat, (year > (myYear()-1)) & (year < (myYear()+1)))
    gvisGeoChart(myData,
                 locationvar="state", colorvar="demVote",
                 options=list(region="US", displayMode="regions", 
                              resolution="provinces",
                              width=400, height=380,
                              colorAxis="{colors:['#FFFFFF', '#0000FF']}"
                 ))     
    })
})

Example 3: ui.R

require(shiny)
shinyUI(pageWithSidebar(
  headerPanel("Example 3: animated geo chart"),
  sidebarPanel(
    sliderInput("Year", "Election year to be displayed:", 
                min=1932, max=2012, value=2012,  step=4,
                format="###0",animate=TRUE)
  ),
  mainPanel(
    h3(textOutput("year")), 
    htmlOutput("gvis")
  )
))

googleVis with interaction

Example 4: server.R / part 1

require(googleVis)
shinyServer(function(input, output) {
  datasetInput <- reactive({
    switch(input$dataset, "pressure" = pressure, "cars" = cars)
  })
  output$view <- renderGvis({    
    jscode <- "var sel = chart.getSelection();
    var row = sel[0].row;
    var text = data.getValue(row, 1);               
    $('input#selected').val(text);
    $('input#selected').trigger('change');"    
    gvisScatterChart(data.frame(datasetInput()),
                     options=list(gvis.listener.jscode=jscode,
                                  height=200, width=300))

  })

Example 4: server.R / part 2

  output$distPlot <- renderPlot({
    if (is.null(input$selected))
      return(NULL)

    dist <- rnorm(input$selected)
    hist(dist,main=input$selected)
  })

  output$selectedOut <- renderUI({
    textInput("selected", "", value="10")
  })
  outputOptions(output, "selectedOut", suspendWhenHidden=FALSE)   
})

Example 4: ui.R

require(googleVis)
shinyUI(pageWithSidebar(
  headerPanel("", windowTitle="Example googleVis with interaction"),
  sidebarPanel(
    tags$head(tags$style(type='text/css', "#selected{ display: none; }")),
    selectInput("dataset", "Choose a dataset:", 
                choices = c("pressure", "cars")),
    uiOutput("selectedOut")
  ),
  mainPanel(
    tabsetPanel(
      tabPanel("Main",
               htmlOutput("view"),
               plotOutput("distPlot", width="300px", height="200px")),
      tabPanel("About", includeMarkdown('README.md')
      ))))
)

Further reading and examples

The End. So what ...?

  • Shiny makes it easy to build interactive applications with R
  • googleVis plots be as easily integrated as other static plots
  • No more boring data

How I created these slides

library(slidify)
setwd("~/Dropbox/Lancaster/")
author("GoogleVis_on_shiny")
## Edit the file index.Rmd file and then
slidify("index.Rmd")

Contact

Session Info

sessionInfo()
## R version 3.1.1 (2014-07-10)
## Platform: x86_64-apple-darwin13.1.0 (64-bit)
## 
## locale:
## [1] en_GB.UTF-8/en_GB.UTF-8/en_GB.UTF-8/C/en_GB.UTF-8/en_GB.UTF-8
## 
## attached base packages:
## [1] stats     graphics  grDevices utils     datasets  methods   base     
## 
## other attached packages:
## [1] slidify_0.4.5
## 
## loaded via a namespace (and not attached):
## [1] digest_0.6.4   evaluate_0.5.5 formatR_1.0    knitr_1.6     
## [5] markdown_0.7.4 stringr_0.6.2  tools_3.1.1    whisker_0.3-2 
## [9] yaml_2.1.13