I am trying to make an application with 2 filters.
The first filter gives choices of coloumn name.
The second filter gives choices of rows from the selected coloumn.
I have managed to use uiOutput and renderUI to make the second filter dynamic BUT...
The data doesnt reflect the selection of the second filter.
cars<-mtcars[8:11]
library(shiny)
ui <- fluidPage(
selectInput("a","selection1",names(cars)),
uiOutput("b"),
tableOutput("x")
)
server <- function(input, output, session) {
output$b <- renderUI({
selectInput("b", "selection 2", choices = unique(cars[,input$a]))
})
r<-reactive({
s<-cars[input$a,input$b]
})
output$x<-renderTable({r()})
}
shinyApp(ui, server)
*NOTE: I am still unfamiliar with observe and isloate function.