Modules within modules. Graph in other modules

I am trying to put some graph modules inside another module. Not working at the moment though. I imagine that this isn't the way to do it. Any ideas on how it should be done?

library(shiny)
library(tidyverse)
library(palmerpenguins)

# modules -----------------------------------------------------------------

# module that creates graphs
graph_ui <- function(id) {
  ns <- NS(id)
  plotOutput(ns("graph"))
}

# ui that brings in graphs from other module
outer_ui <- function(id) {
  ns <- NS(id)
  tagList(
    "some text - would contain other objects too, not just graphs",
    uiOutput(ns("graph1")), # output from renderUI from graph server
    uiOutput(ns("graph2")) # output from renderUI from graph server
  )
}

# creates graphs
graph_server <- function(id, xcat, ycat) {
  moduleServer(id, function(input, output, session) {
    
      output$graph <- renderPlot({
        
        ggplot(penguins, aes(.data[[xcat]], .data[[ycat]], col = sex)) +
          geom_point()
      })
    }
  )
}

# brings in graphs
outer_server <- function(id, plot1, plot2) {
  moduleServer(
    id, function(input, output, session) {
      output$graph1 <- renderUI(graph_server("inner1")) # from graph server
      output$graph2 <- renderUI(graph_server("inner2")) # from graph server
      
    }
  )
}

# app ---------------------------------------------------------------------
ui <- fluidPage(
  outer_ui("mod1")
)

server <- function(input, output, session) {
  
  # graphs
  graph_server("inner1", xcat = "bill_length_mm", ycat = "bill_depth_mm")
  graph_server("inner2", xcat = "flipper_length_mm", ycat = "bill_depth_mm")
  
  # brings graphs in to display
  outer_server("mod1",
               graph_server$inner1, # from graph server
               graph_server$inner2) # from graph server
}
shinyApp(ui, server)

Hey,

Please see my answer at r - Shiny modules inside other modules - Stack Overflow

Cheers,
Colin

1 Like

This topic was automatically closed 7 days after the last reply. New replies are no longer allowed.

If you have a query related to it or one of the replies, start a new topic and refer back with a link.