如何根据用户输入更改显示 table
How to change displayed table depending on the userInput
我有一段代码需要根据 R 中 SelectInput 命令的用户输入显示不同的 table。
我只想在用户输入为级别 2 时显示 table base_level2 并在用户使用 selectInput 级别 3 选择时显示 base_level3
我不确定反应命令是否能帮助我解决这个问题,但当时我真的很困惑我该怎么做。
先谢谢大家了。
ui.R
library(shiny) library(radarchart) library(fmsb)
# Define UI for random distribution application
shinyUI(pageWithSidebar( headerPanel('A competency profiling model
for Software engineers'), sidebarPanel(
selectInput("dataset", "Choose Level of competence :",
choices = c("Level 2", "Level 3"), selected = "Level 2"),
radioButtons("selectedCategory","Make your choice of Skills : ", rownames(x), selected = "Professional skills" ),
checkboxGroupInput('selectedLevels', 'Who to include',
names(scores[]), selected="Technical Junior"),
sliderInput("Candidate", "Candidate number:",
min = 1, max = 50, value = 1)),
mainPanel(
tabsetPanel(type="tabs",
tabPanel('Level2/Level3 RCD frame', tableOutput("table")),
tabPanel("Candidates ACD frame ", tableOutput("candidate")),
tabPanel("Radar Plot #1", chartJSRadarOutput("radar", width = "450", height = "300"), width = 7 ),
tabPanel("Radar Plot #2" ,plotOutput("triangle", width = "100%", height = "900px"), width = 7 ),
tabPanel("Clustering Plots",plotOutput("cluster", width = "100%", height = "900px"), width = 7 ),
tabPanel("Correlation Plots",plotOutput("corellation",width =
"100%", height =
"900px"),width = 7 ),
tabPanel("Classification Tree", plotOutput("class",width = "100%", height = "900px"),width = 7))
)
)
)
server.R
function(input, output) {
datasetInput <- reactive({
switch(input$dataset,
"Level 2" = as.matrix(base_level2),
"Level 3" = as.matrix(base_level3)
)
})
output$table <- renderTable({(datasetInput)},rownames=TRUE,striped = TRUE,hover = TRUE, bordered = TRUE)
添加了一些假数据使其工作,修复了 HubertL 在评论中指出的语法错误,并且工作正常:
library(shiny)
library(radarchart)
library(fmsb)
# Fake Data
x <- data.frame(skilz = c("Professional Skills","Technical Skills","Soft Skills"),a = c(1,2,3),b = c(11,12,13),row.names = "skilz")
scores <- c("Technical Junior" = 1,"Technical Senior" = 2)
base_level2 <- data.frame(x = c(1,2,3),y = c(4,5,6),z = c(7,8,9))
base_level3 <- data.frame(x = c(11,12,13),y = c(14,15,16),z = c(17,18,19))
# Define UI for random distribution application
u <- shinyUI(pageWithSidebar(headerPanel('A competency profiling model for Software engineers'),
sidebarPanel(
selectInput("dataset","Choose Level of competence :",
choices = c("Level 2","Level 3"),selected = "Level 2"),
radioButtons("selectedCategory","Make your choice of Skills : ",rownames(x),selected = "Professional skills"),
checkboxGroupInput('selectedLevels','Who to include',
names(scores[]),selected = "Technical Junior"),
sliderInput("Candidate","Candidate number:",
min = 1,max = 50,value = 1)),
mainPanel(
tabsetPanel(type = "tabs",
tabPanel('Level2/Level3 RCD frame',tableOutput("table")),
tabPanel("Candidates ACD frame ",tableOutput("candidate")),
tabPanel("Radar Plot #1",chartJSRadarOutput("radar",width = "450",height = "300"),width = 7),
tabPanel("Radar Plot #2",plotOutput("triangle",width = "100%",height = "900px"),width = 7),
tabPanel("Clustering Plots",plotOutput("cluster",width = "100%",height = "900px"),width = 7),
tabPanel("Correlation Plots",plotOutput("corellation",width = "100%",height =
"900px"),width = 7),tabPanel("Classification Tree",plotOutput("class",width = "100%",height = "900px"),width = 7)))
)
)
s <-
function(input,output) {
datasetInput <- reactive({
switch(input$dataset,
"Level 2" = as.matrix(base_level2),
"Level 3" = as.matrix(base_level3)
)
})
output$table <- renderTable({(datasetInput()) },
rownames = TRUE,striped = TRUE,hover = TRUE,bordered = TRUE)
}
shinyApp( ui=u,server=s )
产量:
我有一段代码需要根据 R 中 SelectInput 命令的用户输入显示不同的 table。 我只想在用户输入为级别 2 时显示 table base_level2 并在用户使用 selectInput 级别 3 选择时显示 base_level3 我不确定反应命令是否能帮助我解决这个问题,但当时我真的很困惑我该怎么做。 先谢谢大家了。
ui.R
library(shiny) library(radarchart) library(fmsb)
# Define UI for random distribution application
shinyUI(pageWithSidebar( headerPanel('A competency profiling model
for Software engineers'), sidebarPanel(
selectInput("dataset", "Choose Level of competence :",
choices = c("Level 2", "Level 3"), selected = "Level 2"),
radioButtons("selectedCategory","Make your choice of Skills : ", rownames(x), selected = "Professional skills" ),
checkboxGroupInput('selectedLevels', 'Who to include',
names(scores[]), selected="Technical Junior"),
sliderInput("Candidate", "Candidate number:",
min = 1, max = 50, value = 1)),
mainPanel(
tabsetPanel(type="tabs",
tabPanel('Level2/Level3 RCD frame', tableOutput("table")),
tabPanel("Candidates ACD frame ", tableOutput("candidate")),
tabPanel("Radar Plot #1", chartJSRadarOutput("radar", width = "450", height = "300"), width = 7 ),
tabPanel("Radar Plot #2" ,plotOutput("triangle", width = "100%", height = "900px"), width = 7 ),
tabPanel("Clustering Plots",plotOutput("cluster", width = "100%", height = "900px"), width = 7 ),
tabPanel("Correlation Plots",plotOutput("corellation",width =
"100%", height =
"900px"),width = 7 ),
tabPanel("Classification Tree", plotOutput("class",width = "100%", height = "900px"),width = 7))
)
)
)
server.R
function(input, output) {
datasetInput <- reactive({
switch(input$dataset,
"Level 2" = as.matrix(base_level2),
"Level 3" = as.matrix(base_level3)
)
})
output$table <- renderTable({(datasetInput)},rownames=TRUE,striped = TRUE,hover = TRUE, bordered = TRUE)
添加了一些假数据使其工作,修复了 HubertL 在评论中指出的语法错误,并且工作正常:
library(shiny)
library(radarchart)
library(fmsb)
# Fake Data
x <- data.frame(skilz = c("Professional Skills","Technical Skills","Soft Skills"),a = c(1,2,3),b = c(11,12,13),row.names = "skilz")
scores <- c("Technical Junior" = 1,"Technical Senior" = 2)
base_level2 <- data.frame(x = c(1,2,3),y = c(4,5,6),z = c(7,8,9))
base_level3 <- data.frame(x = c(11,12,13),y = c(14,15,16),z = c(17,18,19))
# Define UI for random distribution application
u <- shinyUI(pageWithSidebar(headerPanel('A competency profiling model for Software engineers'),
sidebarPanel(
selectInput("dataset","Choose Level of competence :",
choices = c("Level 2","Level 3"),selected = "Level 2"),
radioButtons("selectedCategory","Make your choice of Skills : ",rownames(x),selected = "Professional skills"),
checkboxGroupInput('selectedLevels','Who to include',
names(scores[]),selected = "Technical Junior"),
sliderInput("Candidate","Candidate number:",
min = 1,max = 50,value = 1)),
mainPanel(
tabsetPanel(type = "tabs",
tabPanel('Level2/Level3 RCD frame',tableOutput("table")),
tabPanel("Candidates ACD frame ",tableOutput("candidate")),
tabPanel("Radar Plot #1",chartJSRadarOutput("radar",width = "450",height = "300"),width = 7),
tabPanel("Radar Plot #2",plotOutput("triangle",width = "100%",height = "900px"),width = 7),
tabPanel("Clustering Plots",plotOutput("cluster",width = "100%",height = "900px"),width = 7),
tabPanel("Correlation Plots",plotOutput("corellation",width = "100%",height =
"900px"),width = 7),tabPanel("Classification Tree",plotOutput("class",width = "100%",height = "900px"),width = 7)))
)
)
s <-
function(input,output) {
datasetInput <- reactive({
switch(input$dataset,
"Level 2" = as.matrix(base_level2),
"Level 3" = as.matrix(base_level3)
)
})
output$table <- renderTable({(datasetInput()) },
rownames = TRUE,striped = TRUE,hover = TRUE,bordered = TRUE)
}
shinyApp( ui=u,server=s )
产量: