在闪亮的应用程序中单击网络节点后,更新数据表

时间:2018-09-24 13:08:13

标签: r shiny

我有一个简单的闪亮应用程序,它显示一个网络,在下表中,您可以通过边缘和边缘名称看到节点之间的所有连接。我想更新数据表以在单击节点时仅显示选定的节点信息。例如,当我单击节点“ articaine”时,表中仅显示“ articaine”连接。

#dataset
id<-c("articaine","benzocaine","etho","esli")
  label<-c("articaine","benzocaine","etho","esli")
  node<-data.frame(id,label)

  from<-c("articaine","articaine","articaine","articaine","articaine","articaine","articaine","articaine","articaine")
  to<-c("benzocaine","etho","esli","benzocaine","etho","esli","benzocaine","etho","esli")
  title<-c("SCN1A","SCN1A","SCN1A","SCN2A","SCN2A","SCN2A","SCN3A","SCN3A","SCN3A")

  edge<-data.frame(from,to,title)

#app

#ui.r
library(igraph)
library(visNetwork)
library(dplyr)
library(shiny)
library(shinythemes)
library(DT)

ui <- fluidPage(theme = shinytheme("cerulean"),  # Specify that the Cerulean Shiny theme/template should be used

                # Generate Title Panel at the top of the app
                titlePanel("Network Visualization App"),  

                # Render as a sidebarLayout. Shiny expects that a sidebarPanel() function and a mainPanel() function are present.

                sidebarLayout(

                  # Sidebar section. Can set the width of the sidebar for any value ranging from 1 to 12.

                  sidebarPanel(             
                  ), # End of the sidebar panel code

                  # Define the main panel
                  mainPanel(

                    h3("Network Visualization"),

                    # Plot the network diagram within the main panel. 
                    # Note that visNetworkOutput is not a Shiny package function, but a visNetwork package function.
                    visNetworkOutput("plot2"),
                    fluidRow(
                      DTOutput('tbl')
                    )

                    ) # End of main panel code

                )
)
#server.r
library(igraph)
library(visNetwork)
library(dplyr)
library(shiny)
library(shinythemes)

server <- function (input, output, session){


  # Use the renderVisNetwork() function to render the network data.

  output$plot2 <- renderVisNetwork({
    visNetwork(nodes = node,edge)%>% 


      visOptions(highlightNearest=T, nodesIdSelection = T) %>%

      # Specify that hover interaction and on-screen button navigations are active
      visInteraction(hover = T, navigationButtons = T) %>%

      visIgraphLayout()

  })
  output$tbl = renderDT(
    edge, options = list(lengthChange = FALSE)
  )
}

2 个答案:

答案 0 :(得分:1)

我使它像:

#ui.r
    library(igraph)
    library(visNetwork)
    library(dplyr)
    library(shiny)
    library(shinythemes)
    library(DT)

    ui <- fluidPage(theme = shinytheme("cerulean"),  # Specify that the Cerulean Shiny theme/template should be used

                    # Generate Title Panel at the top of the app
                    titlePanel("Network Visualization App"),  

                    # Render as a sidebarLayout. Shiny expects that a sidebarPanel() function and a mainPanel() function are present.

                    sidebarLayout(

                      # Sidebar section. Can set the width of the sidebar for any value ranging from 1 to 12.

                      sidebarPanel(             
                      ), # End of the sidebar panel code

                      # Define the main panel
                      mainPanel(

                        h3("Network Visualization"),

                        # Plot the network diagram within the main panel. 
                        # Note that visNetworkOutput is not a Shiny package function, but a visNetwork package function.
                        visNetworkOutput("plot2"),

                          dataTableOutput("nodes_data_from_shiny"),
                          uiOutput('dt_UI')


                        ) # End of main panel code

                    )
    )
    #server.r
    library(igraph)
    library(visNetwork)
    library(dplyr)
    library(shiny)
    library(shinythemes)

    server <- function (input, output, session){


      # Use the renderVisNetwork() function to render the network data.

      output$plot2 <- renderVisNetwork({

        visNetwork(nodes,edge)%>% 
          visEvents(select = "function(nodes) {
                    Shiny.onInputChange('current_node_id', nodes.nodes);
                    ;}")%>%

          visOptions(highlightNearest=T, nodesIdSelection = T) %>%

          # Specify that hover interaction and on-screen button navigations are active
          visInteraction(hover = T, navigationButtons = T) %>%

          visIgraphLayout()

      })

      myNode <- reactiveValues(selected = '')

      observeEvent(input$current_node_id, {
        myNode$selected <<- input$current_node_id
      })
      output$table <- renderDataTable({
        edge[which(myNode$selected == edge$from),]
      })
      output$dt_UI <- renderUI({
        if(nrow(edge[which(myNode$selected == edge$from),])!=0){
          dataTableOutput('table')
        } else{}

      })
    }

答案 1 :(得分:1)

这里是一个替代解决方案,它允许选择多个节点,并且不使用observe,但与Firmo23发布的解决方案相似。我无法过滤“到”或“来自”列中具有选定节点的任何边缘,因为我不清楚您要的是什么。

此外,还对布局发表了一些评论:不需要侧边栏和主面板布局。我倾向于使用fluidRow()column()的嵌套来显式定义面板,这在下面完成。

library(igraph)
library(visNetwork)
library(dplyr)
library(shiny)
library(shinythemes)
library(DT)

#dataset
id<-c("articaine","benzocaine","etho","esli")
label<-c("articaine","benzocaine","etho","esli")
node<-data.frame(id,label)

from<-c("articaine","articaine","articaine",
        "articaine","articaine","articaine",
        "articaine","articaine","articaine")
to<-c("benzocaine","etho","esli","benzocaine","etho","esli","benzocaine","etho","esli")
title<-c("SCN1A","SCN1A","SCN1A","SCN2A","SCN2A","SCN2A","SCN3A","SCN3A","SCN3A")

edge<-data.frame(from,to,title)


#app

ui <- fluidPage(

  # Generate Title Panel at the top of the app
  titlePanel("Network Visualization App"),

  fluidRow(
    column(width = 6,
           DTOutput('tbl')),
    column(width = 6,
           visNetworkOutput("network")) #note that column widths in a fluidRow should sum to 12
  ),
  fluidRow(column(width = 6), 
           column(width=6, "Click and hold nodes for a second to select additional nodes.")
  )

) #end of fluidPage


server <- function (input, output, session){

  output$network <- renderVisNetwork({
    visNetwork(nodes = node,edge) %>% 
      visOptions(highlightNearest=TRUE, 
                 nodesIdSelection = TRUE) %>%
      #allow for long click to select additional nodes
      visInteraction(multiselect = TRUE) %>%
      visIgraphLayout() %>% 

      #Use visEvents to turn set input$current_node_selection to list of selected nodes
      visEvents(select = "function(nodes) {
                Shiny.onInputChange('current_node_selection', nodes.nodes);
                ;}")

  })

  #render data table restricted to selected nodes
  output$tbl <- renderDT(
    edge %>% 
      filter((to %in% input$current_node_selection)|(from %in% input$current_node_selection)),
    options = list(lengthChange = FALSE)
  )

}

shinyApp(ui, server)

reprex package(v0.2.1)于2018-09-24创建