#r #shiny #shinydashboard
#r #блестящий #shinydashboard
Вопрос:
Сейчас я работаю над панелью мониторинга, которую не могу запустить из-за ошибки, которую я получаю, которая отображается следующим образом.:
Error in tagAssert(icon, type = "i") :
Expected an object with class 'shiny.tag'.
Я вставлю свой код ниже, но я не уверен, в чем моя ошибка. Все мои пакеты, RStudio и R обновлены, так что дело не в этом. Любая помощь приветствуется.
# Source Scripts ----
source("EDU 291 Libraries.R", local = TRUE)
source("EDU 291 Data.R", local = TRUE)
source("EDU 291 uiPanels.R", local = TRUE)
source("EDU 291 Utils.R", local = TRUE)
#sample change
# UI ----
ui <- dashboardPage(
dashboardHeader(title = "COVID Cases Dashboard" )
, dashboardSidebar(
sidebarMenu(
menuItem(tabName = "dashboard", text = "Dashboard", icon = icon("map"))
, menuItem(tabName = "graphs", text = "Graphs", icon = icon("graph"))
, menuItem(tabName = "sources", text = "Sources", icon =("book"))
)
)
, dashboardBody(
fluidRow(
box(width = 12, status = "primary", title = "Draft FOR NOW"
, column(width = 4
, tabItems(
dashboard
)
)
, column(width = 8
, leafletOutput("map")
)
)
)
)
)
# Server ----
server <- function(input, output) {
# test for push
# Filters/Sliders
output$instPicker <- renderUI({
ls_institution <- covid_data %>%
select(institution) %>%
filter(institution != "") %>%
distinct()%>%
pull()
ls_institution <- sort(ls_institution)
ls_institution <- prepend(ls_institution, "Nothing Selected", before = 1)
pickerInput(inputId = 'instPicker'
, label = "Peer Institutions"
, choices = ls_institution
, selected = ls_institution[1]
, options = pickerOptions(liveSearch = T, liveSearchStyle = 'startsWith')
)
})
output$enrollmentSlider <- renderUI({
sizeStart <- min(covid_data$enrollment)
sizeEnd <- max(covid_data$enrollment)
sliderInput(inputId = "enrollmentSize"
, label = "Undergraduate Enrollment"
, min = sizeStart
, max = sizeEnd
, value = c(sizeStart, sizeEnd)
, ticks = F)
})
output$reportMethodFilter <- renderUI({
ls_reportMethod <- c("bad"
, "coming soon (e.g. the university has announced that a dashboard will exist)"
, "online dashboard"
, "other"
, "reporting cumulative cases only"
, "via a campus newsletter")
pickerInput(inputId = "reportMethod", label = "Report Method", choices = ls_reportMethod,
multiple = T, selected = ls_reportMethod)
})
output$updateFrequencyFilter <- renderUI({
ls_updateFrequency <- c("daily"
, "monthly"
, "unsure"
, "other"
, "weekdays only"
, "weekly")
pickerInput(inputId = "updateFrequency", label = "Update Frequency", choices = ls_updateFrequency,
multiple = T, selected = ls_updateFrequency)
})
#reactive data
fallMapData <- reactive({
req(input$instPicker)
df <- covid_data
#institution picker
if(input$instPicker != "Nothing Selected"){
df <- df %>% filter(institution %in% input$instPicker)
}
df %>%
filter(
!is.na(mapGroup)
, updateFrequency %in% input$updateFrequency
, reportMethod %in% input$reportMethod
, enrollment >= input$enrollmentSize[1] amp; enrollment <= input$enrollmentSize[2]
)
})
# End of server
}
# Run the application
shinyApp(ui = ui, server = server)
Если мне нужно добавить код с других моих страниц, дайте мне знать, но я не думаю, что это проблема прямо сейчас.
Комментарии:
1. Эта строка выглядит странно…
menuItem(tabName = "sources", text = "Sources", icon =("book"))
2. Может быть, вы хотели
icon =icon(“book”)
3. Итак, я исправил 3-ю строку пункта меню, но теперь я получаю эту ошибку: ` Ошибка в FUN(X[[i]], …): ожидаемый объект с классом `shiny.tag’. «Есть какие-нибудь советы по этому поводу?
4. Обновление, я внес некоторые изменения, и теперь я здесь: Предупреждение: ошибка в as.character: не удается принудительно преобразовать тип ‘closure’ в вектор типа ‘character’ [Трассировка стека недоступна]. Панель мониторинга открывается, но я вижу эту ошибку.