我使用ShinyBS包制作弹出模式。当我点击视图时,会弹出一个窗口。弹出模式内部是DT包生成的数据表。我想选择行并显示我在弹出窗口底部选择的行的ID号。但是,我不知道正确的"输入"得到它的名字。 以下是我的示例代码。
#rm(list = ls())
library(DT)
library(shiny)
library(shinyBS)
library(shinyjs)
library(shinydashboard)
# This function will create the buttons for the datatable, they will be unique
shinyInput <- function(FUN, len, id, ...) {inputs <- character(len)
for (i in seq_len(len)) {
inputs[i] <- as.character(FUN(paste0(id, i), ...))}
inputs
}
ui <- dashboardPage(
dashboardHeader(title = "Simple App"),
dashboardSidebar(
sidebarMenu(id = "tabs",
menuItem("Menu Item 1", tabName = "one", icon = icon("dashboard"))
)
),
dashboardBody(
tabItems(
tabItem(tabName = "one",h2("Datatable Modal Popup"),
DT::dataTableOutput('my_table'),uiOutput("popup")
)
)
)
)
server <- function(input, output, session) {
my_data <- reactive({
testdata <- cars
as.data.frame(
cbind(
View = shinyInput(actionButton,
nrow(testdata),
'button_',
label = "View",
onclick = 'Shiny.onInputChange(\"select_button\", this.id)' ),
testdata))
})
output$my_table <- DT::renderDataTable(my_data(),selection = 'single',options = list(searching = FALSE,pageLength = 10),server = FALSE, escape = FALSE,rownames= FALSE)
SelectedRow <- eventReactive(input$select_button,{
as.numeric(strsplit(input$select_button, "_")[[1]][2])
})
observeEvent(input$select_button, {
toggleModal(session, "modalExample", "open")
})
DataRow <- eventReactive(input$select_button,{
iris
})
## I guess my input name is not right
output$y11 = renderPrint(input$popup_rows_selected)
output$popup <- renderUI({
bsModal("modalExample", paste0("Data for Row Number: ",SelectedRow()), "", size = "large",
column(12,
DT::renderDataTable(DataRow()),
h4("The following didn't show when I select the rows"),
verbatimTextOutput('y11')
)
)
})
}
shinyApp(ui, server)
答案 0 :(得分:3)
这样可以工作,事件必须绑定到表id,你有它为ui元素(可以包含多个东西)
#rm(list = ls())
library(DT)
library(shiny)
library(shinyBS)
library(shinyjs)
library(shinydashboard)
# This function will create the buttons for the datatable, they will be unique
shinyInput <- function(FUN, len, id, ...) {inputs <- character(len)
for (i in seq_len(len)) {
inputs[i] <- as.character(FUN(paste0(id, i), ...))}
inputs
}
ui <- dashboardPage(
dashboardHeader(title = "Simple App"),
dashboardSidebar(
sidebarMenu(id = "tabs",
menuItem("Menu Item 1", tabName = "one", icon = icon("dashboard"))
)
),
dashboardBody(
tabItems(
tabItem(tabName = "one",h2("Datatable Modal Popup"),
DT::dataTableOutput('my_table'),uiOutput("popup")
)
)
)
)
server <- function(input, output, session) {
my_data <- reactive({
testdata <- cars
as.data.frame(
cbind(
View = shinyInput(actionButton,
nrow(testdata),
'button_',
label = "View",
onclick = 'Shiny.onInputChange(\"select_button\", this.id)' ),
testdata))
})
output$my_table <- DT::renderDataTable(my_data(),selection = 'single',options = list(searching = FALSE,pageLength = 10),server = FALSE, escape = FALSE,rownames= FALSE)
SelectedRow <- eventReactive(input$select_button,{
as.numeric(strsplit(input$select_button, "_")[[1]][2])
})
observeEvent(input$select_button, {
toggleModal(session, "modalExample", "open")
})
DataRow <- eventReactive(input$select_button,{
iris
})
## I guess my input name is not right
output$y11 = renderPrint(input$my_test_rows_selected)
output$my_test <- DT::renderDataTable(DataRow())
output$popup <- renderUI({
bsModal("modalExample", paste0("Data for Row Number: ",SelectedRow()), "", size = "large",
column(12,
dataTableOutput("my_test"),
h4("The following didn't show when I select the rows"),
verbatimTextOutput('y11')
)
)
})
}
shinyApp(ui, server)