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)