Skip to content

Commit

Permalink
Patch papo message checker to use new afm[["data"]] field.
Browse files Browse the repository at this point in the history
  • Loading branch information
ml-ebs-ext committed Nov 29, 2024
1 parent e0a8eda commit f56d4aa
Show file tree
Hide file tree
Showing 2 changed files with 5 additions and 2 deletions.
6 changes: 4 additions & 2 deletions R/mod_boxplot.R
Original file line number Diff line number Diff line change
Expand Up @@ -200,7 +200,7 @@ boxplot_UI <- function(id) { # nolint
#' 1 record per subject per parameter per analysis visit.
#'
#' It must contain, at least, the columns passed in the parameters, `subjid_var`, `cat_var`, `par_var`,
#' `visit_var` and `value_var`. The values of these variables are as described
#' `visit_var` and `value_vars`. The values of these variables are as described
#' in the CDISC standard for the variables USUBJID, PARCAT, PARAM, AVISIT and AVAL.
#'
#' ### group_dataset
Expand Down Expand Up @@ -851,7 +851,9 @@ mod_boxplot <- C_module(mod_boxplot, check_mod_boxplot)
#' @describeIn mod_boxplot Boxplot wrapper when its output is fed into papo module
#' @export
mod_boxplot_papo <- function(...) {
mod_boxplot(..., server_wrapper_func = function(x) list(subj_id = x))
args <- list(...)
args[["server_wrapper_func"]] <- function(x) list(subj_id = x)
do.call(mod_boxplot, args)
}

# Data manipulation
Expand Down
1 change: 1 addition & 0 deletions tests/testthat/setup.R
Original file line number Diff line number Diff line change
Expand Up @@ -95,6 +95,7 @@ test_communication_with_papo <- function(mod, data, trigger_input_id) {
datasets <- shiny::reactive(data)

afmm <- list(
data = list(DS = data),
unfiltered_dataset = datasets,
filtered_dataset = datasets,
module_output = function() list(),
Expand Down

0 comments on commit f56d4aa

Please sign in to comment.