Skip to content

Commit

Permalink
add logger::log_shiny_input_changes to modules
Browse files Browse the repository at this point in the history
  • Loading branch information
m7pr committed May 9, 2024
1 parent aa30a5d commit d7e6bf1
Show file tree
Hide file tree
Showing 14 changed files with 14 additions and 1 deletion.
2 changes: 1 addition & 1 deletion DESCRIPTION
Original file line number Diff line number Diff line change
Expand Up @@ -43,6 +43,7 @@ Imports:
forcats,
hermes (>= 1.7.1),
lifecycle,
logger (>= 0.3.0),
rtables (>= 0.5.1),
shinyRadioMatrix (>= 0.2.1),
shinyWidgets,
Expand All @@ -61,7 +62,6 @@ Suggests:
dplyr,
globals,
knitr,
logger (>= 0.2.0),
matrixStats,
rmarkdown,
rvest,
Expand Down
1 change: 1 addition & 0 deletions R/adtteSpec.R
Original file line number Diff line number Diff line change
Expand Up @@ -263,6 +263,7 @@ adtteSpecServer <- function(id, # nolint
checkmate::assert_class(shiny::isolate(data()), "teal_data")

moduleServer(id, function(input, output, session) {
logger::log_shiny_input_changes(input, namespace = "teal.modules.hermes")
# Join ADTTE with gene data.
adtte_joined <- reactive({
experiment_data <- experiment_data()
Expand Down
1 change: 1 addition & 0 deletions R/assaySpec.R
Original file line number Diff line number Diff line change
Expand Up @@ -106,6 +106,7 @@ assaySpecServer <- function(id, # nolint
assert_character(exclude_assays, any.missing = FALSE)

moduleServer(id, function(input, output, session) {
logger::log_shiny_input_changes(input, namespace = "teal.modules.hermes")
# When the assay names change, update the choices for assay.
choices <- reactive({
assays <- assays()
Expand Down
1 change: 1 addition & 0 deletions R/barplot.R
Original file line number Diff line number Diff line change
Expand Up @@ -132,6 +132,7 @@ srv_g_barplot <- function(id,
checkmate::assert_class(shiny::isolate(data()), "teal_data")
assert_flag(.test)
moduleServer(id, function(input, output, session) {
logger::log_shiny_input_changes(input, namespace = "teal.modules.hermes")
output$experiment_ui <- renderUI({
experimentSpecInput(session$ns("experiment"), data, mae_name)
})
Expand Down
1 change: 1 addition & 0 deletions R/boxplot.R
Original file line number Diff line number Diff line change
Expand Up @@ -128,6 +128,7 @@ srv_g_boxplot <- function(id,
checkmate::assert_class(shiny::isolate(data()), "teal_data")

moduleServer(id, function(input, output, session) {
logger::log_shiny_input_changes(input, namespace = "teal.modules.hermes")
output$experiment_ui <- renderUI({
experimentSpecInput(session$ns("experiment"), data, mae_name)
})
Expand Down
1 change: 1 addition & 0 deletions R/experimentSpec.R
Original file line number Diff line number Diff line change
Expand Up @@ -221,6 +221,7 @@ experimentSpecServer <- function(id, # nolint
assert_flag(with_mae_col_data)

moduleServer(id, function(input, output, session) {
logger::log_shiny_input_changes(input, namespace = "teal.modules.hermes")
# When the filtered data set of the chosen experiment changes, update the
# experiment data object.
data_return <- reactive({
Expand Down
1 change: 1 addition & 0 deletions R/forestplot.R
Original file line number Diff line number Diff line change
Expand Up @@ -155,6 +155,7 @@ srv_g_forest_tte <- function(id,
checkmate::assert_class(shiny::isolate(data()), "teal_data")

moduleServer(id, function(input, output, session) {
logger::log_shiny_input_changes(input, namespace = "teal.modules.hermes")
output$experiment_ui <- renderUI({
experimentSpecInput(session$ns("experiment"), data, mae_name)
})
Expand Down
1 change: 1 addition & 0 deletions R/geneSpec.R
Original file line number Diff line number Diff line change
Expand Up @@ -300,6 +300,7 @@ geneSpecServer <- function(id, # nolint
assert_character(label_modal_footer)

moduleServer(id, function(input, output, session) {
logger::log_shiny_input_changes(input, namespace = "teal.modules.hermes")
# The `reactiveValues` object for storing current gene text input.
# This will also be a data frame with id and name columns.
parsed_genes <- reactiveVal(NULL, label = "Parsed genes")
Expand Down
1 change: 1 addition & 0 deletions R/km.R
Original file line number Diff line number Diff line change
Expand Up @@ -159,6 +159,7 @@ srv_g_km <- function(id,
checkmate::assert_class(shiny::isolate(data()), "teal_data")

moduleServer(id, function(input, output, session) {
logger::log_shiny_input_changes(input, namespace = "teal.modules.hermes")
output$experiment_ui <- renderUI({
experimentSpecInput(session$ns("experiment"), data, mae_name)
})
Expand Down
1 change: 1 addition & 0 deletions R/pca.R
Original file line number Diff line number Diff line change
Expand Up @@ -168,6 +168,7 @@ srv_g_pca <- function(id,
checkmate::assert_class(shiny::isolate(data()), "teal_data")

moduleServer(id, function(input, output, session) {
logger::log_shiny_input_changes(input, namespace = "teal.modules.hermes")
output$experiment_ui <- renderUI({
experimentSpecInput(session$ns("experiment"), data, mae_name)
})
Expand Down
1 change: 1 addition & 0 deletions R/quality.R
Original file line number Diff line number Diff line change
Expand Up @@ -211,6 +211,7 @@ srv_g_quality <- function(id,
checkmate::assert_class(shiny::isolate(data()), "teal_data")

moduleServer(id, function(input, output, session) {
logger::log_shiny_input_changes(input, namespace = "teal.modules.hermes")
output$experiment_ui <- renderUI({
experimentSpecInput(session$ns("experiment"), data, mae_name)
})
Expand Down
1 change: 1 addition & 0 deletions R/sampleVarSpec.R
Original file line number Diff line number Diff line change
Expand Up @@ -288,6 +288,7 @@ sampleVarSpecServer <- function(id, # nolint
assert_string(label_modal_title)

moduleServer(id, function(input, output, session) {
logger::log_shiny_input_changes(input, namespace = "teal.modules.hermes")
to_observe <- reactive({
list(experiment_name(), original_data())
})
Expand Down
1 change: 1 addition & 0 deletions R/scatterplot.R
Original file line number Diff line number Diff line change
Expand Up @@ -130,6 +130,7 @@ srv_g_scatterplot <- function(id,
checkmate::assert_class(shiny::isolate(data()), "teal_data")

moduleServer(id, function(input, output, session) {
logger::log_shiny_input_changes(input, namespace = "teal.modules.hermes")
output$experiment_ui <- renderUI({
experimentSpecInput(session$ns("experiment"), data, mae_name)
})
Expand Down
1 change: 1 addition & 0 deletions R/volcanoplot.R
Original file line number Diff line number Diff line change
Expand Up @@ -116,6 +116,7 @@ srv_g_volcanoplot <- function(id,
checkmate::assert_class(shiny::isolate(data()), "teal_data")

moduleServer(id, function(input, output, session) {
logger::log_shiny_input_changes(input, namespace = "teal.modules.hermes")
output$experiment_ui <- renderUI({
experimentSpecInput(session$ns("experiment"), data, mae_name)
})
Expand Down

0 comments on commit d7e6bf1

Please sign in to comment.