Shiny lookup value from a dataframe as per selectizeInput

Is there a way to get selected value from selectizeInput and lookup its value from a dataframe and populate that in a textbox ?

 shiny::selectizeInput("name", "Name", unique(dataframe$Country)),
    shiny::textOutput("selected"),

text_demo1 <- textInput(
        "ID", 
        "ID"),

)  
    
    

server <- function(input, output) {
    # output$selected <- shiny::renderText(as.character(input$Category_Name))
}

shiny::shinyApp(ui,server)

Hi,

you can filter your data in the renderText using the input with dplyr using:
dataframe %>% filter(Country == input$name)

By the way I can't run the code you have posted. You are more likely to get responses if your code is reproducible. See below how to make a reprex.

This topic was automatically closed 54 days after the last reply. New replies are no longer allowed.

If you have a query related to it or one of the replies, start a new topic and refer back with a link.