Warning: Error in tempVarsPromiseDomain: argument "name" is missing, with no default

library(tidyverse)
library(dplyr)
library(rvest)
library(xml2)
library(gdata)
library(shiny)
library(DT)
library(readxl)
library(writexl)
library(readr)

Dashboard <- read_delim("Dashboard.csv", 
                        ";", escape_double = FALSE, trim_ws = TRUE)
Dashboard$Country<- str_remove_all(Dashboard$Country, "�")
all_countries <- unique(Dashboard$Country)

ui<-fluidPage(
  
  selectInput(
    inputId = "Countries",
    label = "select country",
    choices = all_countries,
    multiple = TRUE),
  
  dataTableOutput(outputId="UCI-Ranking")
)

server<- function(input,output){
  
  output$UCI-Ranking <- DT::renderDataTable(Dashboard)({
    
    country_selected <-Dashboard %>%
      filter(Country %in% input$Countries)
    
    DT::datatable(data = country_selected)
  })
}

shinyApp(ui=ui,server=server)

Your demo app refers to a Dashboard.csv that no one will have access to.
If you google that error message, you'll see it has to do with DT. But it's hard to diagnose things without being to setup Dashboard

Could you format this into a reproducible example? That is a set of code or rstudio.cloud project that folks can easily get up and running to replicate your issue? Currently, this is only part of a shiny app.

IF you aren't familiar with best practices for shiny reprexes, check out

This will make it easier for folks to replicate your issue and offer suggestions to solve it.

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.