Skip to content
Merged
Show file tree
Hide file tree
Changes from 4 commits
Commits
File filter

Filter by extension

Filter by extension

Conversations
Failed to load comments.
Loading
Jump to
Jump to file
Failed to load files.
Loading
Diff view
Diff view
16 changes: 9 additions & 7 deletions R/tm_g_pp_adverse_events.R
Original file line number Diff line number Diff line change
Expand Up @@ -428,14 +428,16 @@ ui_g_adverse_events <- function(id, ...) {
)
),
ui_decorate_teal_data(ns("d_plot"), decorators = select_decorators(ui_args$decorators, "plot")),
bslib::accordion_panel(
title = "Plot settings",
bslib::accordion(
open = TRUE,
teal.widgets::optionalSliderInputValMinMax(
ns("font_size"),
"Font Size",
ui_args$font_size,
ticks = FALSE, step = 1
bslib::accordion_panel(
title = "Plot settings",
teal.widgets::optionalSliderInputValMinMax(
ns("font_size"),
"Font Size",
ui_args$font_size,
ticks = FALSE, step = 1
)
)
)
),
Expand Down
18 changes: 10 additions & 8 deletions R/tm_g_pp_patient_timeline.R
Original file line number Diff line number Diff line change
Expand Up @@ -701,15 +701,17 @@ ui_g_patient_timeline <- function(id, ...) {
)
),
ui_decorate_teal_data(ns("decorator"), decorators = select_decorators(ui_args$decorators, "plot")),
bslib::accordion_panel(
title = "Plot settings",
bslib::accordion(
open = TRUE,
teal.widgets::optionalSliderInputValMinMax(
ns("font_size"),
"Font Size",
ui_args$font_size,
ticks = FALSE,
step = 1
bslib::accordion_panel(
title = "Plot settings",
teal.widgets::optionalSliderInputValMinMax(
ns("font_size"),
"Font Size",
ui_args$font_size,
ticks = FALSE,
step = 1
)
)
)
),
Expand Down
18 changes: 10 additions & 8 deletions R/tm_g_pp_therapy.R
Original file line number Diff line number Diff line change
Expand Up @@ -530,15 +530,17 @@ ui_g_therapy <- function(id, ...) {
is_single_dataset = is_single_dataset_value
),
ui_decorate_teal_data(ns("d_plot"), decorators = select_decorators(ui_args$decorators, "plot")),
bslib::accordion_panel(
title = "Plot settings",
bslib::accordion(
open = TRUE,
teal.widgets::optionalSliderInputValMinMax(
ns("font_size"),
"Font Size",
ui_args$font_size,
ticks = FALSE,
step = 1
bslib::accordion_panel(
title = "Plot settings",
teal.widgets::optionalSliderInputValMinMax(
ns("font_size"),
"Font Size",
ui_args$font_size,
ticks = FALSE,
step = 1
)
)
)
),
Expand Down
12 changes: 7 additions & 5 deletions R/tm_g_pp_vitals.R
Original file line number Diff line number Diff line change
Expand Up @@ -394,12 +394,14 @@ ui_g_vitals <- function(id, ...) {
is_single_dataset = is_single_dataset_value
),
ui_decorate_teal_data(ns("decorator"), decorators = select_decorators(ui_args$decorators, "plot")),
bslib::accordion_panel(
title = "Plot settings",
bslib::accordion(
open = TRUE,
teal.widgets::optionalSliderInputValMinMax(
ns("font_size"), "Font Size", ui_args$font_size,
ticks = FALSE, step = 1
bslib::accordion_panel(
title = "Plot settings",
teal.widgets::optionalSliderInputValMinMax(
ns("font_size"), "Font Size", ui_args$font_size,
ticks = FALSE, step = 1
)
)
)
),
Expand Down
70 changes: 36 additions & 34 deletions R/tm_t_binary_outcome.R
Original file line number Diff line number Diff line change
Expand Up @@ -721,44 +721,46 @@ ui_t_binary_outcome <- function(id, ...) {
checkboxInput(ns("add_total"), "Add All Patients column", value = a$add_total)
),
ui_decorate_teal_data(ns("decorator"), decorators = select_decorators(a$decorators, "table")),
bslib::accordion_panel(
"Additional table settings",
bslib::accordion(
open = TRUE,
teal.widgets::optionalSelectInput(
inputId = ns("prop_ci_method"),
label = "Method for Proportion CI",
choices = c(
"Wald, without correction" = "wald",
"Wald, with correction" = "waldcc",
"Clopper-Pearson" = "clopper-pearson",
"Wilson" = "wilson",
"Wilson, with correction" = "wilsonc",
"Jeffreys" = "jeffreys",
"Agresti-Coull" = "agresti-coull"
bslib::accordion_panel(
"Additional table settings",
teal.widgets::optionalSelectInput(
inputId = ns("prop_ci_method"),
label = "Method for Proportion CI",
choices = c(
"Wald, without correction" = "wald",
"Wald, with correction" = "waldcc",
"Clopper-Pearson" = "clopper-pearson",
"Wilson" = "wilson",
"Wilson, with correction" = "wilsonc",
"Jeffreys" = "jeffreys",
"Agresti-Coull" = "agresti-coull"
),
selected = a$control$global$method,
multiple = FALSE,
fixed = FALSE
),
selected = a$control$global$method,
multiple = FALSE,
fixed = FALSE
),
teal.widgets::optionalSelectInput(
inputId = ns("conf_level"),
label = "Confidence Level",
a$conf_level$choices,
a$conf_level$selected,
multiple = FALSE,
fixed = a$conf_level$fixed
teal.widgets::optionalSelectInput(
inputId = ns("conf_level"),
label = "Confidence Level",
a$conf_level$choices,
a$conf_level$selected,
multiple = FALSE,
fixed = a$conf_level$fixed
),
bslib::input_switch(
id = ns("show_rsp_cat"),
label = "Show All Response Categories",
value = ifelse(a$rsp_table, TRUE, FALSE)
)
),
bslib::input_switch(
id = ns("show_rsp_cat"),
label = "Show All Response Categories",
value = ifelse(a$rsp_table, TRUE, FALSE)
teal.transform::data_extract_ui(
id = ns("aval_var"),
label = "Analysis Variable",
data_extract_spec = a$aval_var,
is_single_dataset = is_single_dataset_value
)
),
teal.transform::data_extract_ui(
id = ns("aval_var"),
label = "Analysis Variable",
data_extract_spec = a$aval_var,
is_single_dataset = is_single_dataset_value
)
),
pre_output = a$pre_output,
Expand Down
70 changes: 36 additions & 34 deletions R/tm_t_events.R
Original file line number Diff line number Diff line change
Expand Up @@ -636,42 +636,44 @@ ui_t_events_byterm <- function(id, ...) {
),
checkboxInput(ns("add_total"), "Add All Patients columns", value = a$add_total),
ui_decorate_teal_data(ns("decorator"), decorators = select_decorators(a$decorators, "table")),
bslib::accordion_panel(
"Additional table settings",
bslib::accordion(
open = TRUE,
checkboxInput(
ns("drop_arm_levels"),
label = "Drop columns not in filtered analysis dataset",
value = a$drop_arm_levels
),
selectInput(
inputId = ns("sort_criteria"),
label = "Sort Criteria",
choices = c(
"Decreasing frequency" = "freq_desc",
"Alphabetically" = "alpha"
bslib::accordion_panel(
"Additional table settings",
checkboxInput(
ns("drop_arm_levels"),
label = "Drop columns not in filtered analysis dataset",
value = a$drop_arm_levels
),
selected = a$sort_criteria,
multiple = FALSE
),
helpText(tags$strong("Pruning Options:")),
numericInput(
inputId = ns("prune_freq"),
label = "Minimum Incidence Rate(%) in any of the treatment groups",
value = a$prune_freq,
min = 0,
max = 100,
step = 1,
width = "100%"
),
numericInput(
inputId = ns("prune_diff"),
label = "Minimum Difference Rate(%) between any of the treatment groups",
value = a$prune_diff,
min = 0,
max = 100,
step = 1,
width = "100%"
selectInput(
inputId = ns("sort_criteria"),
label = "Sort Criteria",
choices = c(
"Decreasing frequency" = "freq_desc",
"Alphabetically" = "alpha"
),
selected = a$sort_criteria,
multiple = FALSE
),
helpText(tags$strong("Pruning Options:")),
numericInput(
inputId = ns("prune_freq"),
label = "Minimum Incidence Rate(%) in any of the treatment groups",
value = a$prune_freq,
min = 0,
max = 100,
step = 1,
width = "100%"
),
numericInput(
inputId = ns("prune_diff"),
label = "Minimum Difference Rate(%) between any of the treatment groups",
value = a$prune_diff,
min = 0,
max = 100,
step = 1,
width = "100%"
)
)
)
),
Expand Down
26 changes: 15 additions & 11 deletions R/tm_t_glm_counts.R
Original file line number Diff line number Diff line change
Expand Up @@ -211,17 +211,21 @@ ui_t_glm_counts <- function(id, ...) {
)
)

table_settings <- bslib::accordion_panel(
"Additional table settings",
teal.widgets::optionalSelectInput(
inputId = ns("conf_level"),
label = "Confidence Level",
choices = c(0.8, 0.9, 0.95),
selected = 0.95,
multiple = FALSE,
fixed = FALSE
),
table_settings <- shiny::tagList(
ui_decorate_teal_data(ns("decorator"), decorators = select_decorators(a$decorators, "table")),
bslib::accordion(
bslib::accordion_panel(
"Additional table settings",
teal.widgets::optionalSelectInput(
inputId = ns("conf_level"),
label = "Confidence Level",
choices = c(0.8, 0.9, 0.95),
selected = 0.95,
multiple = FALSE,
fixed = FALSE
),
)
)
)

teal.widgets::standard_layout(
Expand Down Expand Up @@ -269,7 +273,7 @@ ui_t_glm_counts <- function(id, ...) {
"Rate method",
choices = a$rate_mean_method
),
table_settings,
table_settings
),
pre_output = a$pre_output,
post_output = a$post_output
Expand Down
Loading
Loading