`filter()`输入`..1`的问题。闪亮的R

我正在尝试构建一个闪亮的应用程序,它根据用户条目过滤数据框,但是,我正在努力使用我创建的函数来执行此任务,错误Problem with 'filter()' input '..1'. x Input '..1' must be of size 9 or 1, not size 0.不断出现。我在这里发现了类似的问题,但答案没有帮助。

这是我的代码。这里还有带有示例数据的xlsx和csv文件。

我非常感谢你的帮助

library(shiny)
library(dplyr)
library(shinythemes)
library(shinydashboard)
library(shinyjs)

ui <- fluidPage(
  useShinyjs(),
  theme = shinytheme("flatly"),
  tabsetPanel(
    id = "tabs",
    tabPanel("Portafolio",
             sidebarLayout(
               sidebarPanel(
                 titlePanel("Seleccione las variables deseadas"),
                 uiOutput('fondo'),
                 uiOutput('reg'),
                 uiOutput('seguro'),
                 uiOutput('prod_sap'),
                 hr(),
                 actionButton("addbutton","Añadir")
               ),
               mainPanel(
                 titlePanel("Vista previa del portafolio"),
                 tableOutput('courseTable'),
                 actionButton(inputId = "continue", label = "Cotizar")
               )
             )
    ),
    tabPanel("Cotización",
             tableOutput('envio'))
  )
  )


server <- function(input, output, session) {
  fondo_edo <- reactive ({
    read.csv("E:/Input Fondo-Edo-Reg_example.csv") 
  })
  
  output$fondo <- renderUI({
    times <- input$addbutton
    fondos_todos <- as.vector(unique(fondo_edo()$FONDO))
    div(id= letters[(times %% length(letters)) + 1],
        selectInput("fondo_selec","Fondo:", choices=fondos_todos,selectize = T))    
  })
  
  fondo_edo1 <- reactive({
    subset(fondo_edo(), FONDO %in% input$fondo_selec)
  })
  
  output$reg <- renderUI({
    reg_todos <- as.vector( unique(fondo_edo1()$REGIÓN) )
    selectInput("reg_selec","Región:", choices=reg_todos, selectize = F)    
  })

  output$seguro <- renderUI({
    times <- input$addbutton
    div(id=letters[(times %% length(letters))+1],
        selectInput("seguro_selec","Seguro agricultura protegida:", choices=c("","Cosecha_Esp", "Inversión", "Planta"), selectize = F))    
  })
  
  output$prod_sap <- renderUI({
    times <- input$addbutton
    div(id=letters[(times %% length(letters))+1],
        conditionalPanel("input.seguro_selec == 'Inversión'",
                         selectInput("prod_sap_selec","Nombre producto SAP:", choices= "Tradicional")),
        conditionalPanel("input.seguro_selec != 'Inversión'",
                         selectInput("prod_sap_selec2","Nombre producto SAP:",choices = c("","Establecimiento", "Mantenimiento", "Producción"), selectize = F)))
  })

  values <- reactiveValues()
  values$df <- data.frame("Fondo" = numeric(0), "Región"= numeric(0), "Tipo de práctica"= numeric(0),
                          "Seguro agricultura protegida"= numeric(0))
  
  newEntry <- observe({
    if(input$addbutton > 0) {
      
      newLine <- isolate(c(input$fondo_selec, input$reg_selec,
                           "RIEGO", 
                           ifelse(input$seguro_selec=="Planta", paste0(input$seguro_selec,"/",input$prod_sap_selec2),
                                  input$seguro_selec)))
      isolate(values$df[nrow(values$df) + 1,] <-newLine)
    }
  })
  
  output$courseTable <- renderTable({values$df})
  
  observeEvent(input$continue, {
    updateTabsetPanel(session = session, inputId = "tabs", selected = "Cotización")
  })
  
  cotizacion <- reactive({
    isolate(busca_folios(fondo_edo(),values$df$Fondo, values$df$Región,
                         values$df$Seguro.agricultura.protegida))
  })
  output$envio <- renderTable({cotizacion()})
  
  # cotizacion <- reactiveValues()
  # cotizacion$df <-  busca_folios(fondo_edo(),values$df$Fondo, values$df$Región,
  #                                values$df$Sistema.de.producción, values$df$Seguro.agricultura.protegida)
  # 
  # output$envio <- renderTable({cotizacion$df})
}


runApp(shinyApp(ui,server))


#### Funciones ####

busca_folios <- function(tabla_fondos, fondo, reg, cultivo, seguro){
  historico_folios <- readxl::read_xlsx("E:/historico_example.xlsx")
  
  fn <- tabla_fondos[which(tabla_fondos$FONDO == fondo),]$`CLAVE FONDO`
  fond <- ifelse(nchar(fn)==1,paste0("000",fn),ifelse(nchar(fn)==2, paste0("00",fn),
                                                      ifelse(nchar(fn)==3, paste0("0",fn),fn)))
  rg <-tabla_fondos[which(tabla_fondos$REGIÓN == reg),]$CVE_REGION
  region <- ifelse(nchar(rg)==1, paste0("00",rg),ifelse(nchar(rg)==2,paste0("0",rg),rg))
  
  buscada <<- historico_folios %>% 
    dplyr::filter(Fondo==fond,
                  Región == region, Subramo == seguro)
}

回答

您的代码有几个问题:

  1. 您检查Fondo==fond. 但是,该参数称为fondo
  2. 您的函数有四个参数,而您只用三个参数调用它:busca_folios(fondo_edo(),values$df$Fondo, values$df$Región, values$df$Seguro.agricultura.protegida)。因此segura缺少参数
  3. 至少在我的机器上Región == region给了我一个错误,我通过在Región里面放反引号“`”来解决这个错误
  4. 在过滤器内,您检查相等性==,即使在修复其他问题之后,这也是您收到错误的原因。取而代之的是%in%

固定函数看起来像这样:

busca_folios <- function(tabla_fondos, fondo, reg, cultivo, seguro){
  historico_folios <- readxl::read_xlsx("historico_example.xlsx")
  
  fn <- tabla_fondos[which(tabla_fondos$FONDO == fondo),]$`CLAVE FONDO`
  fond <- ifelse(nchar(fn)==1,paste0("000",fn),ifelse(nchar(fn)==2, paste0("00",fn),
                                                      ifelse(nchar(fn)==3, paste0("0",fn),fn)))
  rg <-tabla_fondos[which(tabla_fondos$REGIÓN == reg),]$CVE_REGION
  region <- ifelse(nchar(rg)==1, paste0("00",rg),ifelse(nchar(rg)==2,paste0("0",rg),rg))
  
  buscada <<- historico_folios %>% 
    dplyr::filter(Fondo %in% fondo,
                  Región %in% region, Subramo %in% seguro)
}

和固定电话如下:

cotizacion <- reactive({
    isolate(busca_folios(fondo_edo(),values$df$Fondo, values$df$Región,
                         seguro = values$df$Seguro.agricultura.protegida))
  })

解决这些问题后的结果如下:


以上是`filter()`输入`..1`的问题。闪亮的R的全部内容。
THE END
分享
二维码
< <上一篇
下一篇>>