My Presentation

J.J. Allaire

October 10th, 2021

Part One

Shiny Preamble

Foobar

Shiny Basics

Shiny is a shinyInput() great way to create interactive user interfaces without learning JavaScript.

library(shiny)
ui <- fluidPage(
  selectInput("var", "Variable", 
              choices = names(diamonds)),   
  tableOutput("output")                         
)
server <- function(input, output, session) {
  data <- reactive(
    filter(diamonds, .data[[input$var]] > 0)
  )
  output$output <- renderTable(head(data()))
}
library(shiny)
ui <- fluidPage(
  selectInput("var", "Variable", 
              choices = names(diamonds)),   
  tableOutput("output")                         
)
server <- function(input, output, session) {
  data <- reactive(
    filter(diamonds, .data[[input$var]] > 0)
  )
  output$output <- renderTable(head(data()))
}
library(shiny)
ui <- fluidPage(
  selectInput("var", "Variable", 
              choices = names(diamonds)),   
  tableOutput("output")                         
)
server <- function(input, output, session) {
  data <- reactive(
    filter(diamonds, .data[[input$var]] > 0)
  )
  output$output <- renderTable(head(data()))
}

As you can see, the shiny basics are really shining here!

Slide with Bullets

  • First1
  • Here we go. Here we go again. Here it is again. This is it once again.
  • This is the dope stuff.2
  • This is more stuff.
  • Third

Part Two

Slide Two

Column 1

Column 2

import numpy as np
import matplotlib.pyplot as plt

r = np.arange(0, 2, 0.01)
theta = 2 * np.pi * r
fig, ax = plt.subplots(subplot_kw={'projection': 'polar'})
ax.plot(theta, r)
ax.set_rticks([0.5, 1, 1.5, 2])
ax.grid(True)
plt.show()

  1. Here we go with the footnote http://www.foolbar.com↩︎

  2. Here we go with the footnote http://www.foolbar.com↩︎