Linked Brushing
More examples defining brush queries using Shiny and ggplot2.
- 
    These notes provide more realistic examples of linked brushing. Though the visual design problems they address are more complex, they follow the same recipe described earlier, - A reactiveValis defined to track the currently selected samples.
- An observeEventis used to update thereactiveValevery time a plot is brushed.
- Downstream rendercontexts update plot and data table outputs whenever thereactiveValis changed.
 
- A 
- 
    The first example implements linked brushing on the movie ratings dataset presented earlier. Before we used a slider to select movies within a user-specified time range. Our graphical alternative is to allow selections over a histogram of movie release dates within the dataset. Specifically, we will create an interactive version of the histogram below, library(tidyverse) library(lubridate) movies <- read_csv("https://raw.githubusercontent.com/krisrs1128/stat479_s22/main/_posts/2022-02-10-week04-03/apps/data/movies.csv") %>% mutate( date = as_date(Release_Date, format = "%b %d %Y"), year = year(date), Major_Genre = fct_explicit_na(Major_Genre) ) movies %>% count(year) %>% ggplot(aes(year, n)) + geom_bar(stat = "identity", width = 1) + scale_y_continuous(expand = c(0, 0)) and when a subset of years of has been brushed, we will highlight the corresponding movies in the same kind of scatterplot used in the earlier, slider-based implementation. ggplot(movies) + geom_point(aes(Rotten_Tomatoes_Rating, IMDB_Rating)) 
- 
    Viewed more abstractly, we are going to use a brush to link the histogram and scatterplot views. We will be able to evaluate the change in a visualization (the scatterplot) after “conditioning” on a subset defined by a complementary view (the histogram). This is analogous to the penguins dataset example – only the form of the base plots has changed. 
- 
    The main logic needed to link these views is given in the block below. The histogram plotOutputin the UI is given a brush which will be used to select years[1]. We use theselectedreactive value to store a list ofTRUE/FALSE’s indicating which movie falls into the currently brushed time range. Each time the brushed range is changed, theoutput$scatterplotandoutput$tableoutputs are regenerated, highlighting those movies that appear in theselected()list.ui <- fluidPage( fluidRow( column(6, plotOutput("histogram", brush = brushOpts("plot_brush", direction = "x"))), column(6, plotOutput("scatterplot")) ), dataTableOutput("table") ) server <- function(input, output) { selected <- reactiveVal(rep(TRUE, nrow(movies))) observeEvent( input$plot_brush, selected(reset_selection(movies, input$plot_brush)) ) output$histogram <- renderPlot(histogram(movies)) output$scatterplot <- renderPlot(scatterplot(movies, selected())) output$table <- renderDataTable(data_table(movies, selected())) }
- 
    We haven’t included the full code for histogram,scatterplot, anddata_table, since they in and of themselves don’t require any logic for interactivity. You can try out the full code here and tinker with the interface below.
- 
    A natural extension of the previous app is to allow brushing on both the histogram and the scatterplot. Brushing over the scatterplot would show the years during which the selected movies were released – this can be used to find out if very poorly or highly rated movies are associated with specific time ranges, for example. 
- 
    The updated application is below. The main differences are that, - The scatterplot plotOutputnow includes a brush.
- We are passing in the reactive value of the selected()movies into the histogram as well.
 ui <- fluidPage( fluidRow( column(6, plotOutput("histogram", brush = brushOpts("plot_brush", direction = "x"))), column(6, plotOutput("scatterplot", brush = "plot_brush")) ), dataTableOutput("table") ) server <- function(input, output) { selected <- reactiveVal(rep(TRUE, nrow(movies))) observeEvent( input$plot_brush, selected(reset_selection(movies, input$plot_brush)) ) output$histogram <- renderPlot(histogram(movies, selected())) output$scatterplot <- renderPlot(scatterplot(movies, selected())) output$table <- renderDataTable(data_table(movies, selected())) } shinyApp(ui, server)
