I have an application containing many user Inputs. I want to save them in a csv file.
ui<- fluidPage(titlePanel("Application"),
fluidRow(column( width = 8,
textInput("message", label = "",placeholder = "Type your message here."),
actionButton("send", "Send"), heading = "Smart Advisor", status = "primary")
))
server<- function(input, output, session)
{
clearInput<- function()
{
updateTextInput(session,"message", value = "")
}
observeEvent(input$send,{
#Case 1
insertUI(
selector = "#message",
where = "beforeBegin",
ui=div(class="registration",
div(class="bubble",
wellPanel(
p("Please enter your Name")
)
)))
if(grepl("^[a-zA-Z][a-zA-Z ]+[a-zA-Z]$",input$message, perl=T))
{
insertUI(
selector = "#message",
where = "beforeBegin",
ui=div(class="registration",
div(class="bubble",
wellPanel(
p(input$message),
p("Please enter your Number")
)
)))
clearInput()
}
})
}
shinyApp(ui,server)