Ошибка: объект типа «замыкание» не является поднабором - PullRequest
0 голосов
/ 02 июня 2019

Я пытаюсь изменить значения в 2 ValueBoxes (средние значения атрибутов 'pf_score' и 'ef_score' каждый год) с помощью ползунка, который имеет годы 2008-2016. Вывод отображается так, как я хотел, но я также вижу ошибку «объект типа« замыкание »не является поднабором»

ОБНОВЛЕНИЕ: я не могу запустить весь код, нажав на Run-App. Я получаю сообщение об ошибке «Не удалось найти функцию df1». Сначала я должен прочитать все фреймы данных отдельно, а затем нажать «Run-App», чтобы увидеть пользовательский интерфейс.

output screenshot

server.r

require(shiny)
require(dplyr)
require(shinydashboard)

shinyServer(function(input,output){

  df <- read.csv("hfi_cc_2018.csv", header = T)

  summary(df)
  sapply(df, function(x) sum(is.na(x)))
  #Replace Null Values
  df[is.na(df)] <- 0
  df[,5:ncol(df)] <- round(df[,5:ncol(df)], 2)

  #adding selective columns new df1
  #https://stackoverflow.com/questions/10085806/extracting-specific-columns-from-a-data-frame
  df1<- df[, (names(df) %in% c("year","pf_score", "ef_score"
  ))]

output$select_years <- renderUI(
{
   card <- df1 %>%
              filter(year == input$years)
   output$pfrank = renderValueBox(
     valueBox(round(mean(card$pf_score),1),
              "Personal Freedom Score")
   )
   output$efrank = renderValueBox(
     valueBox(round(mean(card$ef_score),1),
              "Economic Freedom Score")
   )
}
)
})

ui.r

require(shiny)
require(shinydashboard)

shinyUI(

  dashboardPage( 
    dashboardHeader(title = "Human Freedom Index", titleWidth = 300),
    dashboardSidebar(
      sliderInput("years","Select Year:",
                  min = min(df1$year),
                  max = max(df1$year),
                  value = min(df1$year),
                  step = 1),
      selectInput("variable","Select Freedom Factor:",
                  choices = colnames(df1)
                  )
    ),

    dashboardBody(
      uiOutput("select_years"),
      fluidRow(
        valueBoxOutput("pfrank"),
        valueBoxOutput("efrank")
      )
    )
  )

)

Ответы [ 2 ]

1 голос
/ 03 июня 2019

Этот тип ошибки обсуждается в: Ошибка в <мой код>: объект типа 'замыкание' не является поднабором

В этом случае, похоже, у вас есть card как простой фрейм данных, тогда как вам нужен reactive, чтобы он пересчитывался при перемещении ползунка. Также выражение для renderUI можно упростить до списка. например,

ui <- shinyUI( ... )
server <- function(input, output) {
  card <- reactive({
    df1 %>%
    filter(year == input$years)
  })
  output$select_years <- renderUI(
    c(renderValueBox(valueBox(round(mean(card()$pf_score), 1),
                   "Personal Freedom Score")),
      renderValueBox(valueBox(round(mean(card()$ef_score), 1),
                   "Economic Freedom Score"))))
}
shinyApp(ui, server)

Также обратите внимание, что новая версия Shiny немного упрощает синтаксис. Код может просто войти в app.R, и вам нужно определить ui и server.

0 голосов
/ 02 июня 2019

Вы можете использовать observe() для визуализации полей значений вместо renderUI:

require(shiny)
require(dplyr)
require(shinydashboard)

   df <- read.csv("hfi_cc_2018.csv", header = T)

   summary(df)
   sapply(df, function(x) sum(is.na(x)))
   #Replace Null Values
   df[is.na(df)] <- 0
   df[,5:ncol(df)] <- round(df[,5:ncol(df)], 2)

   #adding selective columns new df1
   #https://stackoverflow.com/questions/10085806/extracting-specific-columns-from-a-data-frame
   df1 <- df[, (names(df) %in% c("year","pf_score", "ef_score"))]

 #UI  
 ui <- dashboardPage( 
    dashboardHeader(title = "Human Freedom Index", titleWidth = 300),
    dashboardSidebar(
      sliderInput("years","Select Year:",
                  min = min(df1$year),
                  max = max(df1$year),
                  value = min(df1$year),
                  step = 1),
      selectInput("variable","Select Freedom Factor:",
                  choices = colnames(df1)
      )
    ),

    dashboardBody(
      fluidRow(
        valueBoxOutput("pfrank"),
        valueBoxOutput("efrank")
      )
    )
  )

#Server
 server <- function(input,output){

   observe({
       card <- df1 %>%
         filter(year == input$years)
       output$pfrank = renderValueBox(
         valueBox(round(mean(card$pf_score),1),
                  "Personal Freedom Score")
       )
       output$efrank = renderValueBox(
         valueBox(round(mean(card$ef_score),1),
                  "Economic Freedom Score")
       )
     })
 }

#Run app
shinyApp(ui, server)
...