Query from library "esquisse":

Query from library "esquisse":
I tried to include the "esquisse" in shiny_material in the plot options: "Facet Scales", "Positions", "Flip coordinates" options are not working. Kindly guide me a way out.
Screenshots attached.

Options working in shiny when I try executing the code:
library(shiny)
library(esquisse)
ui <- fluidPage(
tags$h1("Use esquisse as a Shiny module"),
radioButtons(
inputId = "data",
label = "Data to use:",
choices = c("iris", "churn_data_raw"),
inline = TRUE
),
tags$div(
style = "height: 700px;", # needs to be in fixed height container
esquisserUI(
id = "esquisse",
header = FALSE, # dont display gadget title
choose_data = FALSE # dont display button to change data
)
)
)
server <- function(input, output, session) {
data_r <- reactiveValues(data = iris, name = "iris")
observeEvent(input$data, {
if (input$data == "iris") {
data_r$data <- iris
data_r$name <- "iris"
} else {
data_r$data <- churn_data_raw
data_r$name <- "churn_data_raw"
}
})
callModule(module = esquisserServer, id = "esquisse", data = data_r)
}
shinyApp(ui, server)

Options not working in shiny_material when I try executing the code:

library(shiny)
library(shinymaterial)
library(esquisse)
ui <- material_page(
radioButtons(
inputId = "data",
label = "Data to use:",
choices = c("iris", "churn_data_raw"),
inline = TRUE
),
tags$div(
style = "height: 700px;", # needs to be in fixed height container
esquisserUI(
id = "esquisse",
header = FALSE, # dont display gadget title
choose_data = FALSE # dont display button to change data
)
)
)
server <- function(input, output, session) {
data_r <- reactiveValues(data = iris, name = "iris")
observeEvent(input$data, {
if (input$data == "iris") {
data_r$data <- iris
data_r$name <- "iris"
} else {
data_r$data <- churn_data_raw
data_r$name <- "churn_data_raw"
}
})
callModule(module = esquisserServer, id = "esquisse", data = data_r)
}
shinyApp(ui, server)

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