繁体   English   中英

`filter()` 输入 `..1` 有问题。 与 shiny R

[英]Problem with `filter()` input `..1`. with shiny R

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

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

我非常感谢你的帮助

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. 您的 function 有四个 arguments 而您只用三个调用它: 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%

固定的 function 看起来像这样:

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))
  })

修复这些问题后的结果如下所示:

在此处输入图像描述

暂无
暂无

声明:本站的技术帖子网页,遵循CC BY-SA 4.0协议,如果您需要转载,请注明本站网址或者原文地址。任何问题请咨询:yoyou2525@163.com.

 
粤ICP备18138465号  © 2020-2024 STACKOOM.COM