Remove error message

Hi all, in the below application, is there a way to get rid of red color error message ? like whenever there is a error message, we may require nothing to be printed there (Just blank). Is it possible to achieve

---
title: "Untitled"
runtime: shiny
output: 
  flexdashboard::flex_dashboard:
    orientation: columns
    vertical_layout: fill
---

```{r setup, include=FALSE}
library(flexdashboard)
library(dplyr)
library(DT)
library(dplyr)
library(shiny)
```

Column {data-width=650}
-----------------------------------------------------------------------

### Chart A

```{r}
selectInput("Tic", "", choices = c("", "ALL", as.character(iris$Species)), selected = NULL)
actionButton("Submit", "Submit")
textOutput("Total")
tableOutput("SUMMARY_GENERAL_table")


data2 <- reactiveVal(iris[1:2, ])

observeEvent(input$Submit, {
  if (input$Tic == "") {
    table_display <- iris[1:2, ]
  } else if (input$Tic == "ALL") {
    table_display <- iris
  }  else {
    table_display <- iris %>% filter(Species %in% input$Tic)
  }

  data2(table_display)
})


output$SUMMARY_GENERAL_table <- renderTable({
  data2()
})

output$Total <- renderText(
  paste0("Sum ", formatC(as.numeric(sum(data2()[(data2()$Species == "virginica"), ]$Species))))
)
```


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