我正在为数据库中的数据可视化构建一个闪亮的应用程序。我正在尝试使用来自renderUI的输入值运行ggplot但是给我一个错误
Error in na.omit(xVariable) : object 'xVariable' not found.
可能是什么问题?
Server.R
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)
})
})
ui.R
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"))
)
)
答案 0 :(得分:2)
在renderPlot
命令中,您可以参考xVariable
和fill
选项中的na.omit
。您应该将其称为input$xVariable
。
修改强>
根据评论中的错误消息,您需要检查代码的反应性。在renderPlot
部分中,您有c
和plot
作为名称来保存基于被动数据的图表。我有两个建议:
1)重命名:c
和plot
已经是R函数的名称,并使用这些作为图表的名称可能会导致意想不到的后果。
2)你需要在生成这两件事的行周围添加reactive ({})
包装器,因为他们正在使用被动数据,并且你希望它们随着输入的变化而改变。