library(shiny)
library(tidyverse)
library(ggbeeswarm)
data(iris)
# Define UI
ui <- fluidPage(
titlePanel("My Shiny App"),
sidebarLayout(
sidebarPanel(
sliderInput("dotsize", "Dot Size", min=0.1, max=5, value=1, step=0.1),
downloadButton(
outputId = 'save_violinplot',
label = 'Save plot',
icon = shiny::icon('download')
)
),
mainPanel(
plotOutput("plot")
)
)
)
# Define server logic
server <- function(input, output) {
violinplot <- reactive({
ggplot(iris, aes(x=Species, y=Petal.Length)) +
geom_violin(aes(fill=Species)) +
geom_quasirandom(size=input$dotsize) +
geom_boxplot(width=0.1)
})
output$plot <- renderPlot({
violinplot()
})
output$save_violinplot <- downloadHandler(
filename = 'plot.pdf',
content = function(file) {
ggsave(file, plot=violinplot(), width=297, height=210, unit='mm')
}
)
}
# Run the application
shinyApp(ui = ui, server = server)
(default)
ui <- fluidPage(
titlePanel("Hello Shiny!"),
sidebarLayout(
sidebarPanel(…),
mainPanel(…)
)
)
library(shinydashboard)
ui <- dashboardPage(
dashboardHeader(title="..."),
dashboardSidebar(...),
dashboardBody(...)
)
Task: Change the UI to shinyDashboard!
5 min
library(shiny)
library(shinydashboard)
library(tidyverse)
library(ggbeeswarm)
data(iris)
# Define UI
ui <- dashboardPage(
dashboardHeader(title = "My Shiny App"),
dashboardSidebar(
sliderInput("dotsize", "Dot Size", min=0.1, max=5, value=1, step=0.1),
downloadButton(
outputId = 'save_violinplot',
label = 'Save plot',
icon = shiny::icon('download')
)
),
dashboardBody(
plotOutput("plot")
)
)
# Define server logic
server <- function(input, output) {
violinplot <- reactive({
ggplot(iris, aes(x=Species, y=Petal.Length)) +
geom_violin(aes(fill=Species)) +
geom_quasirandom(size=input$dotsize) +
geom_boxplot(width=0.1)
})
output$plot <- renderPlot({
violinplot()
})
output$save_violinplot <- downloadHandler(
filename = 'plot.pdf',
content = function(file) {
ggsave(file, plot=violinplot(), width=297, height=210, unit='mm')
})
}
# Run the application
shinyApp(ui = ui, server = server)
fluidRow(
box(
width = 12,
status = 'success',
title = 'Plot',
plotOutput("plot")
)
Task: Put your plotOutput inside a fluidRow(box(...))
10 min
We can use brushes to place a selection on a plot
plotOutput(
"plot",
brush = "plot_brush"
)
We can use brushes to place a selection on a plot
plotOutput(
"plot",
brush = "plot_brush"
)
# (inside server function)
selected <- reactive({
brushedPoints(iris, input$plot_brush)
})
data.frames, such as the selected dots, can be output using DataTables
output$table_selected <- renderDataTable(
selected()
)
dataTableOutput(outputId='table_selected')
Task: add a brush to your plot and output selected data
Steps:
Code:
# UI
plotOutput(
"plot",
brush = "plot_brush"
)
# Server
selected <- reactive({
brushedPoints(iris, input$plot_brush)
})
# Server
output$table_selected <- renderDataTable(
selected()
)
# UI
fluidRow(
box(
width = 12,
status = 'primary',
title = 'Data',
dataTableOutput(outputId='table_selected')
)
)
Task: add a brush to your plot and output selected data
Steps:
Code:
# UI
plotOutput(
"plot",
brush = "plot_brush"
)
# Server
selected <- reactive({
brushedPoints(iris, input$plot_brush)
})
# Server
output$table_selected <- renderDataTable(
selected()
)
# UI
fluidRow(
box(
width = 12,
status = 'primary',
title = 'Data',
dataTableOutput(outputId='table_selected')
)
)
library(shiny)
library(shinydashboard)
library(tidyverse)
library(ggbeeswarm)
data(iris)
# Define UI
ui <- dashboardPage(
dashboardHeader(
title = "My Shiny App"
),
dashboardSidebar(
sliderInput("dotsize", "Dot Size", min=0.1, max=5, value=1, step=0.1),
downloadButton(
outputId = 'save_violinplot',
label = 'Save plot',
icon = shiny::icon('download')
)
),
dashboardBody(
tags$head(
includeCSS('04_includeCSS.css')
),
fluidRow(
box(
width = 12,
status = 'success',
title = 'Plot',
plotOutput(
"plot",
brush = "plot_brush"
)
),
),
fluidRow(
box(
width = 12,
status = 'primary',
title = 'Data',
dataTableOutput(outputId='table_selected')
)
)
)
)
# Define server logic
server <- function(input, output) {
violinplot <- reactive({
ggplot(iris, aes(x=Species, y=Petal.Length)) +
geom_violin(aes(fill=Species)) +
geom_point(size=input$dotsize) +
geom_boxplot(width=0.1) +
theme(aspect.ratio=3/4)
})
selected <- reactive({
brushedPoints(iris, input$plot_brush)
})
output$plot <- renderPlot({
violinplot()
})
output$save_violinplot <- downloadHandler(
filename = 'plot.pdf',
content = function(file) {
ggsave(file, plot=violinplot(), width=297, height=210, unit='mm')
})
output$table_selected <- renderDataTable(
selected()
)
}
# Run the application
shinyApp(ui = ui, server = server)
Let's add back geom_quasirandom (replace geom_point) - does the brush still work as expected?
# Filters and returns rows from a dataset dset
# where the x and y coordinates fall within the boundaries defined by a brush object,
# based on data extracted from a specified layer
find_dots <- function(dset, plot, layer, brush) {
tmp <- layer_data(plot, layer)
idx <- tmp$x >= brush$xmin & tmp$x <= brush$xmax & tmp$y >= brush$ymin & tmp$y <= brush$ymax
return(dset[idx, ])
}
# Replace brushedPoints()
# Reactively identify the dots selected in the plot using the brush.
# 2 corresponds to the layer of the geom_quasirandom function
selected <- reactive({
req(input$plot_brush)
find_dots(data_subset(), violinplot(), 2, input$plot_brush)
})
# Initialize zoom (NULL = no-zoom)
zoom <- reactiveValues(x = NULL, y = NULL)
observeEvent(input$plot_dblclick, {
if (!is.null(input$plot_brush)) {
zoom$x <- c(input$plot_brush$xmin, input$plot_brush$xmax)
zoom$y <- c(input$plot_brush$ymin, input$plot_brush$ymax)
} else {
zoom$x <- NULL
zoom$y <- NULL
}
})
violinplot <- reactive({
ggplot(data_subset(), aes(x=Species, y=Petal.Length)) +
geom_violin(aes(fill=Species)) +
geom_quasirandom(size=input$size) +
geom_boxplot(width=0.1) +
coord_cartesian(xlim=zoom$x, ylim=zoom$y, expand=T) +
theme(aspect.ratio=3/4)
})
plotOutput(
outputId = 'plot',
dblclick = 'plot_dblclick',
brush = brushOpts(
id = 'plot_brush',
resetOnNew = T
)
)
Good job! 👍