#shiny #shinydashboard #shiny-server #shinyapps #shiny-reactivity
#блестящий #shinydashboard #shiny-server #shinyapps #shiny-реактивность
Вопрос:
в dashboardBody, в TabPanel- «tab2″ title=»plot», у меня есть объект selectInput, выбор которого основан на выводе данных «contents2» с сервера. При этом я не получаю никаких вариантов, заполненных в выпадающем меню объекта selectInput, а также, когда я пытаюсь построить гистограмму на основе вариантов из selectInput, я получаю сообщение об ошибке: «объект ‘contents2’ не найден», Пожалуйста, кто-нибудь может подсказать мне здесь.
library(shinyWidgets)
library(shiny)
library(shinydashboard)
ui <- dashboardPage(
dashboardHeader(title="Test"),
dashboardSidebar(
sidebarMenu(id = 'sbar', verbatimTextOutput("text1"),
menuItem("File Selection", tabName = 'page1', icon = icon('line-chart'),
fileInput("file1", "Select CSV File", accept = c("text/csv","text/comma-
separated-values,text/plain",".csv")),
menuSubItem(actionButton(inputId="next1", label="NEXT"), tabName="next",
icon="") ),
menuItem('File Edit', tabName = 'page2',icon = icon('line-chart')),
menuItem('Section 3',tabName = 'page3',icon = icon('line-chart')) )
),
dashboardBody(
tabItems(
tabItem(tabName = "next",fluidRow(
tabBox(id = "tabset1", height = "650px", width=12,
tabPanel("Input Data", value="tab1", " ",
# fluidRow(tags$head(tags$style(HTML(" label {float:left;} "))),
radioGroupButtons("disp", "",label=NULL,
choices = c('Display head data'="head",'Display entire
data'="all"), selected=NULL),
fluidRow(DT::dataTableOutput("contents1"),style = "height:500px;
overflow-y: scroll;overflow-x: scroll;",
title = "Dashboard example") ),
tabPanel("Plot", value="tab2", " ",
selectInput("select1","Select Variable for display",choices =
c(colnames(DT::dataTableOutput("mydata")))),
fluidRow(plotOutput("plot1"))),
tabPanel("tab3 title", value='tab3', " ",
valueBoxOutput('tab3_valuebox'))
) ) ),
tabItem(tabName="page2", fluidRow(
tabBox(id = "tabset2", height = "650px", width=12, title = "My Page2 info",
tabPanel("Input Data", value="tab1", " ",
fluidRow(DT::dataTableOutput("contents2"))),
tabPanel("Plot", value="tab2", " ",
fluidRow(plotOutput("plot2")) )
) ) ) ) ) )
server <- function(input, output, session) {
observeEvent(input$next1, {
updateTabItems(session, "sbar", "next")
req(input$next1)
if (input$next1 == 0) {
return(NULL)
}else if (input$next1 == 1 amp; is.null(input$file1)) {
return(NULL)
}else {
inFile <- input$file1
myfile <- read_csv(inFile$datapath)
output$contents1 <- renderDataTable({
if(input$disp == "head") {
return(head(myfile))
}else {
return(myfile) }})
output$contents2 <- renderDataTable({
myfile }) }
})
observe(input$select1)
output$text1 <- renderText(print(input$sbar))
output$plot1 <- renderPlot({hist(contents2$input$select1)})
output$plot2 <- renderPlot({hist(rnorm(20))})
output$tab3_valuebox <- renderValueBox({
valueBox('2020',subtitle = "Need to use this in future",icon = icon("car"),
color = "red") })
}
shinyApp(ui, server)
Комментарии:
1. Вам нужно обработать это
selectInput
на стороне сервера внутриrenderUI
, а затемuiOutput
вui
.
Ответ №1:
Обработайте selectInput
на стороне сервера и создайте реактивный фрейм данных для работы. Приведенный ниже код работает.
ui <- dashboardPage(
dashboardHeader(title="Test"),
dashboardSidebar(
sidebarMenu(id = 'sbar', verbatimTextOutput("text1"),
menuItem("File Selection", tabName = 'page1', icon = icon('line-chart'),
fileInput("file1", "Select CSV File", accept = c("text/csv","text/comma-
separated-values,text/plain",".csv")),
menuSubItem(actionButton(inputId="next1", label="NEXT"), tabName="next",
icon="") ),
menuItem('File Edit', tabName = 'page2',icon = icon('line-chart')),
menuItem('Section 3',tabName = 'page3',icon = icon('line-chart')) )
),
dashboardBody(
tabItems(
tabItem(tabName = "next",fluidRow(
tabBox(id = "tabset1", height = "650px", width=12,
tabPanel("Input Data", value="tab1", " ",
# fluidRow(tags$head(tags$style(HTML(" label {float:left;} "))),
radioGroupButtons("disp", "",label=NULL,
choices = c('Display head data'="head",'Display entire
data'="all"), selected=NULL),
fluidRow(DT::dataTableOutput("contents1"),style = "height:500px;
overflow-y: scroll;overflow-x: scroll;",
title = "Dashboard example") ),
tabPanel("Plot", value="tab2", " ", uiOutput("selectvar"),
# selectInput("select1","Select Variable for display",choices =
# c(colnames(DT::dataTableOutput("mydata")))),
fluidRow(plotOutput("plot1"))),
tabPanel("tab3 title", value='tab3', " ",
valueBoxOutput('tab3_valuebox'))
) ) ),
tabItem(tabName="page2", fluidRow(
tabBox(id = "tabset2", height = "650px", width=12, title = "My Page2 info",
tabPanel("Input Data", value="tab1", " ",
fluidRow(DTOutput("contents2"))),
tabPanel("Plot", value="tab2", " ",
fluidRow(plotOutput("plot2")) )
) ) ) ) ) )
server <- function(input, output, session) {
observeEvent(input$next1, {
updateTabItems(session, "sbar", "next")
req(input$next1)
if (input$next1 == 0) {
return(NULL)
}else if (input$next1 == 1 amp; is.null(input$file1)) {
return(NULL)
}else {
inFile <- input$file1
#myfile <- read_csv(inFile$datapath)
myfile <- reactive(read_csv(inFile$datapath))
output$contents1 <- renderDataTable({
if(input$disp == "head") {
return(head(myfile()))
}else {
return(myfile()) }})
output$contents2 <- renderDT(myfile())
output$selectvar <- renderUI({
req(input$file1)
selectInput("select1", "Select Variable for display",
choices = c(colnames(myfile())))
})
output$plot1 <- renderPlot({hist(myfile()[[input$select1]])})
}
})
#observe(input$select1)
output$text1 <- renderText(print(input$sbar))
output$plot2 <- renderPlot({hist(rnorm(20))})
output$tab3_valuebox <- renderValueBox({
valueBox('2020',subtitle = "Need to use this in future",icon = icon("car"),
color = "red") })
}
shinyApp(ui, server)
Комментарии:
1. Я попытался выполнить приведенный выше код, которым вы поделились, и я получаю ошибку: Ошибка в read_csv: не удалось найти функцию «read_csv». Пожалуйста, помогите.
2. Спасибо, я это исправил. Спасибо за вашу помощь.