Skip to content

Commit

Permalink
Add package prefixes
Browse files Browse the repository at this point in the history
  • Loading branch information
edelarua committed Sep 22, 2023
1 parent 077fa41 commit 893f2de
Show file tree
Hide file tree
Showing 4 changed files with 12 additions and 12 deletions.
6 changes: 3 additions & 3 deletions R/tm_g_pp_adverse_events.R
Original file line number Diff line number Diff line change
Expand Up @@ -54,7 +54,7 @@ template_adverse_events <- function(dataname = "ANL",
dplyr::arrange(dplyr::desc(tox_grade)) %>%
`colnames<-`(get_labels(dataname)$column_labels[vars])

table <- as_listing(
table <- rlistings::as_listing(
table,
key_cols = NULL,
default_formatting = list(all = fmt_config(align = "left"))
Expand Down Expand Up @@ -320,7 +320,7 @@ ui_g_adverse_events <- function(id, ...) {
ns <- shiny::NS(id)
teal.widgets::standard_layout(
output = shiny::div(
htmlOutput(ns("title")),
shiny::htmlOutput(ns("title")),
teal.widgets::get_dt_rows(ns("table"), ns("table_rows")),
DT::DTOutput(outputId = ns("table")),
teal.widgets::plot_with_settings_ui(id = ns("chart"))
Expand Down Expand Up @@ -539,7 +539,7 @@ srv_g_adverse_events <- function(id,
teal.code::eval_code(qenv2, as.expression(calls))
})

output$title <- renderText({
output$title <- shiny::renderText({
paste("<h5><b>Patient ID:", all_q()[["pt_id"]], "</b></h5>")
})

Expand Down
6 changes: 3 additions & 3 deletions R/tm_g_pp_therapy.R
Original file line number Diff line number Diff line change
Expand Up @@ -88,7 +88,7 @@ template_therapy <- function(dataname = "ANL",
get_labels(dataname)$column_labels[c(cmstdy_char, cmendy_char)]
))

therapy_table <- as_listing(
therapy_table <- rlistings::as_listing(
therapy_table,
key_cols = NULL,
default_formatting = list(all = fmt_config(align = "left"))
Expand Down Expand Up @@ -420,7 +420,7 @@ ui_g_therapy <- function(id, ...) {
ns <- shiny::NS(id)
teal.widgets::standard_layout(
output = shiny::div(
htmlOutput(ns("title")),
shiny::htmlOutput(ns("title")),
teal.widgets::get_dt_rows(ns("therapy_table"), ns("therapy_table_rows")),
DT::DTOutput(outputId = ns("therapy_table")),
teal.widgets::plot_with_settings_ui(id = ns("therapy_plot"))
Expand Down Expand Up @@ -659,7 +659,7 @@ srv_g_therapy <- function(id,
teal.code::eval_code(as.expression(my_calls))
})

output$title <- renderText({
output$title <- shiny::renderText({
paste("<h5><b>Patient ID:", all_q()[["pt_id"]], "</b></h5>")
})

Expand Down
6 changes: 3 additions & 3 deletions R/tm_t_pp_basic_info.R
Original file line number Diff line number Diff line change
Expand Up @@ -33,7 +33,7 @@ template_basic_info <- function(dataname = "ANL",
dplyr::select(var, key, value) %>%
dplyr::rename(` ` = var, ` ` = key, ` ` = value)

result <- as_listing(
result <- rlistings::as_listing(
result,
default_formatting = list(all = fmt_config(align = "left"))
)
Expand Down Expand Up @@ -129,7 +129,7 @@ ui_t_basic_info <- function(id, ...) {
ns <- shiny::NS(id)
teal.widgets::standard_layout(
output = shiny::div(
htmlOutput(ns("title")),
shiny::htmlOutput(ns("title")),
DT::DTOutput(outputId = ns("basic_info_table"))
),
encoding = shiny::div(
Expand Down Expand Up @@ -251,7 +251,7 @@ srv_t_basic_info <- function(id,
teal.code::eval_code(as.expression(my_calls))
})

output$title <- renderText({
output$title <- shiny::renderText({
paste("<h5><b>Patient ID:", all_q()[["pt_id"]], "</b></h5>")
})

Expand Down
6 changes: 3 additions & 3 deletions R/tm_t_pp_laboratory.R
Original file line number Diff line number Diff line change
Expand Up @@ -55,7 +55,7 @@ template_laboratory <- function(dataname = "ANL",
tidyr::pivot_wider(names_from = INDEX, values_from = aval_anrind) %>%
dplyr::mutate(param_char := clean_description(.data[[param_char]]))

labor_table_raw <- as_listing(
labor_table_raw <- rlistings::as_listing(
labor_table_raw,
key_cols = NULL,
default_formatting = list(all = fmt_config(align = "left"))
Expand Down Expand Up @@ -224,7 +224,7 @@ ui_g_laboratory <- function(id, ...) {
ns <- shiny::NS(id)
teal.widgets::standard_layout(
output = shiny::div(
htmlOutput(ns("title")),
shiny::htmlOutput(ns("title")),
DT::DTOutput(outputId = ns("lab_values_table"))
),
encoding = shiny::div(
Expand Down Expand Up @@ -416,7 +416,7 @@ srv_g_laboratory <- function(id,
teal.code::eval_code(as.expression(labor_calls))
})

output$title <- renderText({
output$title <- shiny::renderText({
paste("<h5><b>Patient ID:", all_q()[["pt_id"]], "</b></h5>")
})

Expand Down

0 comments on commit 893f2de

Please sign in to comment.