Reactive filtering and adding in shiny

Hi,

First of all, thanks for generating a nice reprex with data and code available. The only thing you forgot was to add the necessary libraries, so I had to guess them :slight_smile:

I think I get what you wanted, so this is my solution:

df <- read.csv('https://raw.githubusercontent.com/gooponyagrinch/sample_data/master/datasheet.csv')

library(shiny)
library(shinyWidgets)
library(tidyverse)
library(DT)

ui <- fluidPage(
  fluidRow(
    column("",
           width = 10, offset = 1,
           tags$h3("Select Area"),
           panel(
             sliderInput("current", "Current Score",
                         min = 0, max = 100, value = 20),
             sliderInput("projected", "Projected Score",
                         min = 0, max = 100, value = 20),
             sliderInput("age", "Age",
                         min = 18, max = max(df$age), value = c(18,24)),
             checkboxGroupInput("ethnicity",label = "Ethnicity", 
                                choices = list("Caucasian"="Caucasian",
                                               "African-American"="African-American",
                                               "Hispanic"="Hispanic",
                                               "Other"="Other")),
             checkboxInput('previous', label = "Previous Sale"),
             checkboxInput('warm', label = "Warm Lead"),
             actionButton("button", "Add to List")), 
           textOutput("counter"),
           tags$h2("Data to filter"),
           DT::dataTableOutput("table"),
           tags$h2("IDs added to list"),
           DT::dataTableOutput("addedToList")
    )
  )
)

server <- function(input, output, session) {
  
  filterData = reactiveVal(df %>% mutate(key = 1:nrow(df)))
  addedToList = reactiveVal(data.frame())
  
  filtered_df <- reactive({
    
    res <- filterData() %>% filter(current_grade >= input$current)
    res <- res %>% filter(projected_grade >= input$projected)
    res <- res %>% filter(age >= input$age[1] & age <= input$age[2])
    res <- res %>% filter(ethnicity %in% input$ethnicity | is.null(input$ethnicity))
    
    if(input$previous == TRUE)
      res <- res %>% filter(previous_sale == 1)
    
    if(input$warm == TRUE)
      res <- res %>% filter(warm_lead == 1)
    
    res
    
  })
  
  output$counter <- renderText({
    res <- filtered_df() %>% select(customer_id) %>% n_distinct()
    res
  })
  
  
  output$table <- renderDataTable({
    res <- filtered_df() %>% distinct(customer_id)
    res
    
  })
  
  observeEvent(input$button, {
    
    addedToList(rbind(addedToList(), 
                      filterData() %>% filter(key %in% filtered_df()$key) %>% 
                        select(customer_id) %>% distinct() ))
    
    filterData(filterData() %>% filter(!key %in% filtered_df()$key))
    
  })
  
  output$addedToList <- renderDataTable({
    addedToList()
  })
  
}

shinyApp(ui,server)
  • First of all, I made the original dataset reactive (called filterData) and added a unique key column for better filtering (your data has no unique column, as 1 customer ID can have multiple rows).
  • I also created a reactive data frame (called addedToList) to store the added values from the filtering
  • I then added an obverveEvent for the add-to-list button in which I first add the filtered values to addedToList, then remove them from the filterData dataset so they will no longer display in that table
  • I also added a second table to your output to show the list (you can remove this of course)

Hope this helps,
PJ