- The scatterplot 
- 
    For the scatterplot, we simply reduced the transparency for the movies that weren’t selected. We cannot do this for the histogram, though, because the movies are not directly represented in this plot, only their counts over time. Instead, our idea will be to draw two overlapping histograms. A static one in the background will represent the year distribution before any selection. A changing one in the foreground will be redrawn whenever the selected movies are changed. For example, the code below overlays two geom_barlayers, with one corresponding only to the first 500 movies in the dataset.sub_counts <- movies[1:500, ] %>% count(year) movies %>% count(year) %>% ggplot(aes(year, n)) + geom_bar(stat = "identity", fill = "#d3d3d3", width = 1) + geom_bar(data = sub_counts, stat = "identity", width = 1) + scale_y_continuous(expand = c(0, 0)) 
- 
    Combining these ideas leads to the app here and included below. Try brushing on both the scatterplot and the histogram. The especially interesting thing about this approach is that, without introducing any new screen elements, we’ve widened the class of questions of that can be answered. In a sense, we’ve increased the information density of the display – we can present more information without having to introduce any peripheral UI components or graphical marks. 
- 
    In our last problem, we would like to use a dataset of flight delays to understand what characteristics of the flights make some more / less likely to be delayed. The basic difficulty is that there are many potentially relevant variables, and they might interact in ways that are not obvious in advance. library(nycflights13) head(flights) ## # A tibble: 6 × 19 ## year month day dep_time sched_dep…¹ dep_d…² arr_t…³ sched…⁴ arr_d…⁵ carrier ## <int> <int> <int> <int> <int> <dbl> <int> <int> <dbl> <chr> ## 1 2013 1 1 517 515 2 830 819 11 UA ## 2 2013 1 1 533 529 4 850 830 20 UA ## 3 2013 1 1 542 540 2 923 850 33 AA ## 4 2013 1 1 544 545 -1 1004 1022 -18 B6 ## 5 2013 1 1 554 600 -6 812 837 -25 DL ## 6 2013 1 1 554 558 -4 740 728 12 UA ## # … with 9 more variables: flight <int>, tailnum <chr>, origin <chr>, ## # dest <chr>, air_time <dbl>, distance <dbl>, hour <dbl>, minute <dbl>, ## # time_hour <dttm>, and abbreviated variable names ¹sched_dep_time, ## # ²dep_delay, ³arr_time, ⁴sched_arr_time, ⁵arr_delay
- 
    Our solution strategy will be to dynamically link complementary histograms. By brushing the histogram of delays time, we’ll be able to see the conditional distributions for other variables of interest. In principle, we could do this for every variable in the dataset, but for the example, we’ll focus on just the scheduled departure time and flight distance. 
- 
    The UI in this case creates three separate histograms, each of which introduces a brush. We will plan on brushing one histogram at a time, which is then used to update overlays on each. ui <- fluidPage( fluidRow( column( 6, plotOutput("h1", brush = brushOpts("plot_brush", direction = "x"), height = 200), plotOutput("h2", brush = brushOpts("plot_brush", direction = "x"), height = 200), plotOutput("h3", brush = brushOpts("plot_brush", direction = "x"), height = 200) ), column(6, dataTableOutput("table")) ), )
- 
    The logic for drawing the overlays is encapsulated by the functions below. The bar_plotfunction draws two bar plots over one another, one referring to a globalcountsobject of unchanging histogram bar heights. The second refers to the bar heights for the continually updated overlays. Notice that we use.data[[v]]to use variable names encoded in strings. Theplot_overlayfunction provides the histogram bar heights for variablevafter brushing over the flights inselected_.bar_plot <- function(sub_flights, v) { ggplot(counts[[v]], aes(.data[[v]], n)) + geom_bar(fill = "#d3d3d3", stat = "identity") + geom_bar(data = sub_flights, stat = "identity") } plot_overlay <- function(selected_, v) { flights %>% filter(selected_) %>% count(.data[[v]]) %>% bar_plot(v) }
- 
    Code for the full application is linked here. Thanks to shiny’s reactiveValandbrushedPointsdefinitions, implementing interactivity only requires about 20 lines (starting fromui <- ...to the end). The rest of the code is used to draw new static plots depending on the current selection.
[1] Note that we restrict brush motion to the x-direction. This is because the x direction alone encodes year information, which we want to select.