我正在构建一个闪亮的应用程序,用于从数据库进行数据可视化。我正在尝试使用renderUI的输入值运行ggplot,但给我一个错误

Error in na.omit(xVariable) : object 'xVariable' not found.


可能是什么问题呢?

服务器

setwd("~/csv")
shiny.maxRequestSize=30*1024^2

database <- dbConnect(MySQL(), user='user', password='', dbname='database', host='host')
dbResultSet <- dbSendQuery(database, "select * from core") #Query database for information
core<- fetch(dbResultSet, n=-1) #fetch resultset into a data frame
on.exit(dbDisconnect(database)) #Safely close database connection on application close
 shinyServer(function(input, output) {


output$graphData <- renderUI({
    selectInput("dataset", "Choose a dataset:" ,choices = c("pneumonia","core"))

  })

  #defining the xVariables for plotting
  #Create variables to be used for graphing based on the data entered
  #datasetInput <- dataset

output$xVariable <- renderUI({
    #Initializes the variable
    selectInput("xVariable","X Variable",names(graphData))
  })
)


  graphType<- renderText({ as.character(input$graphType) }) #graph type
  graphSecondary<- renderText({ as.character(input$graphTypeSecondary) }) #graph type
  xAxis <- reactive ({ input$xVariable })
  yAxis <- reactive ({ input$yVariable })
  xTitle <- renderText ({ as.character(input$xLabel ) })
  yTitle <- renderText ({ as.character(input$yLabel ) })
  legend <- renderText ({ as.character(input$legendTitle) })#graph legend
  #xVar <- as.factor(xVariable)
 # yVar <- as.factor(yVariable)



output$plot <- renderPlot({
     pneumonia.df<- data.frame(pneumonia)
    c <- ggplot(core, aes(x=na.omit (xVariable) ,fill=xVariable))
    plot <-  c + geom_bar() + xlab(xTitle())+ylab(yTitle())
    # hist(as.numeric(core.df$nresprate))
    print(plot)
    })
 })


用户界面

shinyUI(pageWithSidebar(
   # Application title.
  headerPanel("Core - Database"),

  sidebarPanel(
    #plotting data sidebar panel
    conditionalPanel(
      "$('li.active a').last().html()==='Graphs'",
      HTML("<div class='span6'>"),
      h4("Primary Plot"),
      tags$hr(),
     # selectInput("dataset", "Choose a dataset:" ,choices = c("pneumonia","core")),
      htmlOutput("graphData"),
      selectInput("graphType", "Choose graph to plot:",
                  list("Please Select a Graph" = "default",
                       "Histogram" = "hist",
                       "Box Plot" = "box",
                        "Scatter Plot" = "scatter"
                  )),
      htmlOutput("xVariable"),
      textInput("xLabel","X Label"),
      htmlOutput("yVariable"),
      textInput("yLabel","Y Label"),
      textInput("legendTitle","Legend Title"),
     helpText("Note: The graph only shows the data count only and scatter plots"),submitButton("Execute"),
     HTML("</div>")),
  mainPanel(
   tabsetPanel(
       tabPanel("Graphs",h4("Plot"),h4("Available Data"), plotOutput("plot"))
)
)

最佳答案

renderPlot命令中,可以在xVariablefill选项中引用na.omit。您应该改为input$xVariable

编辑

根据注释中的错误消息,您需要检查代码的反应性。在renderPlot部分中,有cplot用作名称,用于保存基于反应数据的图。我有两个建议:

1)重命名这些名称:cplot已经是R函数的名称,将它们用作图形的名称可能会导致意想不到的后果。

2)您需要在围绕这两行的行上添加reactive ({})包装器,因为它们正在使用反应性数据,并且您希望它们随着输入的变化而变化。

09-09 17:24