Custom unlist function
Description
Unlist a list, but retain NULL as 'NULL' or NA.
Usage
.unlist_keep_nulls(lst, null_placeholder = "NULL", recursive = FALSE)
Exposure-Adjusted Incidence Rate
Description
Statistical/Analysis Function for presenting Exposure-Adjusted Incidence Rate summary data
Usage
s_eair100_levii_j(
levii,
df,
.df_row,
.var,
.alt_df_full = NULL,
id = "USUBJID",
diff = FALSE,
conf_level = 0.95,
trt_var = NULL,
ctrl_grp = NULL,
cur_trt_grp = NULL,
inriskdiffcol = FALSE,
fup_var,
occ_var,
occ_dy
)
a_eair100_j(
df,
labelstr = NULL,
.var,
.df_row,
.spl_context,
.alt_df_full = NULL,
id = "USUBJID",
drop_levels = FALSE,
riskdiff = TRUE,
ref_path = NULL,
.stats = c("eair"),
.formats = NULL,
.labels = NULL,
.indent_mods = NULL,
na_str = rep("NA", 3),
conf_level = 0.95,
fup_var,
occ_var,
occ_dy
)
Arguments
levii
(string)
the specific level of the variable to calculate EAIR for.
df
(data.frame)
data set containing all analysis variables.
.df_row
(data.frame)
data frame across all of the columns for the given row split.
.var
(string)
variable name for analysis.
.alt_df_full
(dataframe)
denominator dataset for calculations.
id
(string)
subject variable name.
diff
(logical)
if TRUE, risk difference calculations will be performed.
conf_level
(proportion)
confidence level of the interval.
trt_var
(string)
treatment variable name.
ctrl_grp
(string)
control group value.
cur_trt_grp
(string)
current treatment group value.
inriskdiffcol
(logical)
flag indicating if the function is called within a risk difference column.
fup_var
(string)
variable name for follow-up time.
occ_var
(string)
variable name for occurrence.
occ_dy
(string)
variable name for occurrence day.
labelstr
(string)
label string for the row.
.spl_context
(data.frame)
gives information about ancestor split states.
drop_levels
(logical)
if TRUE, non-observed levels will not be included.
riskdiff
(logical)
if TRUE, risk difference calculations will be performed.
ref_path
(string)
column path specifications for the control group.
.stats
(character)
statistics to select for the table.
.formats
(named 'character' or 'list')
formats for the statistics.
.labels
(named 'character')
labels for the statistics.
.indent_mods
(named integer)
indent modifiers for the labels.
na_str
(string)
string used to replace all NA or empty values in the output.
Value
-
s_eair100_levii_j()returns a list containing the following statistics:n_event: Number of events
person_years: Total person-years of follow-up
eair: Exposure-adjusted incidence rate per 100 person-years
eair_diff: Risk difference in EAIR (if diff=TRUE and inriskdiffcol=TRUE)
eair_diff_ci: Confidence interval for the risk difference (if diff=TRUE and inriskdiffcol=TRUE)
.
The list of available statistics (core columns) can also be viewed by runningjunco_get_stats("a_eair100_j")
-
a_eair100_jreturns the corresponding list with formattedrtables::CellValue().
Functions
-
s_eair100_levii_j(): calculates exposure-adjusted incidence rates (EAIR) per 100 person-years for a specific level of a variable. -
a_eair100_j(): Formatted analysis function for exposure adjusted incidence rate summary which is used asafuninanalyzeorcfuninsummarize_row_groups.
Examples
library(tern)
library(dplyr)
trtvar <- "ARM"
ctrl_grp <- "B: Placebo"
cutoffd <- as.Date("2023-09-24")
adexsum <- ex_adsl %>%
create_colspan_var(
non_active_grp = ctrl_grp,
non_active_grp_span_lbl = " ",
active_grp_span_lbl = "Active Study Agent",
colspan_var = "colspan_trt",
trt_var = trtvar
) %>%
mutate(
rrisk_header = "Risk Difference (95% CI)",
rrisk_label = paste(!!rlang::sym(trtvar), "vs", ctrl_grp),
TRTDURY = case_when(
!is.na(EOSDY) ~ EOSDY,
TRUE ~ as.integer(cutoffd - as.Date(TRTSDTM) + 1)
)
) %>%
select(USUBJID, !!rlang::sym(trtvar), colspan_trt, rrisk_header, rrisk_label, TRTDURY)
adexsum$TRTDURY <- as.numeric(adexsum$TRTDURY)
adae <- ex_adae %>%
group_by(USUBJID, AEDECOD) %>%
select(USUBJID, AEDECOD, ASTDY) %>%
mutate(rwnum = row_number()) %>%
mutate(AOCCPFL = case_when(
rwnum == 1 ~ "Y",
TRUE ~ NA
)) %>%
filter(AOCCPFL == "Y")
aefup <- left_join(adae, adexsum, by = "USUBJID")
colspan_trt_map <- create_colspan_map(adexsum,
non_active_grp = ctrl_grp,
non_active_grp_span_lbl = " ",
active_grp_span_lbl = "Active Study Agent",
colspan_var = "colspan_trt",
trt_var = trtvar
)
ref_path <- c("colspan_trt", " ", trtvar, ctrl_grp)
lyt <- basic_table(show_colcounts = TRUE, colcount_format = "N=xx", top_level_section_div = " ") %>%
split_cols_by("colspan_trt", split_fun = trim_levels_to_map(map = colspan_trt_map)) %>%
split_cols_by(trtvar) %>%
split_cols_by("rrisk_header", nested = FALSE) %>%
split_cols_by(trtvar, labels_var = "rrisk_label", split_fun = remove_split_levels(ctrl_grp)) %>%
analyze("TRTDURY",
nested = FALSE,
show_labels = "hidden",
afun = a_patyrs_j
) %>%
analyze(
vars = "AEDECOD",
nested = FALSE,
afun = a_eair100_j,
extra_args = list(
fup_var = "TRTDURY",
occ_var = "AOCCPFL",
occ_dy = "ASTDY",
ref_path = ref_path,
drop_levels = TRUE
)
)
result <- build_table(lyt, aefup, alt_counts_df = adexsum)
head(result, 5)
Analysis function count and percentage in column design controlled by combosdf
Description
Analysis function count and percentage in column design controlled by combosdf
Usage
a_freq_combos_j(
df,
labelstr = NULL,
.var = NA,
val = NULL,
combosdf = NULL,
do_not_filter = NULL,
filter_var = NULL,
flag_var = NULL,
.df_row,
.spl_context,
.N_col,
id = "USUBJID",
denom = c("N_col", "n_df", "n_altdf", "n_rowdf", "n_parentdf"),
label = NULL,
label_fstr = NULL,
label_map = NULL,
.alt_df_full = NULL,
denom_by = NULL,
.stats = "count_unique_denom_fraction",
.formats = NULL,
.labels_n = NULL,
.indent_mods = NULL,
na_str = rep("NA", 3)
)
Arguments
df
(data.frame)
data set containing all analysis variables.
labelstr
(character)
label of the level of the parent split currently being summarized
(must be present as second argument in Content Row Functions). See rtables::summarize_row_groups()
for more information.
.var
(string)
single variable name that is passed by rtables when requested
by a statistics function.
val
(character or NULL)
When NULL, all levels of the incoming variable (variable used in the analyze call)
will be considered.
When a single string, only that current level/value of the incoming variable
will be considered.
When multiple levels, only those levels/values of the incoming variable
will be considered.
When no values are observed (eg zero row input df),
a row with row-label No data reported will be included in the table.
combosdf
The df which provides the mapping of facets to produce cumulative counts for .N_col.
do_not_filter
A vector of facets (i.e., column headers), identifying headers for which no filtering of records should occur. That is, the numerator should contain cumulative counts. Generally, this will be used for a "Total" column, or something similar.
filter_var
The variable which identifies the records to count in the numerator for any given column. Generally, this will contain text matching the column header for the column associated with a given record.
flag_var
Variable which identifies the occurrence (or first occurrence) of an event. The flag variable is expected to have a value of "Y" identifying that the event should be counted, or NA otherwise.
.df_row
(data.frame)
data frame across all of the columns for the given row split.
.spl_context
(data.frame)
gives information about ancestor split states
that is passed by rtables.
.N_col
(integer)
column-wise N (column count) for the full column being analyzed that is typically
passed by rtables.
id
(string)
subject variable name.
denom
(string)
One of
-
N_col Column count,
-
n_df Number of patients (based upon the main input dataframe
df),
-
n_altdf Number of patients from the secondary dataframe (
.alt_df_full),
Note that argumentdenom_bywill perform a row-split on the.alt_df_fulldataframe.
It is a requirement that variables specified indenom_byare part of the row split specifications.
-
n_rowdf Number of patients from the current row-level dataframe (
.row_dffrom the rtables splitting machinery).
-
n_parentdf Number of patients from a higher row-level split than the current split.
This higher row-level split is specified in the argumentdenom_by.
label
(string)
When valis a single string,
the row label to be shown on the output can be specified using this argument.
When val is a character vector, the label_map argument can be specified
to control the row-labels.
label_fstr
(string)
a sprintf style format string.
It can contain up to one "\
generates the row/column label.
It will be combined with the labelstr argument,
when utilizing this function as
a cfun in a summarize_row_groups call.
It is recommended not to utilize this argument for other purposes.
The label argument could be used instead (if val is a single string)
label_map
(tibble)
A mapping tibble to translate levels from the incoming variable into
a different row label to be presented on the table.
.alt_df_full
(dataframe)
Denominator dataset
for fraction and relative risk calculations.
.alt_df_full is a crucial parameter for the relative risk calculations
if this parameter is not set to utilize alt_counts_df,
then the values in the relative risk columns might not be correct.
Once the rtables PR is integrated, this argument gets populated by the rtables
split machinery (see rtables::additional_fun_params).
denom_by
(character)
Variables from row-split
to be used in the denominator derivation.
This controls both denom = "n_parentdf" and denom = "n_altdf".
When denom = "n_altdf", the denominator is derived from .alt_df_full
in combination with denom_by argument
.stats
(character)
statistics to select for the table.
.formats
(named 'character' or 'list')
formats for the statistics.
.labels_n
(named character)
String to control row labels for the 'n'-statistics.
Only useful when more than one 'n'-statistic is requested (rare situations only).
.indent_mods
(named integer)
indent modifiers for the labels. Defaults to 0, which corresponds to the
unmodified default behavior. Can be negative.
na_str
(string)
string used to replace all NA or empty values in the output.
Value
list of requested statistics with formatted rtables::CellValue().
Note
: These extra records must then be removed from the numerator via the filter_var parameter to avoid double counting of events.
Analysis/statistical function for count and percentage in core columns and (optional) relative risk columns
Description
Analysis/statistical function for count and percentage in core columns and (optional) relative risk columns
Usage
s_freq_j(
df,
.var,
.df_row,
val = NULL,
drop_levels = FALSE,
excl_levels = NULL,
alt_df,
parent_df,
id = "USUBJID",
denom = c("n_df", "n_altdf", "N_col", "n_rowdf", "n_parentdf"),
.N_col,
countsource = c("df", "altdf")
)
a_freq_j(
df,
labelstr = NULL,
.var = NA,
val = NULL,
drop_levels = FALSE,
excl_levels = NULL,
new_levels = NULL,
new_levels_after = FALSE,
addstr2levs = NULL,
.df_row,
.spl_context,
.N_col,
id = "USUBJID",
denom = c("N_col", "n_df", "n_altdf", "N_colgroup", "n_rowdf", "n_parentdf"),
riskdiff = TRUE,
ref_path = NULL,
variables = list(strata = NULL),
conf_level = 0.95,
method = c("wald", "waldcc", "cmh", "ha", "newcombe", "newcombecc", "strat_newcombe",
"strat_newcombecc"),
weights_method = "cmh",
label = NULL,
label_fstr = NULL,
label_map = NULL,
.alt_df_full = NULL,
denom_by = NULL,
.stats = c("count_unique_denom_fraction"),
.formats = NULL,
.indent_mods = NULL,
na_str = rep("NA", 3),
.labels_n = NULL,
extrablankline = FALSE,
extrablanklineafter = NULL,
restr_columns = NULL,
colgroup = NULL,
countsource = c("df", "altdf")
)
Arguments
df
(data.frame)
data set containing all analysis variables.
.var
(string)
single variable name that is passed by rtables when requested
by a statistics function.
.df_row
(data.frame)
data frame across all of the columns for the given row split.
val
(character or NULL)
When NULL, all levels of the incoming variable (variable used in the analyze call)
will be considered.
When a single string, only that current level/value of the incoming variable
will be considered.
When multiple levels, only those levels/values of the incoming variable
will be considered.
When no values are observed (eg zero row input df),
a row with row-label No data reported will be included in the table.
drop_levels
(logical)
If TRUE non-observed levels
(based upon .df_row) will not be included.
Cannot be used together with val.
excl_levels
(character or NULL)
When NULL, no levels of the incoming variable (variable used in the analyze call)
will be excluded.
When multiple levels, those levels/values of the incoming variable
will be excluded.
Cannot be used together with val.
alt_df
(dataframe)
Will be derived based upon alt_df_full and denom_by within a_freq_j.
parent_df
(dataframe)
Will be derived within a_freq_j based
upon the input dataframe that goes into build_table (df) and denom_by.
It is a data frame in the higher row-space than the current input df
(which underwent row-splitting by the rtables splitting machinery).
id
(string)
subject variable name.
denom
(string)
See Details.
.N_col
(integer)
column-wise N (column count) for the full column being analyzed that is typically
passed by rtables.
countsource
Either df or alt_df.
When alt_df the counts will be based upon the alternative dataframe alt_df.
This is useful for subgroup processing,
to present counts of subjects in a subgroup from the alternative dataframe.
labelstr
An argument to ensure this function can be used
as a cfun in a summarize_row_groups call.
It is recommended not to utilize this argument for other purposes.
The label argument could be used instead (if val is a single string)
An another approach could be to utilize the label_map argument
to control the row labels of the incoming analysis variable.
new_levels
(list(2) or NULL)
List of length 2.
First element : names of the new levels
Second element: list with values of the new levels.
new_levels_after
(logical)
If TRUE new levels will be added after last level.
addstr2levs
string, if not NULL will be appended to the rowlabel for that level, eg to add ",n (percent)" at the end of the rowlabels
.spl_context
(data.frame)
gives information about ancestor split states
that is passed by rtables.
riskdiff
(logical)
When TRUE, risk difference calculations will be performed and
presented (if required risk difference column splits are included).
When FALSE, risk difference columns will remain blank
(if required risk difference column splits are included).
ref_path
(string)
Column path specifications for
the control group for the relative risk derivation.
variables
Will be passed onto the relative risk function
(internal function s_rel_risk_val_j), which is based upon tern::s_proportion_diff() .
See ?tern::s_proportion_diff for details.
conf_level
(proportion)
confidence level of the interval.
method
Will be passed onto the relative risk function (internal function s_rel_risk_val_j).
weights_method
Will be passed onto the relative risk function (internal function s_rel_risk_val_j).
label
(string)
When valis a single string,
the row label to be shown on the output can be specified using this argument.
When val is a character vector, the label_map argument can be specified
to control the row-labels.
label_fstr
(string)
a sprintf style format string.
It can contain up to one "\
generates the row/column label.
It will be combined with the labelstr argument,
when utilizing this function as
a cfun in a summarize_row_groups call.
It is recommended not to utilize this argument for other purposes.
The label argument could be used instead (if val is a single string)
label_map
(tibble)
A mapping tibble to translate levels from the incoming variable into
a different row label to be presented on the table.
.alt_df_full
(dataframe)
Denominator dataset
for fraction and relative risk calculations.
.alt_df_full is a crucial parameter for the relative risk calculations
if this parameter is not set to utilize alt_counts_df,
then the values in the relative risk columns might not be correct.
Once the rtables PR is integrated, this argument gets populated by the rtables
split machinery (see rtables::additional_fun_params).
denom_by
(character)
Variables from row-split
to be used in the denominator derivation.
This controls both denom = "n_parentdf" and denom = "n_altdf".
When denom = "n_altdf", the denominator is derived from .alt_df_full
in combination with denom_by argument
.stats
(character)
statistics to select for the table.
See Value for list of available statistics.
.formats
(named 'character' or 'list')
formats for the statistics.
.indent_mods
(named integer)
indent modifiers for the labels. Defaults to 0, which corresponds to the
unmodified default behavior. Can be negative.
na_str
(string)
string used to replace all NA or empty values in the output.
.labels_n
(named character)
String to control row labels for the 'n'-statistics.
Only useful when more than one 'n'-statistic is requested (rare situations only).
extrablankline
(logical)
When TRUE, an extra blank line will be added after the last value.
Avoid using this in template scripts, use section_div = " " instead (once PR for rtables is available)
extrablanklineafter
(string)
When the row-label matches the string, an extra blank line will be added after
that value.
restr_columns
character
If not NULL, columns not defined in restr_columns will be blanked out.
colgroup
The name of the column group variable that is used as source
for denominator calculation.
Required to be specified when denom = "N_colgroup".
Details
denom controls the denominator used to calculate proportions/percents.
It must be one of
-
N_col Column count,
-
n_df Number of patients (based upon the main input dataframe
df),
-
n_altdf Number of patients from the secondary dataframe (
.alt_df_full),
Note that argumentdenom_bywill perform a row-split on the.alt_df_fulldataframe.
It is a requirement that variables specified indenom_byare part of the row split specifications.
-
N_colgroup Number of patients from the column group variable (note that this is based upon the input .alt_df_full dataframe).
Note that the argumentcolgroup(column variable) needs to be provided, as it cannot be retrieved directly from the column layout definition. -
n_rowdf Number of patients from the current row-level dataframe (
.row_dffrom the rtables splitting machinery).
-
n_parentdf Number of patients from a higher row-level split than the current split.
This higher row-level split is specified in the argumentdenom_by.
Value
-
s_freq_j: returns a list of following statistics
n_df
n_rowdf
n_parentdf
n_altdf
denom
count
count_unique
count_unique_fraction
count_unique_denom_fraction
-
a_freq_j: returns a list of requested statistics with formattedrtables::CellValue().
Within the relative risk difference columns, the following stats are blanked out:any of the n-statistics (n_df, n_altdf, n_parentdf, n_rowdf, denom)
count
count_unique
For the others (count_unique_fraction, count_unique_denom_fraction), the statistic is replaced by the relative risk difference + confidence interval.
Examples
library(dplyr)
adsl <- ex_adsl |> select("USUBJID", "SEX", "ARM")
adae <- ex_adae |> select("USUBJID", "AEBODSYS", "AEDECOD")
adae[["TRTEMFL"]] <- "Y"
trtvar <- "ARM"
ctrl_grp <- "B: Placebo"
adsl$colspan_trt <- factor(ifelse(adsl[[trtvar]] == ctrl_grp, " ", "Active Study Agent"),
levels = c("Active Study Agent", " ")
)
adsl$rrisk_header <- "Risk Difference (%) (95% CI)"
adsl$rrisk_label <- paste(adsl[[trtvar]], paste("vs", ctrl_grp))
adae <- adae |> left_join(adsl)
colspan_trt_map <- create_colspan_map(adsl,
non_active_grp = "B: Placebo",
non_active_grp_span_lbl = " ",
active_grp_span_lbl = "Active Study Agent",
colspan_var = "colspan_trt",
trt_var = trtvar
)
ref_path <- c("colspan_trt", " ", trtvar, ctrl_grp)
lyt <- basic_table(show_colcounts = TRUE) |>
split_cols_by("colspan_trt", split_fun = trim_levels_to_map(map = colspan_trt_map)) |>
split_cols_by(trtvar) |>
split_cols_by("rrisk_header", nested = FALSE) |>
split_cols_by(trtvar, labels_var = "rrisk_label", split_fun = remove_split_levels(ctrl_grp))
lyt1 <- lyt |>
analyze("TRTEMFL",
show_labels = "hidden",
afun = a_freq_j,
extra_args = list(
method = "wald",
.stats = c("count_unique_denom_fraction"),
ref_path = ref_path
)
)
result1 <- build_table(lyt1, adae, alt_counts_df = adsl)
result1
x_drug_x <- list(length(unique(subset(adae, adae[[trtvar]] == "A: Drug X")[["USUBJID"]])))
N_x_drug_x <- length(unique(subset(adsl, adsl[[trtvar]] == "A: Drug X")[["USUBJID"]]))
y_placebo <- list(length(unique(subset(adae, adae[[trtvar]] == ctrl_grp)[["USUBJID"]])))
N_y_placebo <- length(unique(subset(adsl, adsl[[trtvar]] == ctrl_grp)[["USUBJID"]]))
tern::stat_propdiff_ci(
x = x_drug_x,
N_x = N_x_drug_x,
y = y_placebo,
N_y = N_y_placebo
)
x_combo <- list(length(unique(subset(adae, adae[[trtvar]] == "C: Combination")[["USUBJID"]])))
N_x_combo <- length(unique(subset(adsl, adsl[[trtvar]] == "C: Combination")[["USUBJID"]]))
tern::stat_propdiff_ci(
x = x_combo,
N_x = N_x_combo,
y = y_placebo,
N_y = N_y_placebo
)
extra_args_rr <- list(
denom = "n_altdf",
denom_by = "SEX",
riskdiff = FALSE,
.stats = c("count_unique")
)
extra_args_rr2 <- list(
denom = "n_altdf",
denom_by = "SEX",
riskdiff = TRUE,
ref_path = ref_path,
method = "wald",
.stats = c("count_unique_denom_fraction"),
na_str = rep("NA", 3)
)
lyt2 <- basic_table(
top_level_section_div = " ",
colcount_format = "N=xx"
) |>
split_cols_by("colspan_trt", split_fun = trim_levels_to_map(map = colspan_trt_map)) |>
split_cols_by(trtvar, show_colcounts = TRUE) |>
split_cols_by("rrisk_header", nested = FALSE) |>
split_cols_by(trtvar,
labels_var = "rrisk_label", split_fun = remove_split_levels("B: Placebo"),
show_colcounts = FALSE
) |>
split_rows_by("SEX", split_fun = drop_split_levels) |>
summarize_row_groups("SEX",
cfun = a_freq_j,
extra_args = append(extra_args_rr, list(label_fstr = "Gender: %s"))
) |>
split_rows_by("TRTEMFL",
split_fun = keep_split_levels("Y"),
indent_mod = -1L,
section_div = c(" ")
) |>
summarize_row_groups("TRTEMFL",
cfun = a_freq_j,
extra_args = append(extra_args_rr2, list(
label =
"Subjects with >=1 AE", extrablankline = TRUE
))
) |>
split_rows_by("AEBODSYS",
split_label = "System Organ Class",
split_fun = trim_levels_in_group("AEDECOD"),
label_pos = "topleft",
section_div = c(" "),
nested = TRUE
) |>
summarize_row_groups("AEBODSYS",
cfun = a_freq_j,
extra_args = extra_args_rr2
) |>
analyze("AEDECOD",
afun = a_freq_j,
extra_args = extra_args_rr2
)
result2 <- build_table(lyt2, adae, alt_counts_df = adsl)
Analysis Function for Response Variables
Description
This function calculates counts and percentages for response variables (Y/N values), with optional risk difference calculations.
Usage
a_freq_resp_var_j(
df,
.var,
.df_row,
.N_col,
.spl_context,
resp_var = NULL,
id = "USUBJID",
drop_levels = FALSE,
riskdiff = TRUE,
ref_path = NULL,
variables = formals(s_proportion_diff)$variables,
conf_level = formals(s_proportion_diff)$conf_level,
method = c("wald", "waldcc", "cmh", "ha", "newcombe", "newcombecc", "strat_newcombe",
"strat_newcombecc"),
weights_method = formals(s_proportion_diff)$weights_method,
...
)
Arguments
df
(data.frame)
data set containing all analysis variables.
.var
(string)
variable name that is passed by rtables.
.df_row
(data.frame)
data frame across all of the columns for the given row split.
.N_col
(integer)
column-wise N (column count) for the full column being analyzed.
.spl_context
(data.frame)
gives information about ancestor split states.
resp_var
(string)
response variable name containing Y/N values.
id
(string)
subject variable name.
drop_levels
(logical)
if TRUE, non-observed levels will not be included.
riskdiff
(logical)
if TRUE, risk difference calculations will be performed.
ref_path
(string)
column path specifications for the control group.
variables
(list)
variables to include in the analysis.
conf_level
(proportion)
confidence level of the interval.
method
(character)
method for calculating confidence intervals.
weights_method
(character)
method for calculating weights.
...
Additional arguments passed to other functions.
Value
A list of rcell objects containing the response statistics.
Analysis function count and percentage with extra column-subsetting in selected columns (controlled by subcol_* arguments)
Description
Analysis function count and percentage with extra column-subsetting in selected columns (controlled by subcol_* arguments)
Usage
a_freq_subcol_j(
df,
labelstr = NULL,
.var = NA,
val = NULL,
subcol_split = NULL,
subcol_var = NULL,
subcol_val = NULL,
.df_row,
.spl_context,
.N_col,
id = "USUBJID",
denom = c("N_col", "n_df", "n_altdf", "n_rowdf", "n_parentdf"),
label = NULL,
label_fstr = NULL,
label_map = NULL,
.alt_df_full = NULL,
denom_by = NULL,
.stats = c("count_unique_denom_fraction"),
.formats = NULL,
.labels_n = NULL,
.indent_mods = NULL,
na_str = rep("NA", 3)
)
Arguments
df
(data.frame)
data set containing all analysis variables.
labelstr
(character)
label of the level of the parent split currently being summarized
(must be present as second argument in Content Row Functions). See rtables::summarize_row_groups()
for more information.
.var
(string)
single variable name that is passed by rtables when requested
by a statistics function.
val
(character or NULL)
When NULL, all levels of the incoming variable (variable used in the analyze call)
will be considered.
When a single string, only that current level/value of the incoming variable
will be considered.
When multiple levels, only those levels/values of the incoming variable
will be considered.
When no values are observed (eg zero row input df),
a row with row-label No data reported will be included in the table.
subcol_split
Text to search colid to determine whether further subsetting should be performed.
subcol_var
Name of variable containing to be searched for the text identified in subcol_val argument.
subcol_val
Value to use to perform further data sub-setting.
.df_row
(data.frame)
data frame across all of the columns for the given row split.
.spl_context
(data.frame)
gives information about ancestor split states
that is passed by rtables.
.N_col
(integer)
column-wise N (column count) for the full column being analyzed that is typically
passed by rtables.
id
(string)
subject variable name.
denom
(string)
One of
-
N_col Column count,
-
n_df Number of patients (based upon the main input dataframe
df),
-
n_altdf Number of patients from the secondary dataframe (
.alt_df_full),
Note that argumentdenom_bywill perform a row-split on the.alt_df_fulldataframe.
It is a requirement that variables specified indenom_byare part of the row split specifications.
-
n_rowdf Number of patients from the current row-level dataframe (
.row_dffrom the rtables splitting machinery).
-
n_parentdf Number of patients from a higher row-level split than the current split.
This higher row-level split is specified in the argumentdenom_by.
label
(string)
When valis a single string,
the row label to be shown on the output can be specified using this argument.
When val is a character vector, the label_map argument can be specified
to control the row-labels.
label_fstr
(string)
a sprintf style format string.
It can contain up to one "\
generates the row/column label.
It will be combined with the labelstr argument,
when utilizing this function as
a cfun in a summarize_row_groups call.
It is recommended not to utilize this argument for other purposes.
The label argument could be used instead (if val is a single string)
label_map
(tibble)
A mapping tibble to translate levels from the incoming variable into
a different row label to be presented on the table.
.alt_df_full
(dataframe)
Denominator dataset
for fraction and relative risk calculations.
.alt_df_full is a crucial parameter for the relative risk calculations
if this parameter is not set to utilize alt_counts_df,
then the values in the relative risk columns might not be correct.
Once the rtables PR is integrated, this argument gets populated by the rtables
split machinery (see rtables::additional_fun_params).
denom_by
(character)
Variables from row-split
to be used in the denominator derivation.
This controls both denom = "n_parentdf" and denom = "n_altdf".
When denom = "n_altdf", the denominator is derived from .alt_df_full
in combination with denom_by argument
.stats
(character)
statistics to select for the table.
.formats
(named 'character' or 'list')
formats for the statistics.
.labels_n
(named character)
String to control row labels for the 'n'-statistics.
Only useful when more than one 'n'-statistic is requested (rare situations only).
.indent_mods
(named integer)
indent modifiers for the labels. Defaults to 0, which corresponds to the
unmodified default behavior. Can be negative.
na_str
(string)
string used to replace all NA or empty values in the output.
Value
list of requested statistics with formatted rtables::CellValue().
Patient years exposure
Description
Statistical/Analysis Function for presenting Patient years exposure summary data
Usage
s_patyrs_j(
df,
.var,
id = "USUBJID",
.alt_df_full,
source = c("alt_df", "df"),
inriskdiffcol = FALSE
)
a_patyrs_j(
df,
.var,
.df_row,
id = "USUBJID",
.alt_df_full = NULL,
.formats = NULL,
.labels = NULL,
source = c("alt_df", "df"),
.spl_context,
.stats = "patyrs"
)
Arguments
df
(data.frame)
data set containing all analysis variables.
.var
(string)
variable name containing the patient years data.
id
(string)
subject variable name.
.alt_df_full
(dataframe)
alternative dataset for calculations.
source
(string)
source of data, either "alt_df" or "df".
inriskdiffcol
(logical)
flag indicating if the function is called within a risk difference column.
.df_row
(data.frame)
data frame across all of the columns for the given row split.
.formats
(named 'character' or 'list')
formats for the statistics.
.labels
(named 'character')
labels for the statistics.
.spl_context
(data.frame)
gives information about ancestor split states.
.stats
(character)
statistics to select for the table.
Value
-
s_patyrs_j()return x a list containing the patient years statistics. The list of available statistics for can be viewed by runningjunco_get_stats("a_patyrs_j"), currently this is just a single statisticpatyrs, patient years of exposure.
-
a_patyrs_jreturns the corresponding list with formattedrtables::CellValue().
Functions
-
s_patyrs_j(): Statistical Function for Patient years exposure summary data -
a_patyrs_j(): Formatted analysis function for patient years summary which is used asafuninanalyzeorcfuninsummarize_row_groups.
Examples
library(tern)
library(dplyr)
trtvar <- "ARM"
ctrl_grp <- "B: Placebo"
cutoffd <- as.Date("2023-09-24")
adexsum <- ex_adsl %>%
create_colspan_var(
non_active_grp = ctrl_grp,
non_active_grp_span_lbl = " ",
active_grp_span_lbl = "Active Study Agent",
colspan_var = "colspan_trt",
trt_var = trtvar
) %>%
mutate(
rrisk_header = "Risk Difference (95% CI)",
rrisk_label = paste(!!rlang::sym(trtvar), "vs", ctrl_grp),
TRTDURY = case_when(
!is.na(EOSDY) ~ EOSDY,
TRUE ~ as.integer(cutoffd - as.Date(TRTSDTM) + 1)
)
) %>%
select(USUBJID, !!rlang::sym(trtvar), colspan_trt, rrisk_header, rrisk_label, TRTDURY)
adae <- ex_adae %>%
group_by(USUBJID, AEDECOD) %>%
select(USUBJID, AEDECOD, ASTDY) %>%
mutate(rwnum = row_number()) %>%
mutate(AOCCPFL = case_when(
rwnum == 1 ~ "Y",
TRUE ~ NA
)) %>%
filter(AOCCPFL == "Y")
aefup <- left_join(adae, adexsum, by = "USUBJID")
colspan_trt_map <- create_colspan_map(adexsum,
non_active_grp = ctrl_grp,
non_active_grp_span_lbl = " ",
active_grp_span_lbl = "Active Study Agent",
colspan_var = "colspan_trt",
trt_var = trtvar
)
ref_path <- c("colspan_trt", " ", trtvar, ctrl_grp)
lyt <- basic_table(show_colcounts = TRUE, colcount_format = "N=xx", top_level_section_div = " ") %>%
split_cols_by("colspan_trt", split_fun = trim_levels_to_map(map = colspan_trt_map)) %>%
split_cols_by(trtvar) %>%
split_cols_by("rrisk_header", nested = FALSE) %>%
split_cols_by(trtvar, labels_var = "rrisk_label", split_fun = remove_split_levels(ctrl_grp)) %>%
analyze("TRTDURY",
nested = FALSE,
show_labels = "hidden",
afun = a_patyrs_j
)
result <- build_table(lyt, aefup, alt_counts_df = adexsum)
result
Formatted Analysis Function For Proportion Confidence Interval for Factor
Description
Formatted Analysis Function For Proportion Confidence Interval for Factor
Usage
a_proportion_ci_factor(df, .var, ...)
Arguments
df
(data.frame)
including factor .var.
.var
(string)
name of the factor variable.
...
see a_proportion_ci_logical() for additionally required
arguments.
Value
The rtables::rcell() result.
Examples
a_proportion_ci_factor(
df = DM,
.var = "SEX",
.alt_df = DM,
conf_level = 0.95,
formats = list(prop_ci = jjcsformat_xx("xx.x%, xx.x%")),
method = "clopper-pearson"
)
Formatted Analysis Function For Proportion Confidence Interval for Logical
Description
Formatted Analysis Function For Proportion Confidence Interval for Logical
Usage
a_proportion_ci_logical(x, .alt_df, conf_level, method, formats)
Arguments
x
(logical)
including binary response values.
.alt_df
(data.frame)
alternative data frame used for denominator calculation.
conf_level
(numeric)
confidence level for the confidence interval.
method
(string)
please see tern::s_proportion() for possible
methods.
formats
(list)
including element prop_ci with the
required format. Note that the value is in percent already.
Value
The rtables::rcell() result.
Examples
a_proportion_ci_logical(
x = DM$SEX == "F",
.alt_df = DM,
conf_level = 0.95,
formats = list(prop_ci = jjcsformat_xx("xx.xx% - xx.xx%")),
method = "wald"
)
Relative risk estimation
Description
The analysis function a_relative_risk() is used to create a layout element
to estimate the relative risk for response within a studied population. Only
the CMH method is available currently.
The primary analysis variable, vars, is a logical variable indicating
whether a response has occurred for each record.
A stratification variable must be supplied via the
strata element of the variables argument.
Usage
a_relative_risk(
df,
.var,
ref_path,
.spl_context,
...,
.stats = NULL,
.formats = NULL,
.labels = NULL,
.indent_mods = NULL
)
s_relative_risk(
df,
.var,
.ref_group,
.in_ref_col,
variables = list(strata = NULL),
conf_level = 0.95,
method = "cmh",
weights_method = "cmh"
)
Arguments
df
(data.frame)
input data frame.
.var
(string)
name of the response variable.
ref_path
(character)
path to the reference group.
.spl_context
(environment)
split context environment.
...
Additional arguments passed to the statistics function.
.stats
(character)
statistics to calculate.
.formats
(list)
formats for the statistics.
.labels
(list)
labels for the statistics.
.indent_mods
(list)
indentation modifications for the statistics.
.ref_group
(data.frame)
reference group data frame.
.in_ref_col
(logical)
whether the current column is the reference column.
variables
(list)
list with strata variable names.
conf_level
(numeric)
confidence level for the confidence interval.
method
(string)
method to use for relative risk calculation.
weights_method
(string)
method to use for weights calculation in stratified analysis.
Details
The variance of the CMH relative risk estimate is calculated using the Greenland and Robins (1985) variance estimation.
Value
-
a_relative_risk()returns the corresponding list with formattedrtables::CellValue().
-
s_relative_risk()returns a named list of elementsrel_risk_ciandpval.
Functions
-
a_relative_risk(): Formatted analysis function which is used asafun. Note that the junco specificref_pathand.spl_contextarguments are used for reference column information. -
s_relative_risk(): Statistics function estimating the relative risk for response.
Note
This has been adapted from the odds_ratio functions in the tern package.
Examples
nex <- 100
dta <- data.frame(
"rsp" = sample(c(TRUE, FALSE), nex, TRUE),
"grp" = sample(c("A", "B"), nex, TRUE),
"f1" = sample(c("a1", "a2"), nex, TRUE),
"f2" = sample(c("x", "y", "z"), nex, TRUE),
stringsAsFactors = TRUE
)
l <- basic_table() |>
split_cols_by(var = "grp") |>
analyze(
vars = "rsp",
afun = a_relative_risk,
extra_args = list(
conf_level = 0.90,
variables = list(strata = "f1"),
ref_path = c("grp", "B")
)
)
build_table(l, df = dta)
nex <- 100
dta <- data.frame(
"rsp" = sample(c(TRUE, FALSE), nex, TRUE),
"grp" = sample(c("A", "B"), nex, TRUE),
"f1" = sample(c("a1", "a2"), nex, TRUE),
"f2" = sample(c("x", "y", "z"), nex, TRUE),
stringsAsFactors = TRUE
)
s_relative_risk(
df = subset(dta, grp == "A"),
.var = "rsp",
.ref_group = subset(dta, grp == "B"),
.in_ref_col = FALSE,
variables = list(strata = c("f1", "f2")),
conf_level = 0.90
)
ANCOVA Summary Function
Description
Combination of tern::s_summary, and ANCOVA based estimates for mean and diff between columns,
based on ANCOVA function s_ancova_j
Usage
a_summarize_ancova_j(
df,
.var,
.df_row,
ref_path,
.spl_context,
...,
.stats = NULL,
.formats = NULL,
.labels = NULL,
.indent_mods = NULL
)
s_summarize_ancova_j(df, .var, .df_row, .ref_group, .in_ref_col, ...)
Arguments
df
: need to check on how to inherit params from tern::s_ancova
.var
(string)
single variable name that is passed by rtables when requested
by a statistics function.
.df_row
(data.frame)
data set that includes all the variables that are called in .var and variables.
ref_path
(character)
path to the reference group.
.spl_context
(environment)
split context environment.
...
Additional arguments passed to s_ancova_j.
.stats
(character)
statistics to calculate.
.formats
(list)
formats for the statistics.
.labels
(list)
labels for the statistics.
.indent_mods
(list)
indentation modifications for the statistics.
.ref_group
(data.frame or vector)
the data corresponding to the reference group.
.in_ref_col
(flag)
TRUE when working with the reference level, FALSE otherwise.
Details
Combination of tern::s_summary, and ANCOVA based estimates for mean and diff between columns,
based on ANCOVA function s_ancova_j
Value
-
a_summarize_ancova_j()returns the corresponding list with formattedrtables::CellValue().
returns the statistics from tern::s_summary(x), appended with a new statistics based upon ANCOVA
Functions
-
a_summarize_ancova_j(): Formatted analysis function which is used asafun. Note that the junco specificref_pathand.spl_contextarguments are used for reference column information.
See Also
Other Inclusion of ANCOVA Functions:
a_summarize_aval_chg_diff_j(),
s_ancova_j()
Examples
basic_table() |>
split_cols_by("Species") |>
add_colcounts() |>
analyze(
vars = "Petal.Length",
afun = a_summarize_ancova_j,
show_labels = "hidden",
na_str = tern::default_na_str(),
table_names = "unadj",
var_labels = "Unadjusted comparison",
extra_args = list(
variables = list(arm = "Species", covariates = NULL),
conf_level = 0.95,
.labels = c(lsmean = "Mean", lsmean_diff = "Difference in Means"),
ref_path = c("Species", "setosa")
)
) |>
analyze(
vars = "Petal.Length",
afun = a_summarize_ancova_j,
show_labels = "hidden",
na_str = tern::default_na_str(),
table_names = "adj",
var_labels = "Adjusted comparison (covariates: Sepal.Length and Sepal.Width)",
extra_args = list(
variables = list(
arm = "Species",
covariates = c("Sepal.Length", "Sepal.Width")
),
conf_level = 0.95,
ref_path = c("Species", "setosa")
)
) |>
build_table(iris)
library(dplyr)
library(tern)
df <- iris |> filter(Species == "virginica")
.df_row <- iris
.var <- "Petal.Length"
variables <- list(arm = "Species", covariates = "Sepal.Length * Sepal.Width")
.ref_group <- iris |> filter(Species == "setosa")
conf_level <- 0.95
s_summarize_ancova_j(
df,
.var = .var,
.df_row = .df_row,
variables = variables,
.ref_group = .ref_group,
.in_ref_col = FALSE,
conf_level = conf_level
)
Analysis function 3-column presentation
Description
Analysis functions to produce a 1-row summary presented in
a 3-column layout in the columns: column 1: N, column 2: Value, column 3: change
In the difference columns, only 1 column will be presented : difference + CI
When ancova = TRUE, the presented statistics will be based on ANCOVA method (s_summarize_ancova_j).
mean and ci (both for Value (column 2) and Chg (column 3)) using statistic lsmean_ci
mean and ci for the difference column are based on same ANCOVA model using statistic lsmean_diffci
When ancova = FALSE, descriptive statistics will be used instead.
In the difference column, the 2-sample t-test will be used.
Usage
a_summarize_aval_chg_diff_j(
df,
.df_row,
.spl_context,
ancova = FALSE,
comp_btw_group = TRUE,
ref_path = NULL,
.N_col,
denom = c("N", ".N_col"),
indatavar = NULL,
d = 0,
id = "USUBJID",
interaction_y = FALSE,
interaction_item = NULL,
conf_level = 0.95,
variables = list(arm = "TRT01A", covariates = NULL),
format_na_str = "",
.stats = list(col1 = "count_denom_frac", col23 = "mean_ci_3d", coldiff =
"meandiff_ci_3d"),
.formats = list(col1 = NULL, col23 = "xx.dx (xx.dx, xx.dx)", coldiff =
"xx.dx (xx.dx, xx.dx)"),
.formats_fun = list(col1 = jjcsformat_count_denom_fraction, col23 = jjcsformat_xx,
coldiff = jjcsformat_xx),
multivars = c("AVAL", "AVAL", "CHG")
)
Arguments
df
(data.frame)
data set containing all analysis variables.
.df_row
(data.frame)
data frame across all of the columns for the given row split.
.spl_context
(data.frame)
gives information about ancestor split states
that is passed by rtables.
ancova
(logical)
If FALSE, only descriptive methods will be used.
If TRUE Ancova methods will be used for each of the columns : AVAL, CHG, DIFF.
comp_btw_group
(logical)
If TRUE,
When ancova = FALSE, the estimate of between group difference (on CHG)
will be based upon a two-sample t-test.
When ancova = TRUE, the same ancova model will be used for the estimate of between group difference (on CHG).
ref_path
(character)
global reference group specification, see get_ref_info() .
.N_col
(integer)
column-wise N (column count) for the full column being analyzed that is typically
passed by rtables.
denom
(string)
choice of denominator for proportions. Options are:
-
N: number of records in this column/row split.
There is no check in place that the current split only has one record per subject. Users should be careful with this. -
.N_col: number of records in this column intersection (based on alt_counts_df dataset)
(when alt_counts_df is a single record per subjects, this will match number of subjects)
indatavar
(string)
If not null, variable name to extra subset
incoming df to non-missing values of this variable.
d
(default = 1)
choice of Decimal precision.
Note that one extra precision will be added, as means are presented.
Options are:
numerical(1)
variable name containing information on the precision, this variable should be available on input dataset. The content of this variable should then be an integer.
id
(string)
subject variable name.
interaction_y
(character)
Will be passed onto the tern function s_ancova, when ancova = TRUE.
interaction_item
(character)
Will be passed onto the tern function s_ancova, when ancova = TRUE.
conf_level
(proportion)
Confidence level of the interval
variables
(named list of strings)
list of additional analysis variables, with expected elements:
arm (string)
group variable, for which the covariate adjusted means of multiple groups will be summarized. Specifically, the first level of arm variable is taken as the reference group.covariates (character)
a vector that can contain single variable names (such as 'X1'), and/or interaction terms indicated by 'X1 * X2'.
format_na_str
(string)
.stats
(named list)
column statistics to select for the table.
The following column names are to be used: col1, col23, coldiff.
For col1, the following stats can be specified.
For col23, only mean_ci_3d is available. When ancova=TRUE these are LS Means, otherwise, arithmetic means.
For coldiff, only meandiff_ci_3d is available. When ancova=TRUE these
are LS difference in means, otherwise, difference in means based upon 2-sample t-test.
.formats
(named list)
formats for the column statistics. xx.d style formats can be used.
.formats_fun
(named list)
formatting functions for the column
statistics, to be applied after the conversion of xx.d style to the
appropriate precision.
multivars
(string(3))
Variables names to use in 3-col layout.
Details
See Description
Value
A function that can be used in an analyze function call
See Also
s_summarize_ancova_j
Other Inclusion of ANCOVA Functions:
a_summarize_ancova_j(),
s_ancova_j()
Examples
library(dplyr)
ADEG <- data.frame(
STUDYID = c(
"DUMMY", "DUMMY", "DUMMY", "DUMMY", "DUMMY",
"DUMMY", "DUMMY", "DUMMY", "DUMMY", "DUMMY"
),
USUBJID = c(
"XXXXX01", "XXXXX02", "XXXXX03", "XXXXX04", "XXXXX05",
"XXXXX06", "XXXXX07", "XXXXX08", "XXXXX09", "XXXXX10"
),
TRT01A = c(
"ARMA", "ARMA", "ARMA", "ARMA", "ARMA", "Placebo",
"Placebo", "Placebo", "ARMA", "ARMA"
),
PARAM = c("BP", "BP", "BP", "BP", "BP", "BP", "BP", "BP", "BP", "BP"),
AVISIT = c(
"Visit 1", "Visit 1", "Visit 1", "Visit 1", "Visit 1",
"Visit 1", "Visit 1", "Visit 1", "Visit 1", "Visit 1"
),
AVAL = c(56, 78, 67, 87, 88, 93, 39, 87, 65, 55),
CHG = c(2, 3, -1, 9, -2, 0, 6, -2, 5, 2)
)
ADEG <- ADEG |>
mutate(
TRT01A = as.factor(TRT01A),
STUDYID = as.factor(STUDYID)
)
ADEG$colspan_trt <- factor(ifelse(ADEG$TRT01A == "Placebo", " ", "Active Study Agent"),
levels = c("Active Study Agent", " ")
)
ADEG$rrisk_header <- "Risk Difference (%) (95% CI)"
ADEG$rrisk_label <- paste(ADEG$TRT01A, paste("vs", "Placebo"))
colspan_trt_map <- create_colspan_map(ADEG,
non_active_grp = "Placebo",
non_active_grp_span_lbl = " ",
active_grp_span_lbl = "Active Study Agent",
colspan_var = "colspan_trt",
trt_var = "TRT01A"
)
ref_path <- c("colspan_trt", " ", "TRT01A", "Placebo")
lyt <- basic_table() |>
split_cols_by(
"colspan_trt",
split_fun = trim_levels_to_map(map = colspan_trt_map)
) |>
split_cols_by("TRT01A") |>
split_rows_by(
"PARAM",
label_pos = "topleft",
split_label = "Blood Pressure",
section_div = " ",
split_fun = drop_split_levels
) |>
split_rows_by(
"AVISIT",
label_pos = "topleft",
split_label = "Study Visit",
split_fun = drop_split_levels,
child_labels = "hidden"
) |>
split_cols_by_multivar(
c("AVAL", "AVAL", "CHG"),
varlabels = c("n/N (%)", "Mean (CI)", "CFB (CI)")
) |>
split_cols_by("rrisk_header", nested = FALSE) |>
split_cols_by(
"TRT01A",
split_fun = remove_split_levels("Placebo"),
labels_var = "rrisk_label"
) |>
split_cols_by_multivar(c("CHG"), varlabels = c(" ")) |>
analyze("STUDYID",
afun = a_summarize_aval_chg_diff_j,
extra_args = list(
format_na_str = "-", d = 0,
ref_path = ref_path, variables = list(arm = "TRT01A", covariates = NULL)
)
)
result <- build_table(lyt, ADEG)
result
Tabulation for Exposure Tables
Description
A function to create the appropriate statistics needed for exposure table
Usage
s_summarize_ex_j(
df,
.var,
.df_row,
.spl_context,
comp_btw_group = TRUE,
ref_path = NULL,
ancova = FALSE,
interaction_y,
interaction_item,
conf_level,
daysconv,
variables
)
a_summarize_ex_j(
df,
.var,
.df_row,
.spl_context,
comp_btw_group = TRUE,
ref_path = NULL,
ancova = FALSE,
interaction_y = FALSE,
interaction_item = NULL,
conf_level = 0.95,
variables,
.stats = c("mean_sd", "median", "range", "quantiles", "total_subject_years"),
.formats = c(diff_mean_est_ci = jjcsformat_xx("xx.xx (xx.xx, xx.xx)")),
.labels = c(quantiles = "Interquartile range"),
.indent_mods = NULL,
na_str = rep("NA", 3),
daysconv = 1
)
Arguments
df
(data.frame)
data set containing all analysis variables.
.var
(string)
single variable name that is passed by rtables when requested
by a statistics function.
.df_row
(data.frame)
data frame across all of the columns for the given row split.
.spl_context
(data.frame)
gives information about ancestor split states
that is passed by rtables.
comp_btw_group
(logical)
If TRUE,
When ancova = FALSE, the estimate of between group difference (on CHG) will be based upon two-sample t-test.
When ancova = TRUE, the same ancova model will be used for the estimate of between group difference (on CHG).
ref_path
(character)
global reference group specification, see get_ref_info() .
ancova
(logical)
If FALSE, only descriptive methods will be used.
If TRUE Ancova methods will be used for each of the columns : AVAL, CHG, DIFF.
interaction_y
(character)
Will be passed onto the tern function s_ancova, when ancova = TRUE.
interaction_item
(character)
Will be passed onto the tern function s_ancova, when ancova = TRUE.
conf_level
(proportion)
Confidence level of the interval
daysconv
conversion required to get the values into days (i.e 1 if original PARAMCD unit is days, 30.4375 if original PARAMCD unit is in months)
variables
(named list of strings)
list of additional analysis variables, with expected elements:
arm (string)
group variable, for which the covariate adjusted means of multiple groups will be summarized. Specifically, the first level of arm variable is taken as the reference group.covariates (character)
a vector that can contain single variable names (such as 'X1'), and/or interaction terms indicated by 'X1 * X2'.
.stats
(character)
statistics to select for the table.
.formats
(named character or list)
formats for the statistics. See Details in analyze_vars for more
information on the 'auto' setting.
.labels
(named character)
labels for the statistics (without indent).
.indent_mods
(named integer)
indent modifiers for the labels. Defaults to 0, which corresponds to the
unmodified default behavior. Can be negative.
na_str
(string)
string used to replace all NA or empty values in the output.
Details
Creates statistics needed for standard exposure table
This includes differences and 95% CI and total treatment years.
This is designed to be used as an analysis (afun in analyze) function.
Creates statistics needed for table. This includes differences and 95% CI and total treatment years.
This is designed to be used as an analysis (afun in analyze) function.
Value
-
a_summarize_ex_j()returns the corresponding list with formattedrtables::CellValue().
Functions
-
s_summarize_ex_j(): Statistics function needed for the exposure tables -
a_summarize_ex_j(): Formatted analysis function which is used asafun.
Examples
library(dplyr)
ADEX <- data.frame(
USUBJID = c(
"XXXXX01", "XXXXX02", "XXXXX03", "XXXXX04", "XXXXX05",
"XXXXX06", "XXXXX07", "XXXXX08", "XXXXX09", "XXXXX10"
),
TRT01A = c(
"ARMA", "ARMA", "ARMA", "ARMA", "ARMA",
"Placebo", "Placebo", "Placebo", "ARMA", "ARMA"
),
AVAL = c(56, 78, 67, 87, 88, 93, 39, 87, 65, 55)
)
ADEX <- ADEX |>
mutate(TRT01A = as.factor(TRT01A))
ADEX$colspan_trt <- factor(ifelse(ADEX$TRT01A == "Placebo", " ", "Active Study Agent"),
levels = c("Active Study Agent", " ")
)
ADEX$diff_header <- "Difference in Means (95% CI)"
ADEX$diff_label <- paste(ADEX$TRT01A, paste("vs", "Placebo"))
colspan_trt_map <- create_colspan_map(ADEX,
non_active_grp = "Placebo",
non_active_grp_span_lbl = " ",
active_grp_span_lbl = "Active Study Agent",
colspan_var = "colspan_trt",
trt_var = "TRT01A"
)
ref_path <- c("colspan_trt", "", "TRT01A", "Placebo")
lyt <- basic_table() |>
split_cols_by(
"colspan_trt",
split_fun = trim_levels_to_map(map = colspan_trt_map)
) |>
split_cols_by("TRT01A") |>
split_cols_by("diff_header", nested = FALSE) |>
split_cols_by(
"TRT01A",
split_fun = remove_split_levels("Placebo"),
labels_var = "diff_label"
) |>
analyze("AVAL",
afun = a_summarize_ex_j, var_labels = "Duration of treatment (Days)",
show_labels = "visible",
indent_mod = 0L,
extra_args = list(
daysconv = 1,
ref_path = ref_path,
variables = list(arm = "TRT01A", covariates = NULL),
ancova = TRUE,
comp_btw_group = TRUE
)
)
result <- build_table(lyt, ADEX)
result
Analysis and Content Summary Function Producing Blank Line
Description
Analysis and Content Summary Function Producing Blank Line
Usage
ac_blank_line(df, labelstr = "")
Arguments
df
(data.frame)
data set containing all analysis variables.
labelstr
(character)
label of the level of the parent split currently being summarized
(must be present as second argument in Content Row Functions). See rtables::summarize_row_groups()
for more information.
Shortcut Layout Function for Standard Continuous Variable Analysis
Description
Shortcut Layout Function for Standard Continuous Variable Analysis
Usage
analyze_values(lyt, vars, ..., formats)
Arguments
lyt
(layout)
input layout where analyses will be added to.
vars
(character)
variable names for the primary analysis variable to be iterated over.
...
additional arguments for the lower level functions.
formats
(list)
formats including mean_sd, median and range
specifications.
Value
Modified layout.
Note
This is used in tefmad01 and tefmad03a e.g.
Pruning Function for pruning based on a fraction and/or a difference from the control arm
Description
This is a pruning constructor function which identifies records to be pruned based on the the fraction from the percentages. In addition to just looking at a fraction within an arm this function also allows further flexibility to also prune based on a comparison versus the control arm.
Usage
bspt_pruner(
fraction = 0.05,
keeprowtext = "Analysis set: Safety",
reg_expr = FALSE,
control = NULL,
diff_from_control = NULL,
only_more_often = TRUE,
cols = c("TRT01A")
)
Arguments
fraction
fraction threshold. Function will keep all records strictly greater than this threshold.
keeprowtext
Row to be excluded from pruning.
reg_expr
Apply keeprowtext as a regular expression (grepl with fixed = TRUE)
control
Control Group
diff_from_control
Difference from control threshold.
only_more_often
TRUE: Only consider when column pct is more often than control. FALSE: Also select a row where column pct is less often than control and abs(diff) above threshold
cols
column path.
Value
function that can be utilized as pruning function in prune_table
Examples
ADSL <- data.frame(
USUBJID = c(
"XXXXX01", "XXXXX02", "XXXXX03", "XXXXX04", "XXXXX05",
"XXXXX06", "XXXXX07", "XXXXX08", "XXXXX09", "XXXXX10"
),
TRT01P = c(
"ARMA", "ARMB", "ARMA", "ARMB", "ARMB",
"Placebo", "Placebo", "Placebo", "ARMA", "ARMB"
),
FASFL = c("Y", "Y", "Y", "Y", "N", "Y", "Y", "Y", "Y", "Y"),
SAFFL = c("N", "N", "N", "N", "N", "N", "N", "N", "N", "N"),
PKFL = c("N", "N", "N", "N", "N", "N", "N", "N", "N", "N")
)
ADSL <- ADSL |>
dplyr::mutate(TRT01P = as.factor(TRT01P)) |>
dplyr::mutate(SAFFL = factor(SAFFL, c("Y", "N"))) |>
dplyr::mutate(PKFL = factor(PKFL, c("Y", "N")))
lyt <- basic_table() |>
split_cols_by("TRT01P") |>
add_overall_col("Total") |>
split_rows_by(
"FASFL",
split_fun = drop_and_remove_levels("N"),
child_labels = "hidden"
) |>
analyze("FASFL",
var_labels = "Analysis set:",
afun = a_freq_j,
show_labels = "visible",
extra_args = list(label = "Full", .stats = "count_unique_fraction")
) |>
split_rows_by(
"SAFFL",
split_fun = remove_split_levels("N"),
child_labels = "hidden"
) |>
analyze("SAFFL",
var_labels = "Analysis set:",
afun = a_freq_j,
show_labels = "visible",
extra_args = list(label = "Safety", .stats = "count_unique_fraction")
) |>
split_rows_by(
"PKFL",
split_fun = remove_split_levels("N"),
child_labels = "hidden"
) |>
analyze("PKFL",
var_labels = "Analysis set:",
afun = a_freq_j,
show_labels = "visible",
extra_args = list(label = "PK", .stats = "count_unique_fraction")
)
result <- build_table(lyt, ADSL)
result
result <- prune_table(
result,
prune_func = bspt_pruner(
fraction = 0.05,
keeprowtext = "Safety",
cols = c("Total")
)
)
result
Building Model Formula
Description
This builds the model formula which is used inside fit_mmrm_j() and provided
to mmrm::mmrm() internally. It can be instructive to look at the resulting
formula directly sometimes.
Usage
build_formula(
vars,
cor_struct = c("unstructured", "toeplitz", "heterogeneous toeplitz", "ante-dependence",
"heterogeneous ante-dependence", "auto-regressive", "heterogeneous auto-regressive",
"compound symmetry", "heterogeneous compound symmetry")
)
Arguments
vars
(list)
variables to use in the model.
cor_struct
(string)
specify the covariance structure to use.
Value
Formula to use in mmrm::mmrm() .
Examples
vars <- list(
response = "AVAL", covariates = c("RACE", "SEX"),
id = "USUBJID", arm = "ARMCD", visit = "AVISIT"
)
build_formula(vars, "auto-regressive")
build_formula(vars)
c_function for proportion of TRUE in logical vector
Description
A simple statistics function which prepares the numbers with percentages in the required format, for use in a split content row. The denominator here is from the column N. Note that we don't use here .alt_df because that might not have required row split variables available.
Usage
c_proportion_logical(x, labelstr, label_fstr, format, .N_col)
Arguments
x
(logical)
binary variable we want to analyze.
labelstr
(string)
label string.
label_fstr
(string)
format string for the label.
format
(character or list)
format for the statistics.
.N_col
(numeric)
number of columns.
Value
The rtables::in_rows() result with the proportion statistics.
See Also
s_proportion_logical() for the related statistics function.
Simple Content Row Function to Count Rows
Description
Simple Content Row Function to Count Rows
Usage
c_row_counts(df, labelstr, label_fstr)
Value
a VertalRowsSection object (as returned by rtables::in_rows()
containing counts from the data.
Simple Content Row Function to Count Rows from Alternative Data
Description
Simple Content Row Function to Count Rows from Alternative Data
Usage
c_row_counts_alt(df, labelstr, label_fstr, .alt_df)
Value
a VertalRowsSection object (as returned by rtables::in_rows()
containing counts from the alt data.
Check Word Wrapping
Description
Check a set of column widths for word-breaking wrap behavior
Usage
check_wrap_nobreak(tt, colwidths, fontspec)
Arguments
tt
TableTree
colwidths
numeric. Column widths (in numbers of spaces under fontspec)
fontspec
font_spec.
Value
TRUE if the wrap is able to be done without breaking words,
FALSE if wordbreaking is required to apply colwidths
Summary Analysis Function for Compliance Columns (TEFSCNCMP01 e.g.)
Description
A simple statistics function which prepares the numbers with percentages in the required format, for use in a split content row. The denominator here is from the expected visits column.
Usage
cmp_cfun(df, labelstr, .spl_context, variables, formats)
Arguments
df
(data.frame)
data set containing all analysis variables.
labelstr
(character)
label of the level of the parent split currently being summarized
(must be present as second argument in Content Row Functions). See rtables::summarize_row_groups()
for more information.
.spl_context
(data.frame)
gives information about ancestor split states
that is passed by rtables.
variables
(list)
with variable names of logical columns for
expected, received and missing visits.
formats
(list)
with the count_percent format to use for the received
and missing visits columns.
Details
Although this function just returns NULL it has two uses, for
the tern users it provides a documentation of arguments that are
commonly and consistently used in the framework. For the developer it adds a
single reference point to import the roxygen argument description with:
@inheritParams proposal_argument_convention
Value
The rtables::in_rows() result with the counts and proportion statistics.
See Also
cmp_post_fun() for the corresponding split function.
Split Function for Compliance Columns (TEFSCNCMP01 e.g.)
Description
Here we just split into 3 columns for expected, received and missing visits.
Usage
cmp_post_fun(ret, spl, fulldf, .spl_context)
cmp_split_fun(df, spl, vals = NULL, labels = NULL, trim = FALSE, .spl_context)
Arguments
ret
(list)
result from previous split function steps.
spl
(split)
split object.
fulldf
(data.frame)
full data frame.
.spl_context
(data.frame)
gives information about ancestor split states
that is passed by rtables.
df
(data.frame)
data set containing all analysis variables.
vals
(character)
values to use for the split.
labels
(named character)
labels for the statistics (without indent).
trim
(logical)
whether to trim the values.
Value
a split function for use with rtables::split_rows_by when creating proportion-based tables with compliance columns.
Note
This split function is used in the proportion table TEFSCNCMP01 and similar ones.
See Also
rtables::make_split_fun() describing the requirements for this kind of
post-processing function.
Statistics within the column space
Description
A function factory used for obtaining statistics within the columns of your table. Used in change from baseline tables. This takes the visit names as its row labels.
Usage
column_stats(
exclude_visits = c("Baseline (DB)"),
var_names = c("AVAL", "CHG", "BASE"),
stats = list(main = c(N = "N", mean = "Mean", SD = "SD", SE = "SE", Med = "Med", Min =
"Min", Max = "Max"), base = c(mean = "Mean"))
)
Arguments
exclude_visits
Vector of visit(s) for which you do not want the statistics displayed in the baseline mean or change from baseline sections of the table.
var_names
Vector of variable names to use instead of the default AVAL, CHG, BASE. The first two elements are treated as main variables with full statistics, and the third element is treated as the base variable. By default, the function expects these specific variable names in your data, but you can customize them to match your dataset's column names.
stats
A list with two components, main and base, that define the statistics to be calculated
for the main variables (default: AVAL, CHG) and the base variable (default: BASE).
Default for main variables: c(N = "N", mean = "Mean", SD = "SD", SE = "SE", Med = "Med", Min = "Min", Max = "Max")
Default for base variable: c(mean = "Mean")
You can customize these statistics by providing your own named vectors in the list. The names are used
internally for calculations, and the values are used as display labels in the table.
Value
an analysis function (for use with rtables::analyze) implementing the specified statistics.
Conditional Removal of Facets
Description
Conditional Removal of Facets
Usage
cond_rm_facets(
facets = NULL,
facets_regex = NULL,
ancestor_pos = 1,
split = NULL,
split_regex = NULL,
value = NULL,
value_regex = NULL,
keep_matches = FALSE
)
Arguments
facets
character or NULL. Vector of facet names to be removed if condition(s) are met
facets_regex
character(1). Regular expression to identify facet names to be removed if condition(s) are met.
ancestor_pos
numeric(1). Row in spl_context to check the condition within. E.g., 1 represents the first split, 2 represents the second split nested within the first, etc. NA specifies that the conditions should be checked at all split levels. Negative integers indicate position counting back from the current one, e.g., -1 indicates the direct parent (most recent split before this one). Negative and positive/NA positions cannot be mixed.
split
character(1) or NULL. If specified, name of the split
at position ancestor_pos must be identical to this value for
the removal condition to be met.
split_regex
character(1) or NULL. If specified, a regular expression
the name of the split at position ancestor_pos must match for
the removal condition to be met. Cannot be specified at the same time
as split.
value
character(1) or NULL. If specified, split (facet) value
at position ancestor_pos must be identical to this value for
removal condition to be met.
value_regex
character(1) or NULL. If specified, a regular expression
the value of the split at position ancestor_pos must match for
the removal condition to be met. Cannot be specified at the same time
as value.
keep_matches
logical(1). Given the specified condition is met,
should the facets removed be those matching facets/facets_regex
(FALSE, the default), or those not matching (TRUE).
Details
Facet removal occurs when the specified condition(s)
on the split(s) and or value(s) are met within at least one
of the split_context rows indicated by ancestor_pos; otherwise
the set of facets is returned unchanged.
If facet removal is performed, either all facets which match facets (or
facets_regex will be removed ( the default keep_matches == FALSE
case), or all non-matching facets will be removed (when
keep_matches_only == TRUE).
Value
a function suitable for use in make_split_fun's
post argument which encodes the specified condition.
Note
A degenerate table is likely to be returned if all facets are removed.
Examples
rm_a_from_placebo <- cond_rm_facets(
facets = "A",
ancestor_pos = NA,
value_regex = "Placeb",
split = "ARM"
)
mysplit <- make_split_fun(post = list(rm_a_from_placebo))
lyt <- basic_table() |>
split_cols_by("ARM") |>
split_cols_by("STRATA1", split_fun = mysplit) |>
analyze("AGE", mean, format = "xx.x")
build_table(lyt, ex_adsl)
rm_bc_from_combo <- cond_rm_facets(
facets = c("B", "C"),
ancestor_pos = -1,
value_regex = "Combi"
)
mysplit2 <- make_split_fun(post = list(rm_bc_from_combo))
lyt2 <- basic_table() |>
split_cols_by("ARM") |>
split_cols_by("STRATA1", split_fun = mysplit2) |>
analyze("AGE", mean, format = "xx.x")
tbl2 <- build_table(lyt2, ex_adsl)
tbl2
rm_bc_from_combo2 <- cond_rm_facets(
facets_regex = "^A$",
ancestor_pos = -1,
value_regex = "Combi",
keep_matches = TRUE
)
mysplit3 <- make_split_fun(post = list(rm_bc_from_combo2))
lyt3 <- basic_table() |>
split_cols_by("ARM") |>
split_cols_by("STRATA1", split_fun = mysplit3) |>
analyze("AGE", mean, format = "xx.x")
tbl3 <- build_table(lyt3, ex_adsl)
stopifnot(identical(cell_values(tbl2), cell_values(tbl3)))
Formatting count and fraction values
Description
Formats a count together with fraction (and/or denominator) with special
consideration when count is 0, or fraction is 1.
See also: tern::format_count_fraction_fixed_dp()
Usage
jjcsformat_count_fraction(x, d = 1, roundmethod = c("sas", "iec"), ...)
Arguments
x
numeric
with elements num and fraction or num, denom and fraction.
d
numeric(1). Number of digits to round fraction to (default=1)
roundmethod
(string)
choice of rounding methods. Options are:
-
sas: the underlying rounding method istidytlg::roundSAS, where
roundSAS comes from this Stack Overflow post https://stackoverflow.com/questions/12688717/round-up-from-5 -
iec: the underlying rounding method isround
...
Additional arguments passed to other methods.
Value
A string in the format count / denom (ratio percent). If count
is 0, the format is 0. If fraction is >0.99, the format is
count / denom (>99.9 percent)
See Also
Other JJCS formats:
format_xx_fct(),
jjcsformat_pval_fct(),
jjcsformat_range_fct()
Examples
jjcsformat_count_fraction(c(7, 0.7))
jjcsformat_count_fraction(c(70000, 0.9999999))
jjcsformat_count_fraction(c(70000, 1))
Count Pruner
Description
This is a pruning constructor function which identifies records to be pruned based on the count (assumed to be the first statistic displayed when a compound statistic (e.g., ## / ## (XX.X percent) is presented).
Usage
count_pruner(
count = 0,
cat_include = NULL,
cat_exclude = NULL,
cols = c("TRT01A")
)
Arguments
count
count threshold. Function will keep all records strictly greater than this threshold.
cat_include
Category to be considered for pruning
cat_exclude
logical Category to be excluded from pruning
cols
column path (character or integer (column indices))
Value
function that can be utilized as pruning function in prune_table
Examples
ADSL <- data.frame(
USUBJID = c(
"XXXXX01", "XXXXX02", "XXXXX03", "XXXXX04", "XXXXX05",
"XXXXX06", "XXXXX07", "XXXXX08", "XXXXX09", "XXXXX10"
),
TRT01P = factor(
c(
"ARMA", "ARMB", "ARMA", "ARMB", "ARMB",
"Placebo", "Placebo", "Placebo", "ARMA", "ARMB"
)
),
FASFL = c("Y", "Y", "Y", "Y", "N", "Y", "Y", "Y", "Y", "Y"),
SAFFL = c("N", "N", "N", "N", "N", "N", "N", "N", "N", "N"),
PKFL = c("N", "N", "N", "N", "N", "N", "N", "N", "N", "N")
)
lyt <- basic_table() |>
split_cols_by("TRT01P") |>
add_overall_col("Total") |>
analyze("FASFL",
var_labels = "Analysis set:",
afun = a_freq_j,
extra_args = list(label = "Full", val = "Y"),
show_labels = "visible"
) |>
analyze("SAFFL",
var_labels = "Analysis set:",
afun = a_freq_j,
extra_args = list(label = "Safety", val = "Y"),
show_labels = "visible"
) |>
analyze("PKFL",
var_labels = "Analysis set:",
afun = a_freq_j,
extra_args = list(label = "PK", val = "Y"),
show_labels = "visible"
)
result <- build_table(lyt, ADSL)
result
result <- prune_table(
result,
prune_func = count_pruner(cat_exclude = c("Safety"), cols = "Total")
)
result
Workaround statistics function to add HR with CI
Description
This is a workaround for tern::s_coxph_pairwise() , which adds a statistic
containing the hazard ratio estimate together with the confidence interval.
Usage
a_coxph_hr(
df,
.var,
ref_path,
.spl_context,
...,
.stats = NULL,
.formats = NULL,
.labels = NULL,
.indent_mods = NULL
)
s_coxph_hr(
df,
.ref_group,
.in_ref_col,
.var,
is_event,
strata = NULL,
control = control_coxph(),
alternative = c("two.sided", "less", "greater")
)
Arguments
df
(data.frame)
data set containing all analysis variables.
.var
(string)
single variable name that is passed by rtables when requested
by a statistics function.
ref_path
(character)
global reference group specification, see get_ref_info() .
.spl_context
(data.frame)
gives information about ancestor split states
that is passed by rtables.
...
additional arguments for the lower level functions.
.stats
(character)
statistics to select for the table.
.formats
(named character or list)
formats for the statistics. See Details in analyze_vars for more
information on the 'auto' setting.
.labels
(named character)
labels for the statistics (without indent).
.indent_mods
(named integer)
indent modifiers for the labels. Defaults to 0, which corresponds to the
unmodified default behavior. Can be negative.
.ref_group
(data.frame or vector)
the data corresponding to the reference group.
.in_ref_col
(logical)
TRUE when working with the reference level, FALSE otherwise.
is_event
(character)
variable name storing Logical values: TRUE if event,
FALSE if time to event is censored.
strata
(character or NULL)
variable names indicating stratification factors.
control
(list)
relevant list of control options.
alternative
(string)
whether two.sided, or one-sided less or greater p-value
should be displayed.
Value
for s_coxph_hr a list containing the same statistics returned by tern::s_coxph_pairwise
and the additional lr_stat_df statistic. for a_coxph_hr, a VerticalRowsSection
object.
Functions
-
a_coxph_hr(): Formatted analysis function which is used asafun. -
s_coxph_hr(): Statistics function forked fromtern::s_coxph_pairwise(). the difference is that:It returns the additional statistic
lr_stat_df(log rank statistic with degrees of freedom).
Examples
library(dplyr)
adtte_f <- tern::tern_ex_adtte |>
filter(PARAMCD == "OS") |>
mutate(is_event = CNSR == 0)
df <- adtte_f |> filter(ARMCD == "ARM A")
df_ref_group <- adtte_f |> filter(ARMCD == "ARM B")
basic_table() |>
split_cols_by(var = "ARMCD", ref_group = "ARM A") |>
add_colcounts() |>
analyze("AVAL",
afun = s_coxph_hr,
extra_args = list(is_event = "is_event"),
var_labels = "Unstratified Analysis",
show_labels = "visible"
) |>
build_table(df = adtte_f)
basic_table() |>
split_cols_by(var = "ARMCD", ref_group = "ARM A") |>
add_colcounts() |>
analyze("AVAL",
afun = s_coxph_hr,
extra_args = list(
is_event = "is_event",
strata = "SEX",
control = tern::control_coxph(pval_method = "wald")
),
var_labels = "Unstratified Analysis",
show_labels = "visible"
) |>
build_table(df = adtte_f)
adtte_f <- tern::tern_ex_adtte |>
dplyr::filter(PARAMCD == "OS") |>
dplyr::mutate(is_event = CNSR == 0)
df <- adtte_f |> dplyr::filter(ARMCD == "ARM A")
df_ref <- adtte_f |> dplyr::filter(ARMCD == "ARM B")
s_coxph_hr(
df = df,
.ref_group = df_ref,
.in_ref_col = FALSE,
.var = "AVAL",
is_event = "is_event",
strata = NULL
)
Creation of Column Spanning Mapping Dataframe
Description
A function used for creating a data frame containing the map that is compatible with rtables split function
trim_levels_to_map
Usage
create_colspan_map(
df,
non_active_grp = c("Placebo"),
non_active_grp_span_lbl = " ",
active_grp_span_lbl = "Active Study Agent",
colspan_var = "colspan_trt",
trt_var = "TRT01A",
active_first = TRUE
)
Arguments
df
The name of the data frame in which the spanning variable is to be appended to
non_active_grp
The value(s) of the treatments that represent the non-active or comparator treatment groups default value = c('Placebo')
non_active_grp_span_lbl
The assigned value of the spanning variable for the non-active or comparator treatment groups default value = ”
active_grp_span_lbl
The assigned value of the spanning variable for the active treatment group(s) default value = 'Active Study Agent'
colspan_var
The desired name of the newly created spanning variable default value = 'colspan_trt'
trt_var
The name of the treatment variable that is used to determine which spanning treatment group value to apply. default value = 'TRT01A'
active_first
whether the active columns come first.
Details
This function creates a data frame containing the map that is compatible with rtables split function
trim_levels_to_map.
The levels of the specified trt_var variable will be stored within the trt_var variable
and the colspan_var variable will contain the corresponding spanning header value for each treatment group.
Value
a data frame that contains the map to be used with rtables split function trim_levels_to_map
Examples
library(tibble)
df <- tribble(
~TRT01A,
"Placebo",
"Active 1",
"Active 2"
)
df$TRT01A <- factor(df$TRT01A, levels = c("Placebo", "Active 1", "Active 2"))
colspan_map <- create_colspan_map(
df = df,
non_active_grp = c("Placebo"),
non_active_grp_span_lbl = " ",
active_grp_span_lbl = "Active Study Agent",
colspan_var = "colspan_trt",
trt_var = "TRT01A"
)
colspan_map
Creation of Column Spanning Variables
Description
A function used for creating a spanning variable for treatment groups
Usage
create_colspan_var(
df,
non_active_grp = c("Placebo"),
non_active_grp_span_lbl = " ",
active_grp_span_lbl = "Active Study Agent",
colspan_var = "colspan_trt",
trt_var = "TRT01A"
)
Arguments
df
The name of the data frame in which the spanning variable is to be appended to
non_active_grp
The value(s) of the treatments that represent the non-active or comparator treatment groups default value = c('Placebo')
non_active_grp_span_lbl
The assigned value of the spanning variable for the non-active or comparator treatment groups default value = ”
active_grp_span_lbl
The assigned value of the spanning variable for the active treatment group(s) default value = 'Active Study Agent'
colspan_var
The desired name of the newly created spanning variable default value = 'colspan_trt'
trt_var
The name of the treatment variable that is used to determine which spanning treatment group value to apply. default value = 'TRT01A'
Details
This function creates a spanning variable for treatment groups that is intended to be used within the column space.
Value
a data frame that contains the new variable as specified in colspan_var
Examples
library(tibble)
df <- tribble(
~TRT01A,
"Placebo",
"Active 1",
"Active 2"
)
df$TRT01A <- factor(df$TRT01A, levels = c("Placebo", "Active 1", "Active 2"))
colspan_var <- create_colspan_var(
df = df,
non_active_grp = c("Placebo"),
non_active_grp_span_lbl = " ",
active_grp_span_lbl = "Active Treatment",
colspan_var = "colspan_trt",
trt_var = "TRT01A"
)
colspan_var
Description of the difference test between two proportions
Description
This is an auxiliary function that describes the analysis in s_test_proportion_diff.
Usage
d_test_proportion_diff_j(method, alternative)
Arguments
method
(string)
one of chisq, cmh, fisher; specifies the test used
to calculate the p-value.
alternative
(string)
whether two.sided, or one-sided less or greater p-value
should be displayed.
Value
A string describing the test from which the p-value is derived.
Get default statistical methods and their associated formats, labels, and indent modifiers
Description
Utility functions to get valid statistic methods for different method groups
(.stats) and their associated formats (.formats), labels (.labels), and indent modifiers
(.indent_mods). This utility is used across junco, but some of its working principles can be
seen in tern::analyze_vars() . See notes to understand why this is experimental.
Usage
junco_get_stats(
method_groups = "analyze_vars_numeric",
stats_in = NULL,
custom_stats_in = NULL,
add_pval = FALSE
)
junco_get_formats_from_stats(stats, formats_in = NULL, levels_per_stats = NULL)
junco_get_labels_from_stats(
stats,
labels_in = NULL,
levels_per_stats = NULL,
label_attr_from_stats = NULL
)
get_label_attr_from_stats(x_stats)
junco_get_indents_from_stats(stats, indents_in = NULL, levels_per_stats = NULL)
format_stats(
x_stats,
method_groups,
stats_in,
formats_in,
labels_in,
indents_in
)
junco_default_stats
junco_default_formats
junco_default_labels
junco_default_indents
Arguments
method_groups
(character)
indicates the statistical method group (junco analyze function)
to retrieve default statistics for. A character vector can be used to specify more than one statistical
method group.
stats_in
(character)
statistics to retrieve for the selected method group. If custom statistical
functions are used, stats_in needs to have them in too.
custom_stats_in
(character)
custom statistics to add to the default statistics.
add_pval
(flag)
should 'pval' (or 'pval_counts' if method_groups contains
'analyze_vars_counts') be added to the statistical methods?
stats
(character)
statistical methods to return defaults for.
formats_in
(named vector)
custom formats to use instead of defaults. Can be a character vector with
values from formatters::list_valid_format_labels() or custom format functions. Defaults to NULL for any rows
with no value is provided.
levels_per_stats
(named list of character or NULL)
named list where the name of each element is a
statistic from stats and each element is the levels of a factor or character variable (or variable name),
each corresponding to a single row, for which the named statistic should be calculated for. If a statistic is only
calculated once (one row), the element can be either NULL or the name of the statistic. Each list element will be
flattened such that the names of the list elements returned by the function have the format statistic.level (or
just statistic for statistics calculated for a single row). Defaults to NULL.
labels_in
(named character)
custom labels to use instead of defaults. If no value is provided, the
variable level (if rows correspond to levels of a variable) or statistic name will be used as label.
label_attr_from_stats
(named list)
if labels_in = NULL, then this will be used instead. It is a list
of values defined in statistical functions as default labels. Values are ignored if labels_in is provided or ''
values are provided.
x_stats
(list)
with the statistics results.
indents_in
(named integer)
custom row indent modifiers to use instead of defaults. Defaults to 0L for
all values.
Format
-
junco_default_statsis a named list of available statistics, with each element named for their corresponding statistical method group.
-
junco_default_formatsis a named vector of available default formats, with each element named for their corresponding statistic.
-
junco_default_labelsis a namedcharactervector of available default labels, with each element named for their corresponding statistic.
-
junco_default_indentsis a namedintegervector of available default indents, with each element named for their corresponding statistic. Only indentations different from zero need to be recorded here.
Details
Current choices for type are counts and numeric for tern::analyze_vars() and affect junco_get_stats().
Value
-
junco_get_stats()returns acharactervector of statistical methods.
-
junco_get_formats_from_stats()returns a named list of formats as strings or functions.
-
junco_get_labels_from_stats()returns a named list of labels as strings.
-
junco_get_indents_from_stats()returns a named list of indentation modifiers as integers. By default all of the indentations will be zero.
-
format_stats()returns the correspondingly formattedrtables::in_rows()result.
Functions
-
junco_get_stats(): Get statistics available for a given method group (analyze function). To check available defaults seejunco_default_statslist. -
junco_get_formats_from_stats(): Get formats corresponding to a list of statistics. To check available defaults see listjunco_default_formats. -
junco_get_labels_from_stats(): Get labels corresponding to a list of statistics. To check for available defaults see listjunco_default_labels. -
get_label_attr_from_stats(): Get label attributes from statistics list. -
junco_get_indents_from_stats(): Get row indent modifiers corresponding to a list of statistics/rows. -
format_stats(): Format statistics results according to format specifications. -
junco_default_stats: Named list of available statistics by method group forjunco. -
junco_default_formats: Named vector of default formats forjunco. -
junco_default_labels: Namedcharactervector of default labels forjunco. -
junco_default_indents: Namedintegervector of default indents forjunco.
Note
These defaults are experimental because we use the names of functions to retrieve the default statistics. This should be generalized in groups of methods according to more reasonable groupings.
These functions have been modified from the tern file utils_default_stats_formats_labels.R.
This file contains junco specific wrappers of functions called within the afun functions,
in order to point to junco specific default statistics, formats and labels.
Formats in tern or junco and rtables can be functions that take in the table cell value and
return a string. This is well documented in vignette('custom_appearance', package = 'rtables').
Default String Mapping for Special Characters
Description
A tibble that maps special characters to their UTF-8 equivalents for use in RTF output. Currently it maps ">=" and "<=" to the Unicode characters.
Usage
default_str_map
Format
An object of class tbl_df (inherits from tbl, data.frame) with 2 rows and 2 columns.
Value
A tibble with columns 'pattern' and 'value', where 'pattern' contains the string to be replaced and 'value' contains the replacement.
Workaround statistics function to time point survival estimate with CI
Description
This is a workaround for tern::s_surv_timepoint() , which adds a statistic
containing the time point specific survival estimate together with the
confidence interval.
Usage
a_event_free(
df,
.var,
...,
.stats = NULL,
.formats = NULL,
.labels = NULL,
.indent_mods = NULL
)
s_event_free(
df,
.var,
time_point,
time_unit,
is_event,
percent = FALSE,
control = control_surv_timepoint()
)
Arguments
df
(data.frame)
data set containing all analysis variables.
.var
(string)
single variable name that is passed by rtables when requested
by a statistics function.
...
additional arguments for the lower level functions.
.stats
(character)
statistics to select for the table.
.formats
(named character or list)
formats for the statistics. See Details in analyze_vars for more
information on the 'auto' setting.
.labels
(named character)
labels for the statistics (without indent).
.indent_mods
(named integer)
indent modifiers for the labels. Defaults to 0, which corresponds to the
unmodified default behavior. Can be negative.
time_point
(numeric)
time point at which to estimate survival.
time_unit
(string)
unit of time for the time point.
is_event
(character)
variable name storing Logical values: TRUE if event,
FALSE if time to event is censored.
percent
(flag)
whether to return in percent or not.
control
(list)
relevant list of control options.
Value
for s_event_free, a list as returned by the tern::s_surv_timepoint()
with an additional three-dimensional statistic event_free_ci which
combines the event_free_rate and rate_ci statistics.
For a_event_free, analogous to tern::a_surv_timepoint but with the additional
three-dimensional statistic described above available via .stats.
Functions
-
a_event_free(): Formatted analysis function which is used asafun. -
s_event_free(): Statistics function which works liketern::s_surv_timepoint(), the difference is that it returns the additional statisticevent_free_ci.
Examples
adtte_f <- tern::tern_ex_adtte |>
dplyr::filter(PARAMCD == "OS") |>
dplyr::mutate(
AVAL = tern::day2month(AVAL),
is_event = CNSR == 0
)
basic_table() |>
split_cols_by(var = "ARMCD") |>
analyze(
vars = "AVAL",
afun = a_event_free,
show_labels = "hidden",
na_str = tern::default_na_str(),
extra_args = list(
time_unit = "week",
time_point = 3,
is_event = "is_event"
)
) |>
build_table(df = adtte_f)
adtte_f <- tern::tern_ex_adtte |>
dplyr::filter(PARAMCD == "OS") |>
dplyr::mutate(
AVAL = tern::day2month(AVAL),
is_event = CNSR == 0
)
s_event_free(
df = adtte_f,
.var = "AVAL",
time_point = 6,
is_event = "is_event",
time_unit = "month"
)
Helper for Finding AVISIT after which CHG are all Missing
Description
Helper for Finding AVISIT after which CHG are all Missing
Usage
find_missing_chg_after_avisit(df)
Arguments
df
(data.frame)
with CHG and AVISIT variables.
Value
A string with either the factor level after which AVISIT is all missing,
or NA.
Examples
df <- data.frame(
AVISIT = factor(c(1, 2, 3, 4, 5)),
CHG = c(5, NA, NA, NA, 3)
)
find_missing_chg_after_avisit(df)
df2 <- data.frame(
AVISIT = factor(c(1, 2, 3, 4, 5)),
CHG = c(5, NA, 3, NA, NA)
)
find_missing_chg_after_avisit(df2)
df3 <- data.frame(
AVISIT = factor(c(1, 2, 3, 4, 5)),
CHG = c(NA, NA, NA, NA, NA)
)
find_missing_chg_after_avisit(df3)
ANCOVA Analysis
Description
Does the ANCOVA analysis, separately for each visit.
Usage
fit_ancova(
vars = list(response = "AVAL", covariates = c(), arm = "ARM", visit = "AVISIT", id =
"USUBJID"),
data,
conf_level = 0.95,
weights_emmeans = "proportional"
)
Arguments
vars
(named list of string or character)
specifying the variables in the ANCOVA analysis.
The following elements need to be included as character vectors and match corresponding columns
in data:
-
response: the response variable. -
covariates: the additional covariate terms (might also include interactions). -
id: the subject ID variable (not really needed for the computations but for internal logistics). -
arm: the treatment group variable (factor). -
visit: the visit variable (factor).
Note that the arm variable is by default included in the model, thus should not be part of covariates.
data
(data.frame)
with all the variables specified in
vars. Records with missing values in any independent variables
will be excluded.
conf_level
(proportion)
confidence level of the interval.
weights_emmeans
(string)
argument from emmeans::emmeans() , 'counterfactual' by default.
Value
A tern_model object which is a list with model results:
-
fit: A list with a fittedstats::lm()result for each visit. -
mse: Mean squared error, i.e. variance estimate, for each visit. -
df: Degrees of freedom for the variance estimate for each visit. -
lsmeans: This is a list with data framesestimatesandcontrasts. The attributeweightssavse the settings used (weights_emmeans). -
vars: The variable list. -
labels: Corresponding list with variable labels extracted fromdata. -
ref_level: The reference level for the arm variable, which is always the first level. -
treatment_levels: The treatment levels for the arm variable. -
conf_level: The confidence level which was used to construct thelsmeansconfidence intervals.
Examples
library(mmrm)
fit <- fit_ancova(
vars = list(
response = "FEV1",
covariates = c("RACE", "SEX"),
arm = "ARMCD",
id = "USUBJID",
visit = "AVISIT"
),
data = fev_data,
conf_level = 0.9,
weights_emmeans = "equal"
)
MMRM Analysis
Description
Does the MMRM analysis. Multiple other functions can be called on the result to produce
tables and graphs.
Usage
fit_mmrm_j(
vars = list(response = "AVAL", covariates = c(), id = "USUBJID", arm = "ARM", visit =
"AVISIT"),
data,
conf_level = 0.95,
cor_struct = "unstructured",
weights_emmeans = "counterfactual",
averages_emmeans = list(),
...
)
Arguments
vars
(named list of string or character)
specifying the variables in the MMRM.
The following elements need to be included as character vectors and match corresponding columns
in data:
-
response: the response variable. -
covariates: the additional covariate terms (might also include interactions). -
id: the subject ID variable. -
arm: the treatment group variable (factor). -
visit: the visit variable (factor). -
weights: optional weights variable (ifNULLor omitted then no weights will be used).
Note that the main effects and interaction of arm and visit are by default
included in the model.
data
(data.frame)
with all the variables specified in
vars. Records with missing values in any independent variables
will be excluded.
conf_level
(proportion)
confidence level of the interval.
cor_struct
(string)
specifying the covariance structure, defaults to
'unstructured'. See the details.
weights_emmeans
(string)
argument from emmeans::emmeans() , 'counterfactual' by default.
averages_emmeans
(list)
optional named list of visit levels which should be averaged
and reported along side the single visits.
...
additional arguments for mmrm::mmrm() , in particular reml and options listed in
mmrm::mmrm_control() .
Details
Multiple different degree of freedom adjustments are available via the method argument
for mmrm::mmrm() . In addition, covariance matrix adjustments are available via vcov.
Please see mmrm::mmrm_control() for details and additional useful options.
For the covariance structure (cor_struct), the user can choose among the following options.
-
unstructured: Unstructured covariance matrix. This is the most flexible choice and default. If there areTvisits, thenT * (T+1) / 2variance parameters are used. -
toeplitz: Homogeneous Toeplitz covariance matrix, which usesTvariance parameters. -
heterogeneous toeplitz: Heterogeneous Toeplitz covariance matrix, which uses2 * T - 1variance parameters. -
ante-dependence: Homogeneous Ante-Dependence covariance matrix, which usesTvariance parameters. -
heterogeneous ante-dependence: Heterogeneous Ante-Dependence covariance matrix, which uses2 * T - 1variance parameters. -
auto-regressive: Homogeneous Auto-Regressive (order 1) covariance matrix, which uses 2 variance parameters. -
heterogeneous auto-regressive: Heterogeneous Auto-Regressive (order 1) covariance matrix, which usesT + 1variance parameters. -
compound symmetry: Homogeneous Compound Symmetry covariance matrix, which uses 2 variance parameters. -
heterogeneous compound symmetry: Heterogeneous Compound Symmetry covariance matrix, which usesT + 1variance parameters.
Value
A tern_model object which is a list with model results:
-
fit: Themmrmobject which was fitted to the data. Note that viammrm::component(fit, 'optimizer')the finally used optimization algorithm can be obtained, which can be useful for refitting the model later on. -
cov_estimate: The matrix with the covariance matrix estimate. -
diagnostics: A list with model diagnostic statistics (REML criterion, AIC, corrected AIC, BIC). -
lsmeans: This is a list with data framesestimatesandcontrasts. The attributesaveragesandweightssave the settings used (averages_emmeansandweights_emmeans). -
vars: The variable list. -
labels: Corresponding list with variable labels extracted fromdata. -
cor_struct: input. -
ref_level: The reference level for the arm variable, which is always the first level. -
treatment_levels: The treatment levels for the arm variable. -
conf_level: The confidence level which was used to construct thelsmeansconfidence intervals. -
additional: List with any additional inputs passed via...
Note
This function has the _j suffix to distinguish it from mmrm::fit_mmrm() .
It is a copy from the tern.mmrm package and later will be replaced by tern.mmrm::fit_mmrm().
No new features are included in this function here.
Examples
mmrm_results <- fit_mmrm_j(
vars = list(
response = "FEV1",
covariates = c("RACE", "SEX"),
id = "USUBJID",
arm = "ARMCD",
visit = "AVISIT"
),
data = mmrm::fev_data,
cor_struct = "unstructured",
weights_emmeans = "equal",
averages_emmeans = list(
"VIS1+2" = c("VIS1", "VIS2")
)
)
Function factory for xx style formatting
Description
A function factory to generate formatting functions for value formatting that support the xx style format and control the rounding method
Usage
format_xx_fct(
roundmethod = c("sas", "iec"),
na_str_dflt = "NE",
replace_na_dflt = TRUE
)
Arguments
roundmethod
(string)
choice of rounding methods. Options are:
-
sas: the underlying rounding method istidytlg::roundSAS, where
roundSAS comes from this Stack Overflow post https://stackoverflow.com/questions/12688717/round-up-from-5 -
iec: the underlying rounding method isround
na_str_dflt
Character to represent NA value
replace_na_dflt
logical(1). Should an na_string of "NA" within
the formatters framework be overridden by na_str_default? Defaults to
TRUE, as a way to have a different default na string behavior from the
base formatters framework.
Value
format_xx_fct() format function that can be used in rtables formatting calls
See Also
Other JJCS formats:
count_fraction ,
jjcsformat_pval_fct(),
jjcsformat_range_fct()
Examples
jjcsformat_xx_SAS <- format_xx_fct(roundmethod = "sas")
jjcsformat_xx <- jjcsformat_xx_SAS
rcell(c(1.453), jjcsformat_xx("xx.xx"))
rcell(c(), jjcsformat_xx("xx.xx"))
rcell(c(1.453, 2.45638), jjcsformat_xx("xx.xx (xx.xxx)"))
Get Control Subset
Description
Retrieves a subset of the DataFrame based on treatment variable and control group.
Usage
get_ctrl_subset(df, trt_var, ctrl_grp)
Arguments
df
Data frame to subset.
trt_var
Treatment variable name.
ctrl_grp
Control group value.
Value
Subset of the data frame.
Extract Least Square Means from MMRM
Description
Extracts the least square means from an MMRM fit.
Usage
get_mmrm_lsmeans(fit, vars, conf_level, weights, averages = list())
Arguments
fit
(mmrm)
result of mmrm::mmrm() .
vars
(named list of string or character)
specifying the variables in the MMRM.
The following elements need to be included as character vectors and match corresponding columns
in data:
-
response: the response variable. -
covariates: the additional covariate terms (might also include interactions). -
id: the subject ID variable. -
arm: the treatment group variable (factor). -
visit: the visit variable (factor). -
weights: optional weights variable (ifNULLor omitted then no weights will be used).
Note that the main effects and interaction of arm and visit are by default
included in the model.
conf_level
(proportion)
confidence level of the interval.
weights
(string)
type of weights to be used for the least square means,
see emmeans::emmeans() for details.
averages
(list)
named list of visit levels which should be averaged
and reported along side the single visits.
Value
A list with data frames estimates and contrasts.
The attributes averages and weights save the settings used.
Obtain Reference Information for a Global Reference Group
Description
This helper function can be used in custom analysis functions, by passing
an extra argument ref_path which defines a global reference group by
the corresponding column split hierarchy levels.
Usage
get_ref_info(ref_path, .spl_context, .var = NULL)
Arguments
ref_path
(character)
reference group specification as an rtables
colpath, see details.
.spl_context
see rtables::spl_context.
.var
the variable being analyzed, see rtables::additional_fun_params.
Details
The reference group is specified in colpath hierarchical fashion in ref_path:
The first column split variable is the first element, and the level to use is the
second element. It continues until the last column split variable with last
level to use.
Note that depending on .var, either a data.frame (if .var is NULL) or
a vector (otherwise) is returned. This allows usage for analysis functions with
df and x arguments, respectively.
Value
A list with ref_group and in_ref_col, which can be used as
.ref_group and .in_ref_col as if being directly passed to an analysis
function by rtables, see rtables::additional_fun_params.
Examples
dm <- DM
dm$colspan_trt <- factor(
ifelse(dm$ARM == "B: Placebo", " ", "Active Study Agent"),
levels = c("Active Study Agent", " ")
)
colspan_trt_map <- create_colspan_map(
dm,
non_active_grp = "B: Placebo",
non_active_grp_span_lbl = " ",
active_grp_span_lbl = "Active Study Agent",
colspan_var = "colspan_trt",
trt_var = "ARM"
)
standard_afun <- function(x, .ref_group, .in_ref_col) {
in_rows(
"Difference of Averages" = non_ref_rcell(
mean(x) - mean(.ref_group),
is_ref = .in_ref_col,
format = "xx.xx"
)
)
}
result_afun <- function(x, ref_path, .spl_context, .var) {
ref <- get_ref_info(ref_path, .spl_context, .var)
standard_afun(x, .ref_group = ref$ref_group, .in_ref_col = ref$in_ref_col)
}
ref_path <- c("colspan_trt", " ", "ARM", "B: Placebo")
lyt <- basic_table() |>
split_cols_by(
"colspan_trt",
split_fun = trim_levels_to_map(map = colspan_trt_map)
) |>
split_cols_by("ARM") |>
analyze(
"AGE",
extra_args = list(ref_path = ref_path),
afun = result_afun
)
build_table(lyt, dm)
Get Titles/Footers For Table From Sources
Description
Retrieves the titles and footnotes for a given table from a CSV/XLSX file or a data.frame.
Usage
get_titles_from_file(
id,
file = .find_titles_file(input_path),
input_path = ".",
title_df = .read_titles_file(file)
)
Arguments
id
character. The identifier for the table of interest.
file
(character(1))
A path to CSV or xlsx file containing title
and footer information for one or more outputs. See Details. Ignored if
title_df is specified.
input_path
(character(1))
A path to look for
titles.csv/titles.xlsx. Ignored if file or title_df is specified.
title_df
(data.frame)
A data.frame containing titles and footers for
one or more outputs. See Details.
Details
Retrieves the titles for a given output id (see below) and outputs
a list containing the title and footnote objects supported by
rtables. Both titles.csv and titles.xlsx (if readxl is
installed) files are supported, with titles.csv being checked
first.
Data is expected to have `TABLE ID`, `IDENTIFIER`, and `TEXT` columns, where `IDENTIFIER` has the value `TITLE` for a title and `FOOT*` for footer materials where `*` is a positive integer. `TEXT` contains the value of the title/footer to be applied.
Value
List object containing: title, subtitles, main_footer, prov_footer
for the table of interest. Note: the subtitles and prov_footer are
currently set to NULL. Suitable for use with set_titles() .
See Also
Used in all template script
Get Visit Levels in Order Defined by Numeric Version
Description
Get Visit Levels in Order Defined by Numeric Version
Usage
get_visit_levels(visit_cat, visit_n)
Arguments
visit_cat
(character)
the categorical version.
visit_n
(numeric)
the numeric version.
Value
The unique visit levels in the order defined by the numeric version.
Examples
get_visit_levels(
visit_cat = c("Week 1", "Week 11", "Week 2"),
visit_n = c(1, 5, 2)
)
A Frequency Data Preparation Function
Description
Prepares frequency data for analysis.
Usage
h_a_freq_dataprep(
df,
labelstr = NULL,
.var = NA,
val = NULL,
drop_levels = FALSE,
excl_levels = NULL,
new_levels = NULL,
new_levels_after = FALSE,
addstr2levs = NULL,
.df_row,
.spl_context,
.N_col,
id = "USUBJID",
denom = c("N_col", "n_df", "n_altdf", "N_colgroup", "n_rowdf", "n_parentdf"),
variables,
label = NULL,
label_fstr = NULL,
label_map = NULL,
.alt_df_full = NULL,
denom_by = NULL,
.stats
)
Arguments
df
Data frame to prepare.
labelstr
Label string.
.var
Variable name.
val
Values for analysis.
drop_levels
Boolean, indicating if levels should be dropped.
excl_levels
Levels to exclude.
new_levels
New levels to add.
new_levels_after
Boolean for adding new levels after existing ones.
addstr2levs
String to add to new levels.
.df_row
Current data frame row.
.spl_context
Current split context.
.N_col
Number of columns.
id
Identifier variable.
denom
Denominator types.
variables
Variables to include in the analysis.
label
Label string.
label_fstr
Formatted label string.
label_map
Mapping for labels.
.alt_df_full
Alternative full data frame.
denom_by
Denominator grouping variable.
.stats
Statistics to compute.
Value
List containing prepared data frames and values.
Frequency Preparation in Rows
Description
Prepares frequency data in rows based on provided parameters.
Usage
h_a_freq_prepinrows(
x_stats,
.stats_adj,
.formats,
labelstr,
label_fstr,
label,
.indent_mods,
.labels_n,
na_str
)
Arguments
x_stats
Statistics data.
.stats_adj
Adjusted statistics.
.formats
Format settings.
labelstr
Label string.
label_fstr
Formatted label string.
label
Label string.
.indent_mods
Indentation settings.
.labels_n
Labels for statistics.
na_str
String for NA values.
Value
List containing prepared statistics, formats, labels, and indentation.
Extract Substring from Column Expression
Description
Retrieves the substring from a column expression related to a variable component.
Usage
h_colexpr_substr(var, col_expr)
Arguments
var
Variable to extract from the expression.
col_expr
Column expression string.
Details
get substring from col_expr related to var component intended usage is on strings coming from .spl_context$cur_col_expr these strings are of type '!(is.na(var) & var %in% 'xxx') & !(is.na(var2) & var2 %in% 'xxx')'
Value
Substring corresponding to the variable.
Create Alternative Data Frame
Description
Creates an alternative data frame based on the current split context.
Usage
h_create_altdf(
.spl_context,
.df_row,
denomdf,
denom_by = NULL,
id,
variables,
denom
)
Arguments
.spl_context
Current split context.
.df_row
Current data frame row.
denomdf
Denominator data frame.
denom_by
Denominator grouping variable.
id
Identifier variable.
variables
Variables to include in the analysis.
denom
Denominator type.
Value
Grand parent dataset.
Get Denominator Parent Data Frame
Description
Retrieves the parent data frame based on denominator.
Usage
h_denom_parentdf(.spl_context, denom, denom_by)
Arguments
.spl_context
Current split context.
denom
Denominator type.
denom_by
Denominator grouping variable.
Value
Parent data frame.
Add New Levels to Data Frame
Description
Adds new factor levels to a specified variable in the data frame.
Usage
h_df_add_newlevels(df, .var, new_levels, addstr2levs = NULL, new_levels_after)
Arguments
df
Data frame to update.
.var
Variable to which new levels will be added.
new_levels
List of new levels to add.
addstr2levs
String to add to new levels.
new_levels_after
Boolean, indicating if new levels should be added after existing levels.
Value
Updated data frame.
Extract Estimates from Multivariate Cox Regression Model Fit Object
Description
Extract Estimates from Multivariate Cox Regression Model Fit Object
Usage
h_extract_coxreg_multivar(x)
Arguments
x
(coxreg.multivar)
from tern::fit_coxreg_multivar() .
Value
A data frame containing Cox regression results with columns for term, coef_se (coefficient and standard error), p.value, hr (hazard ratio), hr_ci (confidence interval for hazard ratio), and labels (formatted term labels).
Examples
anl <- tern::tern_ex_adtte |>
dplyr::mutate(EVENT = 1 - CNSR)
variables <- list(
time = "AVAL",
event = "EVENT",
arm = "ARM",
covariates = c("SEX", "AGE")
)
control <- tern::control_coxreg(
conf_level = 0.9,
ties = "efron"
)
fit <- tern::fit_coxreg_multivar(
data = anl,
variables = variables,
control = control
)
h_extract_coxreg_multivar(fit)
Extraction of Covariate Parts from Character Vector
Description
Extraction of Covariate Parts from Character Vector
Usage
h_get_covariate_parts(covariates)
Arguments
covariates
(character)
specification in the usual way, see examples.
Value
Character vector of the covariates involved in covariates specification.
Helper Function to Create Logical Design Matrix from Factor Variable
Description
Helper Function to Create Logical Design Matrix from Factor Variable
Usage
h_get_design_mat(df, .var)
Arguments
df
(data.frame)
including a factor variable with name in .var.
.var
(string)
name of the factor variable.
Value
The logical matrix with dummy encoding of all factor levels.
Examples
h_get_design_mat(df = data.frame(a = factor(c("a", "b", "a"))), .var = "a")
Get Label Map
Description
Maps labels based on the provided label map and split context.
Usage
h_get_label_map(.labels, label_map, .var, split_info)
Arguments
.labels
Current labels.
label_map
Mapping for labels.
.var
Variable name.
split_info
Current split information.
Value
Mapped labels.
Get Treatment Variable Reference Path
Description
Retrieves the treatment variable reference path from the provided context.
Usage
h_get_trtvar_refpath(ref_path, .spl_context, df)
Arguments
ref_path
Reference path for treatment variable.
.spl_context
Current split context.
df
Data frame.
Value
List containing treatment variable details.
Helper functions for odds ratio estimation
Description
Functions to calculate odds ratios in s_odds_ratio_j() .
Usage
or_glm_j(data, conf_level)
or_clogit_j(data, conf_level, method = "exact")
or_cmh(data, conf_level)
Arguments
data
(data.frame)
data frame containing at least the variables rsp and grp, and optionally
strata for or_clogit_j() .
conf_level
(numeric)
confidence level for the confidence interval.
method
(string)
whether to use the correct ('exact') calculation in the conditional likelihood or one
of the approximations, or the CMH method. See survival::clogit() for details.
Value
A named list of elements or_ci, n_tot and pval.
Functions
-
or_glm_j(): Estimates the odds ratio based onstats::glm(). Note that there must be exactly 2 groups indataas specified by thegrpvariable. -
or_clogit_j(): Estimates the odds ratio based onsurvival::clogit(). This is done for the whole data set including all groups, since the results are not the same as when doing pairwise comparisons between the groups. -
or_cmh(): Estimates the odds ratio based on CMH. Note that there must be exactly 2 groups indataas specified by thegrpvariable.
See Also
Examples
data <- data.frame(
rsp = as.logical(c(1, 1, 0, 1, 0, 0, 1, 1)),
grp = letters[c(1, 1, 1, 2, 2, 2, 1, 2)],
strata = letters[c(1, 2, 1, 2, 2, 2, 1, 2)],
stringsAsFactors = TRUE
)
or_glm_j(data, conf_level = 0.95)
data <- data.frame(
rsp = as.logical(c(1, 1, 0, 1, 0, 0, 1, 1, 0, 0, 1, 1, 0, 1, 0, 0, 1, 1, 0, 0)),
grp = letters[c(1, 1, 1, 2, 2, 2, 3, 3, 3, 3, 1, 1, 1, 2, 2, 2, 3, 3, 3, 3)],
strata = LETTERS[c(1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 2, 2, 2, 2, 2, 2, 2, 2, 2, 2)],
stringsAsFactors = TRUE
)
or_clogit_j(data, conf_level = 0.95)
set.seed(123)
data <- data.frame(
rsp = as.logical(rbinom(n = 40, size = 1, prob = 0.5)),
grp = letters[sample(1:2, size = 40, replace = TRUE)],
strata = LETTERS[sample(1:2, size = 40, replace = TRUE)],
stringsAsFactors = TRUE
)
or_cmh(data, conf_level = 0.95)
Helper functions to test proportion differences
Description
Helper functions to implement various tests on the difference between two proportions.
Usage
prop_chisq(tbl, alternative)
prop_cmh(ary, alternative)
prop_fisher(tbl, alternative)
Arguments
tbl
(matrix)
matrix with two groups in rows and the binary response (TRUE/FALSE) in columns.
ary
(array, 3 dimensions)
array with two groups in rows, the binary response
(TRUE/FALSE) in columns, and the strata in the third dimension.
Value
A p-value.
Functions
-
prop_chisq(): Performs Chi-Squared test. Internally callsstats::prop.test(). -
prop_cmh(): Performs stratified Cochran-Mantel-Haenszel test. Internally callsstats::mantelhaen.test(). -
prop_fisher(): Performs the Fisher's exact test. Internally callsstats::fisher.test().
Note
strata with less than five observations will result in a warning and possibly incorrect results; strata with less than two observations are automatically discarded.
See Also
prop_diff_test() for implementation of these helper functions.
Subset Combination
Description
Subsets a data frame based on specified combination criteria.
Usage
h_subset_combo(df, combosdf, do_not_filter, filter_var, flag_var, colid)
Arguments
df
Data frame to subset.
combosdf
Data frame containing combinations.
do_not_filter
Variables to not filter.
filter_var
Variable used for filtering.
flag_var
Flag variable for filtering.
colid
Column ID for identification.
Value
Subsetted data frame.
Helper Function to Fit the MMRM and Return LS Mean Estimates and Contrasts
Description
Helper Function to Fit the MMRM and Return LS Mean Estimates and Contrasts
Usage
h_summarize_mmrm(
.var,
df_parent,
variables,
ref_arm_level,
ref_visit_levels,
...
)
Arguments
.var
(string)
single variable name that is passed by rtables when requested
by a statistics function.
df_parent
(data.frame)
data set containing all analysis variables
from all visits and arms.
variables
(named list of string)
list of additional analysis variables.
ref_arm_level
(string)
the reference arm which should be compared
against.
ref_visit_levels
(character)
the reference visits which should not
be included in the model fit.
...
additional options passed to fit_mmrm_j() .
Value
The resulting estimates and contrasts LS means as returned by
tidy.tern_model() .
Update Data Frame Row
Description
Updates a row in the data frame based on various parameters.
Usage
h_upd_dfrow(
df_row,
.var,
val,
excl_levels,
drop_levels,
new_levels,
new_levels_after,
addstr2levs,
label,
label_map,
labelstr,
label_fstr,
.spl_context
)
Arguments
df_row
Data frame row to update.
.var
Variable name to update.
val
Values to keep.
excl_levels
Levels to exclude from the factor.
drop_levels
Boolean, indicating if levels should be dropped.
new_levels
New levels to add.
new_levels_after
Boolean, indicating if new levels should be added after existing levels.
addstr2levs
String to add to new levels.
label
Label string.
label_map
Mapping for labels.
labelstr
Label string to replace.
label_fstr
Format string for labels.
.spl_context
Current split context.
Value
List containing updated data frames and values.
Update Factor
Description
Updates a factor variable in a data frame based on specified values.
Usage
h_update_factor(df, .var, val = NULL, excl_levels = NULL)
Arguments
df
Data frame containing the variable to update.
.var
Variable name to update.
val
Values to keep.
excl_levels
Levels to exclude from the factor.
Value
Updated data frame.
Conversion of inches to spaces
Description
Conversion of inches to spaces
Usage
inches_to_spaces(ins, fontspec, raw = FALSE, tol = sqrt(.Machine$double.eps))
Arguments
ins
numeric. Vector of widths in inches
fontspec
font_spec. The font specification to use
raw
logical(1). Should the answer be returned unrounded
(TRUE), or rounded to the nearest reasonable value (FALSE,
the default)
tol
numeric(1). The numeric tolerance, values
between an integer n, and n+tol will be returned
as n, rather than n+1, if raw == FALSE. Ignored
when raw is TRUE.
Value
the number of either fractional (raw = TRUE) or whole (raw = FALSE)
spaces that will fit within ins inches in the specified font
Insertion of Blank Lines in a Layout
Description
This is a hack for rtables in order to be able to add row gaps,
i.e. blank lines.
In particular, by default this function needs to maintain a global state for avoiding
duplicate table names. The global state variable is hidden by using
a dot in front of its name. However, this likely won't work with parallelisation across
multiple threads and also causes non-reproducibility of the resulting rtables
object. Therefore also a custom table name can be used.
Usage
insert_blank_line(lyt, table_names = NULL)
Arguments
lyt
(layout)
input layout where analyses will be added to.
table_names
(character)
this can be customized in case that the same vars are analyzed multiple times,
to avoid warnings from rtables.
Value
The modified layout now including a blank line after the current row content.
Examples
ADSL <- ex_adsl
lyt <- basic_table() |>
split_cols_by("ARM") |>
split_rows_by("STRATA1") |>
analyze(vars = "AGE", afun = function(x) {
in_rows(
"Mean (sd)" = rcell(c(mean(x), sd(x)), format = "xx.xx (xx.xx)")
)
}) |>
insert_blank_line() |>
analyze(vars = "AGE", table_names = "AGE_Range", afun = function(x) {
in_rows(
"Range" = rcell(range(x), format = "xx.xx - xx.xx")
)
})
build_table(lyt, ADSL)
Complex Scoring Function
Description
A function used for sorting AE tables (and others) as required.
Usage
jj_complex_scorefun(
spanningheadercolvar = "colspan_trt",
usefirstcol = FALSE,
colpath = NULL,
firstcat = NULL,
lastcat = NULL
)
Arguments
spanningheadercolvar
name of spanning header variable that defines the active treatment columns. If you do not have an active treatment spanning header column then user can define this as NA.
usefirstcol
This allows you to just use the first column of the table to sort on.
colpath
name of column path that is needed to sort by (default=NULL). This overrides other arguments if specified (except firstcat and lastcat which will be applied if requested on this colpath)
firstcat
If you wish to put any category at the top of the list despite any n's user can specify here.
lastcat
If you wish to put any category at the bottom of the list despite any n's user can specify here.
Details
This sort function sorts as follows: Takes all the columns from a specified spanning column header (default= colspan_trt) and sorts by the last treatment column within this. If no spanning column header variable exists (e.g you have only one active treatment arm and have decided to remove the spanning header from your layout) it will sort by the first treatment column in your table. This function is not really designed for tables that have sub-columns, however if users wish to override any default sorting behavior, they can simply specify their own colpath to use for sorting on (default=NULL)
Value
a function which can be used as a score function (scorefun in sort_at_path).
Examples
ADAE <- data.frame(
USUBJID = c(
"XXXXX01", "XXXXX02", "XXXXX03", "XXXXX04", "XXXXX05",
"XXXXX06", "XXXXX07", "XXXXX08", "XXXXX09", "XXXXX10"
),
AEBODSYS = c(
"SOC 1", "SOC 2", "SOC 1", "SOC 2", "SOC 2",
"SOC 2", "SOC 2", "SOC 1", "SOC 2", "SOC 1"
),
AEDECOD = c(
"Coded Term 2", "Coded Term 1", "Coded Term 3", "Coded Term 4",
"Coded Term 4", "Coded Term 4", "Coded Term 5", "Coded Term 3",
"Coded Term 1", "Coded Term 2"
),
TRT01A = c(
"ARMA", "ARMB", "ARMA", "ARMB", "ARMB",
"Placebo", "Placebo", "Placebo", "ARMA", "ARMB"
),
TRTEMFL = c("Y", "Y", "N", "Y", "Y", "Y", "Y", "N", "Y", "Y")
)
ADAE <- ADAE |>
dplyr::mutate(TRT01A = as.factor(TRT01A))
ADAE$colspan_trt <- factor(ifelse(ADAE$TRT01A == "Placebo", " ", "Active Study Agent"),
levels = c("Active Study Agent", " ")
)
ADAE$rrisk_header <- "Risk Difference (%) (95% CI)"
ADAE$rrisk_label <- paste(ADAE$TRT01A, paste("vs", "Placebo"))
colspan_trt_map <- create_colspan_map(ADAE,
non_active_grp = "Placebo",
non_active_grp_span_lbl = " ",
active_grp_span_lbl = "Active Study Agent",
colspan_var = "colspan_trt",
trt_var = "TRT01A"
)
ref_path <- c("colspan_trt", " ", "TRT01A", "Placebo")
lyt <- basic_table() |>
split_cols_by(
"colspan_trt",
split_fun = trim_levels_to_map(map = colspan_trt_map)
) |>
split_cols_by("TRT01A") |>
split_cols_by("rrisk_header", nested = FALSE) |>
split_cols_by(
"TRT01A",
labels_var = "rrisk_label",
split_fun = remove_split_levels("Placebo")
) |>
analyze(
"TRTEMFL",
a_freq_j,
show_labels = "hidden",
extra_args = list(
method = "wald",
label = "Subjects with >=1 AE",
ref_path = ref_path,
.stats = "count_unique_fraction"
)
) |>
split_rows_by("AEBODSYS",
split_label = "System Organ Class",
split_fun = trim_levels_in_group("AEDECOD"),
label_pos = "topleft",
section_div = c(" "),
nested = FALSE
) |>
summarize_row_groups(
"AEBODSYS",
cfun = a_freq_j,
extra_args = list(
method = "wald",
ref_path = ref_path,
.stats = "count_unique_fraction"
)
) |>
analyze(
"AEDECOD",
afun = a_freq_j,
extra_args = list(
method = "wald",
ref_path = ref_path,
.stats = "count_unique_fraction"
)
)
result <- build_table(lyt, ADAE)
result
result <- sort_at_path(
result,
c("root", "AEBODSYS"),
scorefun = jj_complex_scorefun()
)
result <- sort_at_path(
result,
c("root", "AEBODSYS", "*", "AEDECOD"),
scorefun = jj_complex_scorefun()
)
result
Unicode Mapping Table
Description
A tibble that maps special characters to their Unicode equivalents.
Usage
jj_uc_map
Format
A tibble with columns 'pattern' and 'unicode', where 'pattern' contains the string to be replaced and 'unicode' contains the Unicode code point in hexadecimal.
Numeric Formatting Function
Description
Formatting setter for selected numerical statistics
Usage
jjcs_num_formats(d, cap = 4)
Arguments
d
precision of individual values
cap
cap to numerical precision (d > cap – will use precision as if cap was specified as precision)
Value
list:
fmt : named vector with formatting function (jjcsformat_xx) for numerical stats: range, median, mean_sd, sd
spec : named vector with formatting specifications for numerical stats: range, median, mean_sd, sd
Examples
P1_precision <- jjcs_num_formats(d=0)$fmt
jjcs_num_formats(2)$fmt
jjcs_num_formats(2)$spec
Formatting count, denominator and fraction values
Description
Formatting count, denominator and fraction values
Usage
jjcsformat_count_denom_fraction(x, d = 1, roundmethod = c("sas", "iec"), ...)
Arguments
x
numeric
with elements num and fraction or num, denom and fraction.
d
numeric(1). Number of digits to round fraction to (default=1)
roundmethod
(string)
choice of rounding methods. Options are:
-
sas: the underlying rounding method istidytlg::roundSAS, where
roundSAS comes from this Stack Overflow post https://stackoverflow.com/questions/12688717/round-up-from-5 -
iec: the underlying rounding method isround
...
Additional arguments passed to other methods.
Value
x, formatted into a string with the appropriate
format and d digits of precision.
Examples
jjcsformat_count_denom_fraction(c(7, 10, 0.7))
jjcsformat_count_denom_fraction(c(70000, 70001, 70000 / 70001))
jjcsformat_count_denom_fraction(c(235, 235, 235 / 235))
Formatting fraction, count and denominator values
Description
Formatting fraction, count and denominator values
Usage
jjcsformat_fraction_count_denom(x, d = 1, roundmethod = c("sas", "iec"), ...)
Arguments
x
numeric
with elements num and fraction or num, denom and fraction.
d
numeric(1). Number of digits to round fraction to (default=1)
roundmethod
(string)
choice of rounding methods. Options are:
-
sas: the underlying rounding method istidytlg::roundSAS, where
roundSAS comes from this Stack Overflow post https://stackoverflow.com/questions/12688717/round-up-from-5 -
iec: the underlying rounding method isround
...
Additional arguments passed to other methods.
Details
Formats a 3-dimensional value such that percent values
near 0 or 100% are formatted as .e.g, "<0.1%" and
">99.9%", where the cutoff is controled by d, and
formatted as "xx.x% (xx/xx)" otherwise, with the
precision of the percent also controlled by d.
Value
x formatted as a string with d digits of precision,
with special cased values as described in Details above.
Examples
jjcsformat_fraction_count_denom(c(7, 10, 0.7))
jjcsformat_fraction_count_denom(c(70000, 70001, 70000 / 70001))
jjcsformat_fraction_count_denom(c(235, 235, 235 / 235))
Function factory for p-value formatting
Description
A function factory to generate formatting functions for p-value formatting that support rounding close to the significance level specified
Usage
jjcsformat_pval_fct(alpha = 0.05)
Arguments
alpha
number
the significance level to account for during rounding.
Value
The p-value in the standard format. If count is 0, the format is 0.
If it is smaller than 0.001, then <0.001, if it is larger than 0.999, then
>0.999 is returned. Otherwise, 3 digits are used. In the special case that
rounding from below would make the string equal to the specified alpha,
then a higher number of digits is used to be able to still see the difference.
For example, 0.0048 is not rounded to 0.005 but stays at 0.0048 if alpha = 0.005
is set.
See Also
Other JJCS formats:
count_fraction ,
format_xx_fct(),
jjcsformat_range_fct()
Examples
my_pval_format <- jjcsformat_pval_fct(0.005)
my_pval_format(0.2802359)
my_pval_format(0.0048)
my_pval_format(0.00499)
my_pval_format(0.004999999)
my_pval_format(0.0051)
my_pval_format(0.0009)
my_pval_format(0.9991)
Function factory for range with censoring information formatting
Description
A function factory to generate formatting functions for range formatting that includes information about the censoring of survival times.
Usage
jjcsformat_range_fct(str)
Arguments
str
string
the format specifying the number of digits to be used,
for the range values, e.g. "xx.xx".
Value
A function that formats a numeric vector with 4 elements:
minimum
maximum
censored minimum? (1 if censored, 0 if event)
censored maximum? (1 if censored, 0 if event) The range along with the censoring information is returned as a string with the specified numeric format as
(min, max), and the+is appended tominormaxif these have been censored.
See Also
Other JJCS formats:
count_fraction ,
format_xx_fct(),
jjcsformat_pval_fct()
Examples
my_range_format <- jjcsformat_range_fct("xx.xx")
my_range_format(c(0.35235, 99.2342, 1, 0))
my_range_format(c(0.35235, 99.2342, 0, 1))
my_range_format(c(0.35235, 99.2342, 0, 0))
my_range_format(c(0.35235, 99.2342, 1, 1))
Formatting of values
Description
jjcs formatting function
Usage
jjcsformat_xx(str, na_str = na_str_dflt)
Arguments
str
The formatting that is required specified as a text string, eg "xx.xx"
na_str
character. Na string that will be passed from formatters into
our formatting functions.
Value
a formatting function with "sas"-style rounding.
Survival time analysis
Description
The analyze function kaplan_meier() creates a layout element to analyze
survival time by calculating survival time median, 2 quantiles, each with
their confidence intervals, and range (for all, censored, or event patients).
The primary analysis variable vars is the time variable and the secondary
analysis variable is_event indicates whether or not an event has occurred.
Usage
a_kaplan_meier(
df,
.var,
...,
.stats = NULL,
.formats = NULL,
.labels = NULL,
.indent_mods = NULL
)
s_kaplan_meier(df, .var, is_event, control = control_surv_time())
Arguments
df
(data.frame)
data set containing all analysis variables.
.var
(string)
single variable name that is passed by rtables when requested
by a statistics function.
...
additional arguments for the lower level functions.
.stats
(character)
statistics to select for the table.
.formats
(named character or list)
formats for the statistics. See Details in analyze_vars for more
information on the 'auto' setting.
.labels
(named character)
labels for the statistics (without indent).
.indent_mods
(named integer)
indent modifiers for the labels. Defaults to 0, which corresponds to the
unmodified default behavior. Can be negative.
is_event
(character)
variable name storing Logical values: TRUE if event,
FALSE if time to event is censored.
control
(list)
parameters for comparison details, specified by using the helper function
tern::control_surv_time() . Some possible parameter options are:
-
conf_level(proportion)
confidence level of the interval for survival time. -
conf_type(string)
confidence interval type. Options are 'plain' (default), 'log', or 'log-log', see more insurvival::survfit(). Note option 'none' is not supported. -
quantiles(numeric)
vector of length two to specify the quantiles of survival time.
Value
-
a_kaplan_meier()returns the corresponding list with formattedrtables::CellValue().
-
s_kaplan_meier()returns the following statistics:-
quantiles_lower: Lower quantile estimate and confidence interval for it. -
median_ci_3d: Median survival time and confidence interval for it. -
quantiles_upper: Upper quantile estimate and confidence interval for it. -
range_with_cens_info: Survival time range with censoring information.
-
Functions
-
a_kaplan_meier(): Formatted analysis function which is used asafun -
s_kaplan_meier(): Statistics function which analyzes survival times using Kaplan-Meier.
Note
These functions have been forked from the tern package file survival_time.R.
Here we have the additional features:
Additional statistics
quantiles_lower,quantiles_upper,range_with_cens_infoare returned.
Examples
library(dplyr)
library(tern)
adtte_f <- tern::tern_ex_adtte |>
filter(PARAMCD == "OS") |>
mutate(
AVAL = tern::day2month(AVAL),
is_event = CNSR == 0
)
df <- adtte_f |> filter(ARMCD == "ARM A")
a_kaplan_meier(
df,
.var = "AVAL",
is_event = "is_event"
)
basic_table() |>
split_cols_by(var = "ARMCD") |>
add_colcounts() |>
analyze(
vars = "AVAL",
afun = a_kaplan_meier,
var_labels = "Kaplan-Meier estimate of time to event (months)",
show_labels = "visible",
extra_args = list(
is_event = "is_event",
control = control_surv_time(conf_level = 0.9, conf_type = "log-log")
)
) |>
build_table(df = adtte_f)
Pruning Function to accommodate removal of completely NULL rows within a table
Description
Condition function on individual analysis rows. Flag as FALSE when all columns are NULL, as then the row should not be kept. To be utilized as a row_condition in function tern::keep_rows
Usage
keep_non_null_rows(tr)
Arguments
tr
table tree object
Value
a function that can be utilized as a row_condition in the tern::keep_rows function
Examples
library(dplyr)
ADSL <- data.frame(
USUBJID = c(
"XXXXX01", "XXXXX02", "XXXXX03", "XXXXX04", "XXXXX05",
"XXXXX06", "XXXXX07", "XXXXX08", "XXXXX09", "XXXXX10"
),
TRT01P = c(
"ARMA", "ARMB", "ARMA", "ARMB", "ARMB", "Placebo",
"Placebo", "Placebo", "ARMA", "ARMB"
),
AGE = c(34, 56, 75, 81, 45, 75, 48, 19, 32, 31),
SAFFL = c("N", "N", "N", "N", "N", "N", "N", "N", "N", "N"),
PKFL = c("N", "N", "N", "N", "N", "N", "N", "N", "N", "N")
)
ADSL <- ADSL |>
mutate(TRT01P = as.factor(TRT01P))
create_blank_line <- function(x) {
list(
"Mean" = rcell(mean(x), format = "xx.x"),
" " = rcell(NULL),
"Max" = rcell(max(x))
)
}
lyt <- basic_table() |>
split_cols_by("TRT01P") |>
analyze("AGE", afun = create_blank_line)
result <- build_table(lyt, ADSL)
result
result <- prune_table(result, prune_func = tern::keep_rows(keep_non_null_rows))
result
Adding Labels To Variables For Model
Description
Adding Labels To Variables For Model
Usage
h_is_specified(x, vars)
h_is_specified_and_in_data(x, vars, data)
h_check_and_get_label(x, vars, data)
h_labels(vars, data)
Arguments
x
(character)
an element in vars.
vars
(list)
variables to use.
data
(data.frame)
data to use.
Functions
-
h_is_specified(): checks if element invarsis notNULLand not empty. -
h_is_specified_and_in_data(): checks if element in vars is not NULL and exists in dataset. -
h_check_and_get_label(): gets label for each element in vars. -
h_labels(): returns the list of variables with labels.
Extract the left-hand side of a formula
Description
Extract the left-hand side of a formula
Usage
leftside(x)
Define Column Widths
Description
def_colwidths uses heuristics to determine suitable column widths given a
table or listing, and a font.
Usage
listing_column_widths(
mpf,
incl_header = TRUE,
col_gap = 0.5,
pg_width_ins = 8.88,
fontspec = font_spec("Times", 8, 1.2),
verbose = FALSE
)
def_colwidths(
tt,
fontspec,
label_width_ins = 2,
col_gap = ifelse(type == "Listing", 0.5, 3),
type = tlg_type(tt)
)
Arguments
mpf
(listing_df or MatrixPrintForm derived thereof)
The listing
calculate column widths for.
incl_header
(logical(1))
Should the constraint to not break up
individual words be extended to words in the column labels? Defaults to TRUE
col_gap
Column gap in spaces. Defaults to .5 for listings and 3
for tables.
pg_width_ins
(numeric(1))
Number of inches in width for
the portion of the page the listing will be printed to. Defaults to 8.88
which corresponds to landscape orientation on a standard page after margins.
fontspec
Font specification
verbose
(logical(1))
Should additional information messages be
displayed during the calculation of the column widths? Defaults to FALSE.
tt
input Tabletree
label_width_ins
Label Width in Inches.
type
Type of the table tree, used to determine column width calculation method.
Details
Listings are assumed to be rendered landscape on standard A1 paper,
such that all columns are rendered on one page. Tables are allowed to
be horizontally paginated, and column widths are determined based only on
required word wrapping. See the Automatic Column Widths vignette for
a detailed discussion of the algorithms used.
Value
A vector of column widths suitable to use in tt_to_tlgrtf and
other exporters.
a vector of column widths (including the label row pseudo-column in the table
case) suitable for use rendering tt in the specified font.
Helpers for Processing Least Square Means
Description
Helpers for Processing Least Square Means
Usage
h_get_emmeans_res(fit, vars, weights)
h_get_average_visit_specs(emmeans_res, vars, averages, fit)
h_get_spec_visit_estimates(emmeans_res, specs, conf_level, tests = FALSE, ...)
h_get_single_visit_estimates(emmeans_res, conf_level)
h_get_relative_reduc_df(estimates, vars)
h_single_visit_contrast_specs(emmeans_res, vars)
h_average_visit_contrast_specs(specs, averages)
Arguments
fit
result of model fitting function, e.g. mmrm::mmrm() or stats::lm() .
vars
(named list of string or character)
specifying the variables in the MMRM.
The following elements need to be included as character vectors and match corresponding columns
in data:
-
response: the response variable. -
covariates: the additional covariate terms (might also include interactions). -
id: the subject ID variable. -
arm: the treatment group variable (factor). -
visit: the visit variable (factor). -
weights: optional weights variable (ifNULLor omitted then no weights will be used).
Note that the main effects and interaction of arm and visit are by default
included in the model.
weights
(string)
argument from emmeans::emmeans() , 'counterfactual' by default.
emmeans_res
(list)
initial emmeans result from h_get_emmeans_res() .
averages
(list)
optional named list of visit levels which should be averaged
and reported along side the single visits.
specs
(list)
list of least square means specifications, with
elements coefs (coefficient list) and grid (corresponding data.frame).
conf_level
(proportion)
confidence level of the interval.
tests
(flag)
whether to add test results to the estimates.
...
additional arguments for emmeans::contrast() .
estimates
(data.frame)
single visit least square mean estimates.
Functions
-
h_get_emmeans_res(): returns a list withobject(emmGridobject containingemmeansresults) andgrid(data.framecontaining the potential arm and the visit variables together with the sample sizenfor each combination). -
h_get_average_visit_specs(): constructs average of visits specifications. -
h_get_spec_visit_estimates(): estimates least square means as adata.framegiven specifications. -
h_get_single_visit_estimates(): estimates least square means for single visits. -
h_get_relative_reduc_df(): constructsdata.framewith relative reduction vs. reference arm based on single visit estimates. -
h_single_visit_contrast_specs(): constructs single visit contrast specifications. -
h_average_visit_contrast_specs(): constructs average visits contrast specifications, given thespecsfor single visit contrasts and the averages required.
Note
The difference here compared to the original tern.mmrm::h_get_spec_visit_estimates()
function is that additional arguments for emmeans::contrast() can be passed via the
Once this has been added to the tern.mmrm package then its functions can be used instead.
Content Row Analysis Function for LS Means Wide Table Layouts
Description
Content Row Analysis Function for LS Means Wide Table Layouts
Usage
lsmeans_wide_cfun(
df,
labelstr,
.spl_context,
variables,
ref_level,
treatment_levels,
pval_sided = c("2", "1", "-1"),
conf_level,
formats
)
Arguments
df
(data.frame)
data set containing all analysis variables.
labelstr
(character)
label of the level of the parent split currently being summarized
(must be present as second argument in Content Row Functions). See rtables::summarize_row_groups()
for more information.
.spl_context
(data.frame)
gives information about ancestor split states
that is passed by rtables.
variables
(list)
see fit_ancova() for required variable
specifications.
ref_level
(string)
the reference level of the treatment arm variable.
treatment_levels
(character)
the non-reference levels of the treatment arm
variable.
pval_sided
(string)
either '2' for two-sided or '1' for 1-sided with greater than
control or '-1' for 1-sided with smaller than control alternative hypothesis.
conf_level
(proportion)
confidence level of the interval.
formats
(list)
including lsmean, mse, df, lsmean_diff, se,
ci, pval formats.
Details
This assumes a lot of structure of the layout, and is only intended to be used inside
summarize_lsmeans_wide() , please see there for the layout structure that is needed.
First Level Column Split for LS Means Wide Table Layouts
Description
First Level Column Split for LS Means Wide Table Layouts
Usage
lsmeans_wide_first_split_fun_fct(include_variance)
Second Level Column Split for LS Means Wide Table Layouts
Description
Second Level Column Split for LS Means Wide Table Layouts
Usage
lsmeans_wide_second_split_fun_fct(pval_sided, conf_level, include_pval)
Arguments
conf_level
(proportion)
confidence level of the interval.
include_pval
(flag)
whether to include the p-value column.
Split Function Helper
Description
A function which aids the construction for users to create their own split function for combined columns
Usage
make_combo_splitfun(nm, label = nm, levels = NULL, rm_other_facets = TRUE)
Arguments
nm
character(1). Name/virtual 'value' for the new facet
label
character(1). label for the new facet
levels
character or NULL. The levels to combine into the new facet, or NULL, indicating the facet should include all incoming data.
rm_other_facets
logical(1). Should facets other than the newly
created one be removed. Defaults to TRUE
Value
function usable directly as a split function.
Examples
aesevall_spf <- make_combo_splitfun(nm = 'AESEV_ALL', label = 'Any AE', levels = NULL)
Create a rbmi ready cluster
Description
Create a rbmi ready cluster
Usage
make_rbmi_cluster(cluster_or_cores = 1, objects = NULL, packages = NULL)
Arguments
cluster_or_cores
Number of parallel processes to use or an existing cluster to make use of
objects
a named list of objects to export into the sub-processes
packages
a character vector of libraries to load in the sub-processes
This function is a wrapper around parallel::makePSOCKcluster() but takes
care of configuring rbmi to be used in the sub-processes as well as loading
user defined objects and libraries and setting the seed for reproducibility.
Value
If cluster_or_cores is 1 this function will return NULL. If cluster_or_cores
is a number greater than 1, a cluster with cluster_or_cores cores is returned.
If cluster_or_cores is a cluster created via parallel::makeCluster() then this function
returns it after inserting the relevant rbmi objects into the existing cluster.
Examples
## Not run:
make_rbmi_cluster(5)
closeAllConnections()
VALUE <- 5
myfun <- function(x) {
x + day(VALUE)
}
make_rbmi_cluster(5, list(VALUE = VALUE, myfun = myfun), c("lubridate"))
closeAllConnections()
cl <- parallel::makeCluster(5)
make_rbmi_cluster(cl)
closeAllConnections()
## End(Not run)
No Data to Report String
Description
A constant string used when there is no data to display in a table. This is used as a placeholder in tables when no data is available for a particular category.
Usage
no_data_to_report_str
Format
An object of class character of length 1.
Value
A character string with the value "No data to report".
Non-blank Sentinel
Description
Non-blank Sentinel
Usage
non_blank_sentinel
Format
An object of class non_blank_sentinel of length 1.
Null Function
Description
A function that returns NULL.
Usage
null_fn(...)
Odds ratio estimation
Description
Usage
a_odds_ratio_j(
df,
.var,
.df_row,
ref_path,
.spl_context,
...,
.stats = NULL,
.formats = NULL,
.labels = NULL,
.indent_mods = NULL
)
s_odds_ratio_j(
df,
.var,
.ref_group,
.in_ref_col,
.df_row,
variables = list(arm = NULL, strata = NULL),
conf_level = 0.95,
groups_list = NULL,
na_if_no_events = TRUE,
method = c("exact", "approximate", "efron", "breslow", "cmh")
)
Arguments
df
(data.frame)
input data frame.
.var
(string)
name of the response variable.
.df_row
(data.frame)
data frame containing all rows.
ref_path
(character)
path to the reference group.
.spl_context
(environment)
split context environment.
...
Additional arguments passed to the statistics function.
.stats
(character)
statistics to calculate.
.formats
(list)
formats for the statistics.
.labels
(list)
labels for the statistics.
.indent_mods
(list)
indentation modifications for the statistics.
.ref_group
(data.frame)
reference group data frame.
.in_ref_col
(logical)
whether the current column is the reference column.
variables
(list)
list with arm and strata variable names.
conf_level
(numeric)
confidence level for the confidence interval.
groups_list
(list)
list of groups for combination.
na_if_no_events
(flag)
whether the point estimate should be NA if there
are no events in one arm. The p-value and confidence interval will still be computed.
method
(string)
whether to use the correct ('exact') calculation in the conditional likelihood or one
of the approximations, or the CMH method. See survival::clogit() for details.
Value
-
a_odds_ratio_j()returns the corresponding list with formattedrtables::CellValue().
-
s_odds_ratio_j()returns a named list with the statisticsor_ci(containingest,lcl, anducl),pvalandn_tot.
Functions
-
a_odds_ratio_j(): Formatted analysis function which is used asafun. Note that the junco specificref_pathand.spl_contextarguments are used for reference column information. -
s_odds_ratio_j(): Statistics function which estimates the odds ratio between a treatment and a control. Avariableslist witharmandstratavariable names must be passed if a stratified analysis is required.
Note
The a_odds_ratio_j() and s_odds_ratio_j() functions have the _j suffix to distinguish them
from tern::a_odds_ratio() and tern::s_odds_ratio() , respectively.
These functions differ as follows:
Additional
method = 'cmh'option is provided to calculate the Cochran-Mantel-Haenszel estimate.The p-value is returned as an additional statistic.
Once these updates are contributed back to tern, they can later be replaced by the tern versions.
Examples
set.seed(12)
dta <- data.frame(
rsp = sample(c(TRUE, FALSE), 100, TRUE),
grp = factor(rep(c("A", "B"), each = 50), levels = c("A", "B")),
strata = factor(sample(c("C", "D"), 100, TRUE))
)
a_odds_ratio_j(
df = subset(dta, grp == "A"),
.var = "rsp",
ref_path = c("grp", "B"),
.spl_context = data.frame(
cur_col_split = I(list("grp")),
cur_col_split_val = I(list(c(grp = "A"))),
full_parent_df = I(list(dta))
),
.df_row = dta
)
l <- basic_table() |>
split_cols_by(var = "grp") |>
analyze(
"rsp",
afun = a_odds_ratio_j,
show_labels = "hidden",
extra_args = list(
ref_path = c("grp", "B"),
.stats = c("or_ci", "pval")
)
)
build_table(l, df = dta)
l2 <- basic_table() |>
split_cols_by(var = "grp") |>
analyze(
"rsp",
afun = a_odds_ratio_j,
show_labels = "hidden",
extra_args = list(
variables = list(arm = "grp", strata = "strata"),
method = "cmh",
ref_path = c("grp", "A"),
.stats = c("or_ci", "pval")
)
)
build_table(l2, df = dta)
s_odds_ratio_j(
df = subset(dta, grp == "A"),
.var = "rsp",
.ref_group = subset(dta, grp == "B"),
.in_ref_col = FALSE,
.df_row = dta
)
s_odds_ratio_j(
df = subset(dta, grp == "A"),
.var = "rsp",
.ref_group = subset(dta, grp == "B"),
.in_ref_col = FALSE,
.df_row = dta,
variables = list(arm = "grp", strata = "strata")
)
s_odds_ratio_j(
df = subset(dta, grp == "A"),
method = "cmh",
.var = "rsp",
.ref_group = subset(dta, grp == "B"),
.in_ref_col = FALSE,
.df_row = dta,
variables = list(arm = "grp", strata = c("strata"))
)
Function Factory to Create Padded In Rows Content
Description
Function Factory to Create Padded In Rows Content
Usage
pad_in_rows_fct(length_out = NULL, label = "")
Arguments
length_out
(count or NULL)
full length which should be padded
by NA which will be printed as empty strings.
label
(string)
row label to be used for the first row only.
Value
The function of content and .formats.
Parallelise Lapply
Description
Simple wrapper around lapply and parallel::clusterApplyLB to abstract away
the logic of deciding which one to use
Usage
par_lapply(cl, fun, x, ...)
Arguments
cl
Cluster created by parallel::makeCluster() or NULL
fun
Function to be run
x
object to be looped over
...
extra arguments passed to fun
Value
list of results of calling fun on elements of x.
Proportion difference estimation
Description
The analysis function a_proportion_diff_j() can be used to create a layout element to estimate
the difference in proportion of responders within a studied population. The primary analysis variable,
vars, is a logical variable indicating whether a response has occurred for each record. See the method
parameter for options of methods to use when constructing the confidence interval of the proportion difference.
A stratification variable can be supplied via the strata element of the variables argument.
Usage
a_proportion_diff_j(
df,
.var,
ref_path,
.spl_context,
...,
.stats = NULL,
.formats = NULL,
.labels = NULL,
.indent_mods = NULL
)
s_proportion_diff_j(
df,
.var,
.ref_group,
.in_ref_col,
variables = list(strata = NULL),
conf_level = 0.95,
method = c("waldcc", "wald", "cmh", "ha", "newcombe", "newcombecc", "strat_newcombe",
"strat_newcombecc"),
weights_method = "cmh"
)
Arguments
df
(data.frame)
input data frame.
.var
(string)
name of the response variable.
ref_path
(character)
path to the reference group.
.spl_context
(environment)
split context environment.
...
Additional arguments passed to the statistics function.
.stats
(character)
statistics to calculate.
.formats
(list)
formats for the statistics.
.labels
(list)
labels for the statistics.
.indent_mods
(list)
indentation modifications for the statistics.
.ref_group
(data.frame)
reference group data frame.
.in_ref_col
(logical)
whether the current column is the reference column.
variables
(list)
list with strata variable names.
conf_level
(numeric)
confidence level for the confidence interval.
method
(string)
method to use for confidence interval calculation.
weights_method
(string)
method to use for weights calculation in stratified analysis.
Value
-
a_proportion_diff_j()returns the corresponding list with formattedrtables::CellValue().
-
s_proportion_diff_j()returns a named list of elementsdiff,diff_ci,diff_est_cianddiff_ci_3d.
Functions
-
a_proportion_diff_j(): Formatted analysis function which is used asafuninestimate_proportion_diff(). -
s_proportion_diff_j(): Statistics function estimating the difference in terms of responder proportion.
Note
The a_proportion_diff_j() function has the _j suffix to distinguish it
from tern::a_proportion_diff() . The functions here are a copy from the tern package
with additional features:
Additional statistic
diff_est_ciis returned.-
ref_pathneeds to be provided as extra argument to specify the control group column.
When performing an unstratified analysis, methods 'cmh', 'strat_newcombe',
and 'strat_newcombecc' are not permitted.
Examples
nex <- 100
dta <- data.frame(
"rsp" = sample(c(TRUE, FALSE), nex, TRUE),
"grp" = sample(c("A", "B"), nex, TRUE),
"f1" = sample(c("a1", "a2"), nex, TRUE),
"f2" = sample(c("x", "y", "z"), nex, TRUE),
stringsAsFactors = TRUE
)
l <- basic_table() |>
split_cols_by(var = "grp") |>
analyze(
vars = "rsp",
afun = a_proportion_diff_j,
show_labels = "hidden",
na_str = tern::default_na_str(),
extra_args = list(
conf_level = 0.9,
method = "ha",
ref_path = c("grp", "B")
)
)
build_table(l, df = dta)
s_proportion_diff_j(
df = subset(dta, grp == "A"),
.var = "rsp",
.ref_group = subset(dta, grp == "B"),
.in_ref_col = FALSE,
conf_level = 0.90,
method = "ha"
)
s_proportion_diff_j(
df = subset(dta, grp == "A"),
.var = "rsp",
.ref_group = subset(dta, grp == "B"),
.in_ref_col = FALSE,
variables = list(strata = c("f1", "f2")),
conf_level = 0.90,
method = "cmh"
)
Difference test for two proportions
Description
The analysis function a_test_proportion_diff() can be used to create a layout element to test
the difference between two proportions. The primary analysis variable, vars, indicates whether a
response has occurred for each record. See the method parameter for options of methods to use
to calculate the p-value. Additionally, a stratification variable can be supplied via the strata
element of the variables argument. The argument alternative specifies the direction of the
alternative hypothesis.
Usage
a_test_proportion_diff(
df,
.var,
ref_path,
.spl_context,
...,
.stats = NULL,
.formats = NULL,
.labels = NULL,
.indent_mods = NULL
)
s_test_proportion_diff(
df,
.var,
.ref_group,
.in_ref_col,
variables = list(strata = NULL),
method = c("chisq", "fisher", "cmh"),
alternative = c("two.sided", "less", "greater")
)
Arguments
df
(data.frame)
data set containing all analysis variables.
.var
(string)
single variable name that is passed by rtables when requested
by a statistics function.
ref_path
(character)
global reference group specification, see get_ref_info() .
.spl_context
(data.frame)
gives information about ancestor split states
that is passed by rtables.
...
additional arguments for the lower level functions.
.stats
(character)
statistics to select for the table.
.formats
(named character or list)
formats for the statistics. See Details in analyze_vars for more
information on the 'auto' setting.
.labels
(named character)
labels for the statistics (without indent).
.indent_mods
(named integer)
indent modifiers for the labels. Defaults to 0, which corresponds to the
unmodified default behavior. Can be negative.
.ref_group
(data.frame or vector)
the data corresponding to the reference group.
.in_ref_col
(logical)
TRUE when working with the reference level, FALSE otherwise.
variables
(named list of string)
list of additional analysis variables.
method
(string)
one of chisq, cmh, fisher; specifies the test used
to calculate the p-value.
alternative
(string)
whether two.sided, or one-sided less or greater p-value
should be displayed.
Value
-
a_test_proportion_diff()returns the corresponding list with formattedrtables::CellValue().
-
s_test_proportion_diff()returns a namedlistwith a single itempvalwith an attributelabeldescribing the method used. The p-value tests the null hypothesis that proportions in two groups are the same.
Functions
-
a_test_proportion_diff(): Formatted analysis function which is used asafun -
s_test_proportion_diff(): Statistics function which tests the difference between two proportions.
Note
These functions have been forked from the tern package. Additional features are:
Additional
alternativeargument for the sidedness of the test.Additional
ref_pathargument for flexible reference column path specification.
See Also
Examples
dta <- data.frame(
rsp = sample(c(TRUE, FALSE), 100, TRUE),
grp = factor(rep(c("A", "B"), each = 50)),
strata = factor(rep(c("V", "W", "X", "Y", "Z"), each = 20))
)
l <- basic_table() |>
split_cols_by(var = "grp") |>
analyze(
vars = "rsp",
afun = a_test_proportion_diff,
show_labels = "hidden",
extra_args = list(
method = "cmh",
variables = list(strata = "strata"),
ref_path = c("grp", "B")
)
)
build_table(l, df = dta)
Split Function for Proportion Analysis Columns (TEFCGIS08 e.g.)
Description
Here we just split into 3 columns n, % and Cum %.
Usage
prop_post_fun(ret, spl, fulldf, .spl_context)
prop_split_fun(df, spl, vals = NULL, labels = NULL, trim = FALSE, .spl_context)
Arguments
ret
(list)
return value from the previous split function.
spl
(list)
split information.
fulldf
(data.frame)
full data frame.
.spl_context
(environment)
split context environment.
df
A data frame that contains all analysis variables.
vals
A character vector that contains values to use for the split.
labels
A character vector that contains labels for the statistics (without indent).
trim
A single logical that indicates whether to trim the values.
Value
a split function for use in rtables::split_rows_by.
Note
This split function is used in the proportion table TEFCGIS08 and similar ones.
See Also
rtables::make_split_fun() describing the requirements for this kind of
post-processing function.
Relative Risk CMH Statistic
Description
Calculates the relative risk which is defined as the ratio between the response rates between the experimental treatment group and the control treatment group, adjusted for stratification factors by applying Cochran-Mantel-Haenszel (CMH) weights.
Usage
prop_ratio_cmh(rsp, grp, strata, conf_level = 0.95)
Arguments
rsp
(logical)
whether each subject is a responder or not.
grp
(factor)
defining the groups.
strata
(factor)
variable with one level per stratum and same length as rsp.
conf_level
(proportion)
confidence level of the interval.
Value
a list with elements rel_risk_ci and pval.
Examples
set.seed(2)
rsp <- sample(c(TRUE, FALSE), 100, TRUE)
grp <- sample(c("Placebo", "Treatment"), 100, TRUE)
grp <- factor(grp, levels = c("Placebo", "Treatment"))
strata_data <- data.frame(
"f1" = sample(c("a", "b"), 100, TRUE),
"f2" = sample(c("x", "y", "z"), 100, TRUE),
stringsAsFactors = TRUE
)
prop_ratio_cmh(
rsp = rsp, grp = grp, strata = interaction(strata_data),
conf_level = 0.90
)
Formatted Analysis Function for Proportion Analysis (TEFCGIS08 e.g.)
Description
This function applies to a factor x when a column split was prepared with
prop_split_fun() before.
Usage
prop_table_afun(x, .spl_context, formats, add_total_level = FALSE)
Arguments
x
(factor)
factor variable to analyze.
.spl_context
(environment)
split context environment.
formats
(list)
formats for the statistics.
add_total_level
(flag)
whether to add a total level.
Details
In the column named n, the counts of the categories as well as an
optional Total count will be shown. In the column named percent, the
percentages of the categories will be shown, with an optional blank entry for
Total. In the column named cum_percent, the cumulative percentages will
be shown instead.
Value
A VerticalRowsSection as returned by rtables::in_rows.
Standard Arguments
Description
The documentation to this function lists all the arguments in tern
that are used repeatedly to express an analysis.
Arguments
...
additional arguments for the lower level functions.
.aligns
(character)
alignment for table contents (not including labels). When NULL, 'center'
is applied. See formatters::list_valid_aligns() for a list of all currently supported alignments.
.all_col_counts
(vector of integer)
each value represents a global count for a column. Values are
taken from alt_counts_df if specified (see rtables::build_table() ).
.df_row
(data.frame)
data frame across all of the columns for the given row split.
.formats
(named character or list)
formats for the statistics. See Details in analyze_vars for more
information on the 'auto' setting.
.in_ref_col
(logical)
TRUE when working with the reference level, FALSE otherwise.
.indent_mods
(named integer)
indent modifiers for the labels. Defaults to 0, which corresponds to the
unmodified default behavior. Can be negative.
.labels
(named character)
labels for the statistics (without indent).
.N_col
(integer)
column-wise N (column count) for the full column being analyzed that is typically
passed by rtables.
.N_row
(integer)
row-wise N (row group count) for the group of observations being analyzed
(i.e. with no column-based subsetting) that is typically passed by rtables.
.ref_group
(data.frame or vector)
the data corresponding to the reference group.
ref_path
(character)
global reference group specification, see get_ref_info() .
.spl_context
(data.frame)
gives information about ancestor split states
that is passed by rtables.
.stats
(character)
statistics to select for the table.
.var
(string)
single variable name that is passed by rtables when requested
by a statistics function.
add_total_level
(flag)
adds a 'total' level after the others which includes all the levels
that constitute the split. A custom label can be set for this level via the custom_label argument.
alternative
(string)
whether two.sided, or one-sided less or greater p-value
should be displayed.
col_by
(factor)
defining column groups.
conf_level
(proportion)
confidence level of the interval.
control
(list)
relevant list of control options.
data
(data.frame)
the dataset containing the variables to summarize.
df
(data.frame)
data set containing all analysis variables.
draw
(flag)
whether the plot should be drawn.
grp
(factor)
defining the groups.
groups_lists
(named list of list)
optionally contains for each subgroups variable a
list, which specifies the new group levels via the names and the
levels that belong to it in the character vectors that are elements of the list.
id
(string)
subject variable name.
is_event
(character)
variable name storing Logical values: TRUE if event,
FALSE if time to event is censored.
label_all
(string)
label for the total population analysis.
labelstr
(character)
label of the level of the parent split currently being summarized
(must be present as second argument in Content Row Functions). See rtables::summarize_row_groups()
for more information.
lyt
(layout)
input layout where analyses will be added to.
method
(string)
specifies the test used to calculate the p-value for the difference between
two proportions. For options, see s_test_proportion_diff() . Default is NULL so no test is performed.
na.rm
(flag)
whether NA values should be removed from x prior to analysis.
na_str
(string)
string used to replace all NA or empty values in the output.
nested
(flag)
whether this layout instruction should be applied within the existing layout structure if
possible (TRUE, the default) or as a new top-level element (FALSE). Ignored if it would nest a split.
underneath analyses, which is not allowed.
newpage
(flag)
whether the plot should be drawn on a new page.
Only considered if draw = TRUE is used.
prune_zero_rows
(flag)
whether to prune all zero rows.
riskdiff
(flag)
whether a risk difference column is present. When set to TRUE,
tern::add_riskdiff() must be used as split_fun in the prior column split
of the table layout, specifying which columns should be compared.
See tern::stat_propdiff_ci() for details on risk difference calculation.
rsp
(logical)
whether each subject is a responder or not.
section_div
(string)
string which should be repeated as a section divider after each group
defined by this split instruction, or NA_character_ (the default) for no section divider.
show_labels
(string)
label visibility: one of 'default', 'visible' and 'hidden'.
show_relative
should the 'reduction' (control - treatment, default) or the 'increase'
(treatment - control) be shown for the relative change from baseline?
strata
(character or NULL)
variable names indicating stratification factors.
table_names
(character)
this can be customized in case that the same vars are analyzed multiple times,
to avoid warnings from rtables.
tte
(numeric)
contains time-to-event duration values.
var_labels
(character)
character for label.
variables
(named list of string)
list of additional analysis variables.
vars
(character)
variable names for the primary analysis variable to be iterated over.
var
(string)
single variable name for the primary analysis variable.
x
(numeric)
vector of numbers we want to analyze.
ctrl_grp
(string)
Level of the control group for the relative risk derivation.
Details
Although this function just returns NULL it has two uses, for
the tern users it provides a documentation of arguments that are
commonly and consistently used in the framework. For the developer it adds a
single reference point to import the roxygen argument description with:
@inheritParams proposal_argument_convention
Analyse Multiple Imputed Datasets
Description
This function takes multiple imputed datasets (as generated by
the rbmi::impute() function) and runs an analysis function on
each of them.
Usage
rbmi_analyse(
imputations,
fun = rbmi_ancova,
delta = NULL,
...,
cluster_or_cores = 1,
.validate = TRUE
)
Arguments
imputations
An imputations object as created by rbmi::impute() .
fun
An analysis function to be applied to each imputed dataset. See details.
delta
A data.frame containing the delta transformation to be applied to the imputed
datasets prior to running fun. See details.
...
Additional arguments passed onto fun.
cluster_or_cores
The number of parallel processes to use when running this function. Can also be a
cluster object created by make_rbmi_cluster() . See the parallelisation section below.
.validate
Should imputations be checked to ensure it conforms to the required format
(default = TRUE) ? Can gain a small performance increase if this is set to FALSE when
analysing a large number of samples.
Details
This function works by performing the following steps:
Extract a dataset from the
imputationsobject.Apply any delta adjustments as specified by the
deltaargument.Run the analysis function
funon the dataset.Repeat steps 1-3 across all of the datasets inside the
imputationsobject.Collect and return all of the analysis results.
The analysis function fun must take a data.frame as its first
argument. All other options to rbmi_analyse() are passed onto fun
via ....
fun must return a named list with each element itself being a
list containing a single
numeric element called est (or additionally se and df if
you had originally specified rbmi::method_bayes() or rbmi::method_approxbayes() )
i.e.:
myfun <- function(dat, ...) {
mod_1 <- lm(data = dat, outcome ~ group)
mod_2 <- lm(data = dat, outcome ~ group + covar)
x <- list(
trt_1 = list(
est = coef(mod_1)[['group']], # Use [[ ]] for safety
se = sqrt(vcov(mod_1)['group', 'group']), # Use ['','']
df = df.residual(mod_1)
),
trt_2 = list(
est = coef(mod_2)[['group']], # Use [[ ]] for safety
se = sqrt(vcov(mod_2)['group', 'group']), # Use ['','']
df = df.residual(mod_2)
)
)
return(x)
}
Please note that the vars$subjid column (as defined in the original call to
rbmi::draws() ) will be scrambled in the data.frames that are provided to fun.
This is to say they will not contain the original subject values and as such
any hard coding of subject ids is strictly to be avoided.
By default fun is the rbmi_ancova() function.
Please note that this function
requires that a vars object, as created by rbmi::set_vars() , is provided via
the vars argument e.g. rbmi_analyse(imputeObj, vars = rbmi::set_vars(...)). Please
see the documentation for rbmi_ancova() for full details.
Please also note that the theoretical justification for the conditional mean imputation
method (method = method_condmean() in rbmi::draws() ) relies on the fact that ANCOVA is
a linear transformation of the outcomes.
Thus care is required when applying alternative analysis functions in this setting.
The delta argument can be used to specify offsets to be applied
to the outcome variable in the imputed datasets prior to the analysis.
This is typically used for sensitivity or tipping point analyses. The
delta dataset must contain columns vars$subjid, vars$visit (as specified
in the original call to rbmi::draws() ) and delta. Essentially this data.frame
is merged onto the imputed dataset by vars$subjid and vars$visit and then
the outcome variable is modified by:
imputed_data[[vars$outcome]] <- imputed_data[[vars$outcome]] + imputed_data[['delta']]
Please note that in order to provide maximum flexibility, the delta argument
can be used to modify any/all outcome values including those that were not
imputed. Care must be taken when defining offsets. It is recommend that you
use the helper function rbmi::delta_template() to define the delta datasets as
this provides utility variables such as is_missing which can be used to identify
exactly which visits have been imputed.
Value
An analysis object, as defined by rbmi, representing the desired
analysis applied to each of the imputed datasets in imputations.
Parallelisation
To speed up the evaluation of rbmi_analyse() you can use the cluster_or_cores argument to enable parallelisation.
Simply providing an integer will get rbmi to automatically spawn that many background processes
to parallelise across. If you are using a custom analysis function then you need to ensure
that any libraries or global objects required by your function are available in the
sub-processes. To do this you need to use the make_rbmi_cluster() function for example:
my_custom_fun <- function(...) <some analysis code>
cl <- make_rbmi_cluster(
4,
objects = list('my_custom_fun' = my_custom_fun),
packages = c('dplyr', 'nlme')
)
rbmi_analyse(
imputations = imputeObj,
fun = my_custom_fun,
cluster_or_cores = cl
)
parallel::stopCluster(cl)
Note that there is significant overhead both with setting up the sub-processes and with
transferring data back-and-forth between the main process and the sub-processes. As such
parallelisation of the rbmi_analyse() function tends to only be worth it when you have
> 2000 samples generated by rbmi::draws() . Conversely using parallelisation if your samples
are smaller than this may lead to longer run times than just running it sequentially.
It is important to note that the implementation of parallel processing within [rbmi::analyse()] has been optimised around the assumption that the parallel processes will be spawned on the same machine and not a remote cluster. One such optimisation is that the required data is saved to a temporary file on the local disk from which it is then read into each sub-process. This is done to avoid the overhead of transferring the data over the network. Our assumption is that if you are at the stage where you need to be parallelising your analysis over a remote cluster then you would likely be better off parallelising across multiple rbmiruns rather than within a singlerbmi' run.
Finally, if you are doing a tipping point analysis you can get a reasonable performance
improvement by re-using the cluster between each call to rbmi_analyse() e.g.
cl <- make_rbmi_cluster(4) ana_1 <- rbmi_analyse( imputations = imputeObj, delta = delta_plan_1, cluster_or_cores = cl ) ana_2 <- rbmi_analyse( imputations = imputeObj, delta = delta_plan_2, cluster_or_cores = cl ) ana_3 <- rbmi_analyse( imputations = imputeObj, delta = delta_plan_3, cluster_or_cores = cl ) parallel::clusterStop(cl)
See Also
rbmi::extract_imputed_dfs() for manually extracting imputed
datasets.
rbmi::delta_template() for creating delta data.frames.
rbmi_ancova() for the default analysis function.
Examples
library(rbmi)
library(dplyr)
dat <- antidepressant_data
dat$GENDER <- as.factor(dat$GENDER)
dat$POOLINV <- as.factor(dat$POOLINV)
set.seed(123)
pat_ids <- sample(levels(dat$PATIENT), nlevels(dat$PATIENT) / 4)
dat <- dat |>
filter(PATIENT %in% pat_ids) |>
droplevels()
dat <- expand_locf(
dat,
PATIENT = levels(dat$PATIENT),
VISIT = levels(dat$VISIT),
vars = c("BASVAL", "THERAPY"),
group = c("PATIENT"),
order = c("PATIENT", "VISIT")
)
dat_ice <- dat %>%
arrange(PATIENT, VISIT) %>%
filter(is.na(CHANGE)) %>%
group_by(PATIENT) %>%
slice(1) %>%
ungroup() %>%
select(PATIENT, VISIT) %>%
mutate(strategy = "JR")
dat_ice <- dat_ice[-which(dat_ice$PATIENT == 3618), ]
vars <- set_vars(
outcome = "CHANGE",
visit = "VISIT",
subjid = "PATIENT",
group = "THERAPY",
covariates = c("THERAPY")
)
drawObj <- draws(
data = dat,
data_ice = dat_ice,
vars = vars,
method = method_condmean(type = "jackknife", covariance = "csh"),
quiet = TRUE
)
references <- c("DRUG" = "PLACEBO", "PLACEBO" = "PLACEBO")
imputeObj <- impute(drawObj, references)
rbmi_analyse(imputations = imputeObj, vars = vars)
Analysis of Covariance
Description
Performs an analysis of covariance between two groups returning the estimated "treatment effect" (i.e. the contrast between the two treatment groups) and the least square means estimates in each group.
Usage
rbmi_ancova(
data,
vars,
visits = NULL,
weights = c("counterfactual", "equal", "proportional_em", "proportional")
)
Arguments
data
A data.frame containing the data to be used in the model.
vars
A vars object as generated by rbmi::set_vars() . Only the group,
visit, outcome and covariates elements are required. See details.
visits
An optional character vector specifying which visits to
fit the ancova model at. If NULL, a separate ancova model will be fit to the
outcomes for each visit (as determined by unique(data[[vars$visit]])).
See details.
weights
Character, either "counterfactual" (default), "equal",
"proportional_em" or "proportional".
Specifies the weighting strategy to be used when calculating the lsmeans.
See the weighting section for more details.
Details
The function works as follows:
Select the first value from
visits.Subset the data to only the observations that occurred on this visit.
Fit a linear model as
vars$outcome ~ vars$group + vars$covariates.Extract the "treatment effect" & least square means for each treatment group.
Repeat points 2-3 for all other values in
visits.
If no value for visits is provided then it will be set to
unique(data[[vars$visit]]).
In order to meet the formatting standards set by rbmi_analyse() the results will be collapsed
into a single list suffixed by the visit name, e.g.:
list( var_visit_1 = list(est = ...), trt_B_visit_1 = list(est = ...), lsm_A_visit_1 = list(est = ...), lsm_B_visit_1 = list(est = ...), var_visit_2 = list(est = ...), trt_B_visit_2 = list(est = ...), lsm_A_visit_2 = list(est = ...), lsm_B_visit_2 = list(est = ...), ... )
Please note that "trt" refers to the treatment effects, and "lsm" refers to the least
square mean results. In the above example vars$group has two factor levels A and B.
The new "var" refers to the model estimated variance of the residuals.
If you want to include interaction terms in your model this can be done
by providing them to the covariates argument of rbmi::set_vars()
e.g. set_vars(covariates = c("sex*age")).
Value
a list of variance (var_*), treatment effect (trt_*), and
least square mean (lsm_*) estimates for each visit, organized as
described in Details above.
Note
These functions have the rbmi_ prefix to distinguish them from the corresponding
rbmi package functions, from which they were copied from. Additional features here
include:
Support for more than two treatment groups.
Variance estimates are returned.
See Also
Implements an Analysis of Covariance (ANCOVA)
Description
Performance analysis of covariance. See rbmi_ancova() for full details.
Usage
rbmi_ancova_single(
data,
outcome,
group,
covariates,
weights = c("counterfactual", "equal", "proportional_em", "proportional")
)
Arguments
data
A data.frame containing the data to be used in the model.
outcome
string, the name of the outcome variable in data.
group
string, the name of the group variable in data.
covariates
character vector containing the name of any additional covariates to be included in the model as well as any interaction terms.
weights
Character, either "counterfactual" (default), "equal",
"proportional_em" or "proportional".
Specifies the weighting strategy to be used when calculating the lsmeans.
See the weighting section for more details.
Details
-
groupmust be a factor variable with only 2 levels. -
outcomemust be a continuous numeric variable.
Value
a list containing var with variance estimates as well as
trt_* and lsm_* entries. See rbmi_ancova() for full details.
See Also
Examples
iris2 <- iris[iris$Species %in% c("versicolor", "virginica"), ]
iris2$Species <- factor(iris2$Species)
rbmi_ancova_single(iris2, "Sepal.Length", "Species", c("Petal.Length * Petal.Width"))
MMRM Analysis for Imputed Datasets
Description
Performs an MMRM for two or more groups returning the estimated 'treatment effect' (i.e. the contrast between treatment groups and the control group) and the least square means estimates in each group.
Usage
rbmi_mmrm(
data,
vars,
cov_struct = c("us", "toep", "cs", "ar1"),
visits = NULL,
weights = c("counterfactual", "equal"),
...
)
Arguments
data
(data.frame)
containing the data to be used in the model.
vars
(vars)
list as generated by rbmi::set_vars() . Only the subjid, group,
visit, outcome and covariates elements are required. See details.
cov_struct
(string)
the covariance structure to use. Note that the same
covariance structure is assumed for all treatment groups.
visits
(NULL or character)
An optional character vector specifying
which visits to fit the MMRM at. If NULL, the MMRM model will be fit to
the whole dataset.
weights
(string)
the weighting strategy to be used when calculating the
least square means, either 'counterfactual' or 'equal'.
...
additional arguments passed to mmrm::mmrm() , in particular
method and vcov to control the degrees of freedom and variance-covariance
adjustment methods as well as reml decide between REML and ML estimation.
Details
The function works as follows:
Optionally select the subset of the
datacorresponding to 'visits.Fit an MMRM as
vars$outcome ~ vars$group + vars$visit + vars$covariateswith the specified covariance structure for visits within subjects.Extract the 'treatment effect' & least square means for each treatment group vs the control group.
In order to meet the formatting standards set by rbmi::analyse() the results will be collapsed
into a single list suffixed by the visit name, e.g.:
list( var_B_visit_1 = list(est = ...), trt_B_visit_1 = list(est = ...), lsm_A_visit_1 = list(est = ...), lsm_B_visit_1 = list(est = ...), var_B_visit_2 = list(est = ...), trt_B_visit_2 = list(est = ...), lsm_A_visit_2 = list(est = ...), lsm_B_visit_2 = list(est = ...), ... )
Please note that 'trt' refers to the treatment effects, and 'lsm' refers to the least
square mean results. In the above example vars$group has two factor levels A and B.
The new 'var' refers to the model estimated variance of the residuals at the given
visit, together with the degrees of freedom (which is treatment group specific).
If you want to include additional interaction terms in your model this can be done
by providing them to the covariates argument of rbmi::set_vars()
e.g. set_vars(covariates = c('sex*age')).
Value
a list of variance (var_*), treatment effect (trt_*), and
least square mean (lsm_*) estimates for each visit, organized as
described in Details above.
Note
The group and visit interaction group:visit is not included by
default in the model, therefore please add that to covariates manually if
you want to include it. This will make sense in most cases.
See Also
Extract Single Visit Information from a Fitted MMRM for Multiple Imputation Analysis
Description
Extracts relevant estimates from a given fitted MMRM. See rbmi_mmrm() for full details.
Usage
rbmi_mmrm_single_info(fit, visit_level, visit, group, weights)
Arguments
fit
(mmrm)
the fitted MMRM.
visit_level
(string)
the visit level to extract information for.
visit
(string)
the name of the visit variable.
group
(string)
the name of the group variable.
weights
(string)
the weighting strategy to be used when calculating the
least square means, either 'counterfactual' or 'equal'.
Value
a list with trt_*, var_* and lsm_* elements. See rbmi_mmrm for
full details.
See Also
Add Overall Facet
Description
A function to help add an overall facet to your tables
Usage
real_add_overall_facet(name, label)
Arguments
name
character(1). Name/virtual 'value' for the new facet
label
character(1). label for the new facet
Value
function usable directly as a split function.
Note
current add_overall_facet is bugged, can use that directly after it's fixed https://github.com/insightsengineering/rtables/issues/768
Examples
splfun <- make_split_fun(post = list(real_add_overall_facet('Total', 'Total')))
Removal of Unwanted Column Counts
Description
Remove the N=xx column headers for specified span_label_var columns - default is 'rrisk_header
Usage
remove_col_count(obj, span_label_var = "rrisk_header")
Arguments
obj
table tree object
span_label_var
the spanning header text variable value for which column headers will be removed from
Details
This works for only the lowest level of column splitting (since colcounts is used)
Value
table tree object with column counts in specified columns removed
Pruning function to remove specific rows of a table regardless of counts
Description
This function will remove all rows of a table based on the row text provided by the user.
Usage
remove_rows(removerowtext = NULL, reg_expr = FALSE)
Arguments
removerowtext
define a text string for which any row with row text will be removed.
reg_expr
Apply removerowtext as a regular expression (grepl with fixed = TRUE)
Value
function that can be utilized as pruning function in prune_table
Examples
ADSL <- data.frame(
USUBJID = c(
"XXXXX01", "XXXXX02", "XXXXX03", "XXXXX04", "XXXXX05",
"XXXXX06", "XXXXX07", "XXXXX08", "XXXXX09", "XXXXX10"
),
TRT01P = c(
"ARMA", "ARMB", "ARMA", "ARMB", "ARMB", "Placebo",
"Placebo", "Placebo", "ARMA", "ARMB"
),
Category = c(
"Cat 1", "Cat 2", "Cat 1", "Unknown", "Cat 2",
"Cat 1", "Unknown", "Cat 1", "Cat 2", "Cat 1"
),
SAFFL = c("N", "N", "N", "N", "N", "N", "N", "N", "N", "N"),
PKFL = c("N", "N", "N", "N", "N", "N", "N", "N", "N", "N")
)
ADSL <- ADSL |>
dplyr::mutate(TRT01P = as.factor(TRT01P))
lyt <- basic_table() |>
split_cols_by("TRT01P") |>
analyze(
"Category",
afun = a_freq_j,
extra_args = list(.stats = "count_unique_fraction")
)
result <- build_table(lyt, ADSL)
result
result <- prune_table(result, prune_func = remove_rows(removerowtext = "Unknown"))
result
Formatted Analysis Function for Comparative Statistic in Response Tables (RESP01)
Description
This function applies to a factor column called .var from df.
Usage
resp01_a_comp_stat_factor(df, .var, include, ...)
Arguments
df
(data.frame)
data set containing all analysis variables.
.var
(string)
single variable name that is passed by rtables when requested
by a statistics function.
include
(character)
for which factor levels to include the comparison
statistic results.
...
see resp01_a_comp_stat_logical() for additional required arguments.
Value
The formatted result as rtables::rcell() .
Examples
dm <- droplevels(subset(formatters::DM, SEX %in% c("F", "M")))
resp01_a_comp_stat_factor(
dm,
.var = "COUNTRY",
conf_level = 0.9,
include = c("USA", "CHN"),
arm = "SEX",
strata = "RACE",
stat = "comp_stat_ci",
method = list(comp_stat_ci = "or_cmh"),
formats = list(
comp_stat_ci = jjcsformat_xx("xx.xx (xx.xx - xx.xx)"),
pval = jjcsformat_pval_fct(0.05)
)
)
Formatted Analysis Function for Comparative Statistic in Response Tables (RESP01)
Description
This function applies to a logical column called .var from df.
The response proportion is compared between the treatment arms identified
by column arm.
Usage
resp01_a_comp_stat_logical(
df,
.var,
conf_level,
include,
arm,
strata,
formats,
methods,
stat = c("comp_stat_ci", "pval")
)
Arguments
df
(data.frame)
data set containing all analysis variables.
.var
(string)
single variable name that is passed by rtables when requested
by a statistics function.
conf_level
(proportion)
confidence level of the interval.
include
(flag)
whether to include the results for this variable.
arm
(string)
column name in the data frame that identifies the treatment arms.
strata
(character or NULL)
variable names indicating stratification factors.
formats
(list)
containing formats for comp_stat_ci and pval.
methods
(list)
containing methods for comparative statistics. The element comp_stat_ci can be
'rr' (relative risk), 'or_cmh' (odds ratio with CMH estimation and p-value) or 'or_logistic' (odds ratio
estimated by conditional or standard logistic regression). The element pval can be 'fisher' (Fisher's
exact test) or 'chisq' (chi-square test), only used when using unstratified analyses with 'or_logistic'.
stat
(string)
the statistic to return, either comp_stat_ci
or pval.
Value
The formatted result as rtables::rcell() .
See Also
resp01_a_comp_stat_factor() for the factor equivalent.
Examples
dm <- droplevels(subset(formatters::DM, SEX %in% c("F", "M")))
dm$RESP <- as.logical(sample(c(TRUE, FALSE), size = nrow(DM), replace = TRUE))
resp01_a_comp_stat_logical(
dm,
.var = "RESP",
conf_level = 0.9,
include = TRUE,
arm = "SEX",
strata = "RACE",
stat = "comp_stat_ci",
method = list(comp_stat_ci = "or_cmh"),
formats = list(
comp_stat_ci = jjcsformat_xx("xx.xx (xx.xx - xx.xx)"),
pval = jjcsformat_pval_fct(0.05)
)
)
Formatted Analysis and Content Summary Function for Response Tables (RESP01)
Description
This function applies to both factor and logical columns called
.var from df. Depending on the position in the split, it returns the
right formatted results for the RESP01 and related layouts.
Usage
resp01_acfun(
df,
labelstr = NULL,
label = NULL,
.var,
.spl_context,
include_comp,
.alt_df,
conf_level,
arm,
strata,
formats,
methods
)
Arguments
df
(data.frame)
data set containing all analysis variables.
labelstr
(character)
label of the level of the parent split currently being summarized
(must be present as second argument in Content Row Functions). See rtables::summarize_row_groups()
for more information.
label
(string)
only for logicals, which label to use. (For factors, the
labels are the factor levels.)
.var
(string)
single variable name that is passed by rtables when requested
by a statistics function.
.spl_context
(data.frame)
gives information about ancestor split states
that is passed by rtables.
include_comp
(character or flag)
whether to include comparative
statistic results, either character for factors or flag for logicals.
.alt_df
(data.frame)
alternative data frame used for denominator calculation.
conf_level
(proportion)
confidence level of the interval.
arm
(string)
column name in the data frame that identifies the treatment arms.
strata
(character or NULL)
variable names indicating stratification factors.
formats
(list)
containing formats for prop_ci, comp_stat_ci
and pval.
methods
(list)
containing methods for comparative statistics. The element comp_stat_ci can be
'rr' (relative risk), 'or_cmh' (odds ratio with CMH estimation and p-value) or 'or_logistic' (odds ratio
estimated by conditional or standard logistic regression). The element pval can be 'fisher' (Fisher's
exact test) or 'chisq' (chi-square test), only used when using unstratified analyses with 'or_logistic'.
The element prop_ci specifies the method for proportion confidence interval calculation.
Value
The formatted result as rtables::in_rows() result.
Examples
fake_spl_context <- data.frame(
cur_col_split_val = I(list(c(ARM = "A: Drug X", count_prop = "count_prop")))
)
dm <- droplevels(subset(DM, SEX %in% c("F", "M")))
resp01_acfun(
dm,
.alt_df = dm,
.var = "COUNTRY",
.spl_context = fake_spl_context,
conf_level = 0.9,
include_comp = c("USA", "CHN"),
arm = "SEX",
strata = "RACE",
methods = list(
comp_stat_ci = "or_cmh",
pval = "",
prop_ci = "wald"
),
formats = list(
prop_ci = jjcsformat_xx("xx.% - xx.%"),
comp_stat_ci = jjcsformat_xx("xx.xx (xx.xx - xx.xx)"),
pval = jjcsformat_pval_fct(0.05)
)
)
fake_spl_context2 <- data.frame(
cur_col_split_val = I(list(c(ARM = "Overall", comp_stat_ci = "comp_stat_ci")))
)
resp01_acfun(
dm,
.alt_df = dm,
.var = "COUNTRY",
.spl_context = fake_spl_context2,
conf_level = 0.9,
include_comp = c("USA", "CHN"),
arm = "SEX",
strata = "RACE",
methods = list(
comp_stat_ci = "or_cmh",
pval = "",
prop_ci = "wald"
),
formats = list(
prop_ci = jjcsformat_xx("xx.% - xx.%"),
comp_stat_ci = jjcsformat_xx("xx.xx (xx.xx - xx.xx)"),
pval = jjcsformat_pval_fct(0.05)
)
)
Content Row Function for Counts of Subgroups in Response Tables (RESP01)
Description
Content Row Function for Counts of Subgroups in Response Tables (RESP01)
Usage
resp01_counts_cfun(df, labelstr, .spl_context, .alt_df, label_fstr)
Arguments
df
(data.frame)
data set containing all analysis variables.
labelstr
(character)
label of the level of the parent split currently being summarized
(must be present as second argument in Content Row Functions). See rtables::summarize_row_groups()
for more information.
.spl_context
(data.frame)
gives information about ancestor split states
that is passed by rtables.
.alt_df
(data.frame)
alternative data frame used for denominator calculation.
label_fstr
(string)
format string for the label.
Value
The correct rtables::in_rows() result.
Examples
fake_spl_context <- data.frame(
cur_col_split_val = I(list(c(ARM = "A: Drug X", count_prop = "count_prop")))
)
resp01_counts_cfun(
df = DM,
labelstr = "Blue",
.spl_context = fake_spl_context,
.alt_df = DM,
label_fstr = "Color: %s"
)
Split Function Factory for the Response Tables (RESP01)
Description
The main purpose here is to have a column dependent split into either comparative statistic (relative risk or odds ratio with p-value) in the 'Overall' column, and count proportions and corresponding confidence intervals in the other treatment arm columns.
Usage
resp01_split_fun_fct(method = c("rr", "or_logistic", "or_cmh"), conf_level)
Arguments
method
(string)
which method to use for the comparative statistics.
conf_level
(proportion)
confidence level of the interval.
Value
A split function for use in the response table RESP01 and similar ones.
See Also
rtables::make_split_fun() describing the requirements for this kind of
post-processing function.
Examples
split_fun <- resp01_split_fun_fct(
method = "or_cmh",
conf_level = 0.95
)
Count denom fraction statistic
Description
Derives the count_denom_fraction statistic (i.e., 'xx /xx (xx.x percent)' ) Summarizes the number of unique subjects with a response = 'Y' for a given variable (e.g. TRTEMFL) within each category of another variable (e.g., SEX). Note that the denominator is derived using input df, in order to have these aligned with alt_source_df, it is expected that df includes all subjects.
Usage
response_by_var(
df,
labelstr = NULL,
.var,
.N_col,
resp_var = NULL,
id = "USUBJID",
.format = jjcsformat_count_denom_fraction,
...
)
Arguments
df
Name of dataframe being analyzed.
labelstr
Custom label for the variable being analyzed.
.var
Name of the variable being analyzed. Records with non-missing values will be counted in the denominator.
.N_col
numeric(1). The total for the current column.
resp_var
Name of variable, for which, records with a value of 'Y' will be counted in the numerator.
id
Name of column in df which will have patient identifiers
.format
Format for the count/denominator/fraction output.
...
Additional arguments passed to the function.
Details
This is an analysis function for use within analyze. Arguments
df, .var will be populated automatically by rtables during
the tabulation process.
Value
a RowsVerticalSection for use by the internal tabulation machinery of rtables
Examples
library(dplyr)
ADAE <- data.frame(
USUBJID = c(
"XXXXX01", "XXXXX02", "XXXXX03", "XXXXX04", "XXXXX05",
"XXXXX06", "XXXXX07", "XXXXX08", "XXXXX09", "XXXXX10"
),
SEX_DECODE = c(
"Female", "Female", "Male", "Female", "Male",
"Female", "Male", "Female", "Male", "Female"
),
TRT01A = c(
"ARMA", "ARMB", "ARMA", "ARMB", "ARMB",
"Placebo", "Placebo", "Placebo", "ARMA", "ARMB"
),
TRTEMFL = c("Y", "Y", "N", "Y", "Y", "Y", "Y", "N", "Y", "Y")
)
ADAE <- ADAE |>
mutate(
TRT01A = as.factor(TRT01A),
SEX_DECODE = as.factor(SEX_DECODE)
)
lyt <- basic_table() |>
split_cols_by("TRT01A") |>
analyze(
vars = "SEX_DECODE",
var_labels = "Sex, n/Ns (%)",
show_labels = "visible",
afun = response_by_var,
extra_args = list(resp_var = "TRTEMFL"),
nested = FALSE
)
result <- build_table(lyt, ADAE)
result
Removal of Levels
Description
custom function for removing level inside pre step in make_split_fun.
Usage
rm_levels(excl)
Arguments
excl
Choose which level(s) to remove
Value
a function implementing pre-processing split behavior (for use in
make_split_fun(pre = ) which removes the levels in excl from the data
before facets are generated.
rm_other_facets_fact
Description
rm_other_facets_fact
Usage
rm_other_facets_fact(nm)
Arguments
nm
character. names of facets to keep. all other facets will be removed
Value
a function suitable for use within the post portion make_split_fun
Junco Extended ANCOVA Function
Description
Extension to tern:::s_ancova, 3 extra statistics are returned
-
lsmean_se: Marginal mean and estimated SE in the group. -
lsmean_ci: Marginal mean and associated confidence interval in the group. -
lsmean_diffci: Difference in mean and associated confidence level in one combined statistic. In addition, the LS mean weights can be specified. In addition, also a NULL .ref_group can be specified, the lsmean_diff related estimates will be returned as NA.
Usage
s_ancova_j(
df,
.var,
.df_row,
variables,
.ref_group,
.in_ref_col,
conf_level,
interaction_y = FALSE,
interaction_item = NULL,
weights_emmeans = "counterfactual"
)
Arguments
df
: need to check on how to inherit params from tern::s_ancova
.var
(string)
single variable name that is passed by rtables when requested
by a statistics function.
.df_row
(data.frame)
data set that includes all the variables that are called in .var and variables.
variables
(named list of string)
list of additional analysis variables, with expected elements:
-
arm(string)
group variable, for which the covariate adjusted means of multiple groups will be summarized. Specifically, the first level ofarmvariable is taken as the reference group. -
covariates(character)
a vector that can contain single variable names (such as"X1"), and/or interaction terms indicated by"X1 * X2".
.ref_group
(data.frame or vector)
the data corresponding to the reference group.
.in_ref_col
(flag)
TRUE when working with the reference level, FALSE otherwise.
conf_level
(proportion)
confidence level of the interval.
interaction_y
(string or flag)
a selected item inside of the interaction_item variable which will be
used to select the specific ANCOVA results. if the interaction is not needed, the default option is FALSE.
interaction_item
(string or NULL)
name of the variable that should have interactions
with arm. if the interaction is not needed, the default option is NULL.
weights_emmeans
(string)
argument from emmeans::emmeans() , "counterfactual" by default.
Value
returns a named list of 8 statistics (3 extra compared to tern:::s_ancova()).
See Also
Other Inclusion of ANCOVA Functions:
a_summarize_ancova_j(),
a_summarize_aval_chg_diff_j()
Examples
library(dplyr)
library(tern)
df <- iris |> filter(Species == "virginica")
.df_row <- iris
.var <- "Petal.Length"
variables <- list(arm = "Species", covariates = "Sepal.Length * Sepal.Width")
.ref_group <- iris |> filter(Species == "setosa")
conf_level <- 0.95
s_ancova_j(df, .var, .df_row, variables, .ref_group, .in_ref_col = FALSE, conf_level)
s_function for proportion of factor levels
Description
A simple statistics function which prepares the numbers with percentages in the required format. The denominator here is from the alternative counts data set in the given row and column split.
If a total row is shown, then here just the total number is shown (without 100%).
Usage
s_proportion_factor(
x,
.alt_df,
use_alt_counts = TRUE,
show_total = c("none", "top", "bottom"),
total_label = "Total"
)
Arguments
x
(factor)
categorical variable we want to analyze.
.alt_df
(data.frame)
alternative data frame used for denominator calculation.
use_alt_counts
(flag)
whether the .alt_df should be used for the total, i.e. the denominator.
If not, then the number of non-missing values in x is used.
show_total
(string)
show the total level optionally on the top or in the bottom
of the factor levels.
total_label
(string)
which label to use for the optional total level.
Value
The rtables::in_rows() result with the proportion statistics.
See Also
s_proportion_logical() for tabulating logical x.
s_function for proportion of TRUE in logical vector
Description
A simple statistics function which prepares the numbers with percentages in the required format. The denominator here is from the alternative counts data set in the given row and column split.
Usage
s_proportion_logical(x, label = "Responders", .alt_df)
Arguments
x
(logical)
binary variable we want to analyze.
label
(string)
label to use.
.alt_df
(data.frame)
alternative data frame used for denominator calculation.
Value
The rtables::in_rows() result with the proportion statistics.
See Also
s_proportion_factor() for tabulating factor x.
Safely Prune Table With Empty Table Message If Needed
Description
Safely Prune Table With Empty Table Message If Needed
Usage
safe_prune_table(
tt,
prune_func = prune_empty_level,
stop_depth = NA,
empty_msg = " - No Data To Display - ",
spancols = FALSE
)
Arguments
tt
(TableTree or related class)
a TableTree object representing a populated table.
prune_func
(function)
a function to be called on each subtree which returns TRUE if the
entire subtree should be removed.
stop_depth
(numeric(1))
the depth after which subtrees should not be checked for pruning.
Defaults to NA which indicates pruning should happen at all levels.
empty_msg
character(1). The message to place in the table if no rows were left after pruning
spancols
logical(1). Should empty_msg be spanned
across the table's columns (TRUE) or placed in the
rows row label (FALSE). Defaults to FALSE currently.
Value
tt pruned based on the arguments, or, if
pruning would remove all rows, a TableTree with the
same column structure, and one row containing the
empty message spanning all columns
Examples
prfun <- function(tt) TRUE
lyt <- basic_table() |>
split_cols_by("ARM") |>
split_cols_by("STRATA1") |>
split_rows_by("SEX") |>
analyze("AGE")
tbl <- build_table(lyt, ex_adsl)
safe_prune_table(tbl, prfun)
Set Output Titles
Description
Retrieves titles and footnotes from the list specified in the titles argument and appends them to the table tree specified in the obj argument.
Usage
set_titles(obj, titles)
Arguments
obj
The table tree to which the titles and footnotes will be appended.
titles
The list object containing the titles and footnotes to be appended.
Value
The table tree object specified in the obj argument, with titles and footnotes appended.
See Also
Used in all template scripts
Shortcut for Creating Custom Column Splits
Description
This is a short cut for a common use of rtables::make_split_result() where you need to create
custom column splits with different labels but using the same full dataset for each column.
It automatically sets up the values, datasplit (using the same full dataset for each column),
and subset_exprs (using TRUE for all subsets) parameters for make_split_result().
Usage
short_split_result(..., fulldf)
Arguments
...
sequence of named labels for the columns.
fulldf
(data.frame)
the fulldf which will be used for each column.
Value
The result from rtables::make_split_result() .
Colwidths for all columns to be forced on one page
Description
Colwidths for all columns to be forced on one page
Usage
smart_colwidths_1page(
tt,
fontspec,
col_gap = 6L,
rowlabel_width = inches_to_spaces(2, fontspec),
print_width_ins = ifelse(landscape, 11, 8.5) - 2.12,
landscape = FALSE,
lastcol_gap = TRUE
)
Arguments
tt
TableTree object to calculate column widths for
fontspec
Font specification object
col_gap
Column gap in spaces
rowlabel_width
Width of row labels in spaces
print_width_ins
Print width in inches
landscape
Whether the output is in landscape orientation
lastcol_gap
Whether to include a gap after the last column
Title Case Conversion
Description
Title Case Conversion
Usage
string_to_title(x)
Arguments
x
Input string
Value
String converted to title case (first letter of each word capitalized)
Layout Generating Function for TEFOS03 and Related Cox Regression Layouts
Description
Layout Generating Function for TEFOS03 and Related Cox Regression Layouts
Usage
summarize_coxreg_multivar(
lyt,
var,
variables,
control = control_coxreg(),
formats = list(coef_se = jjcsformat_xx("xx.xx (xx.xx)"), hr_est =
jjcsformat_xx("xx.xx"), hr_ci = jjcsformat_xx("(xx.xx, xx.xx)"), pval =
jjcsformat_pval_fct(0))
)
Arguments
lyt
(layout)
input layout where analyses will be added to.
var
(string)
any variable from the data, because this is not used.
variables
(named list of string)
list of additional analysis variables.
control
(list)
relevant list of control options.
formats
(named character or list)
formats for the statistics. See Details in analyze_vars for more
information on the 'auto' setting.
Value
lyt modified to add the desired cox regression table section.
Examples
anl <- tern::tern_ex_adtte |>
dplyr::mutate(EVENT = 1 - CNSR)
variables <- list(
time = "AVAL",
event = "EVENT",
arm = "ARM",
covariates = c("SEX", "AGE")
)
basic_table() |>
summarize_coxreg_multivar(
var = "STUDYID",
variables = variables
) |>
build_table(df = anl)
Layout Generating Function for LS Means Wide Table Layouts
Description
Layout Generating Function for LS Means Wide Table Layouts
Usage
summarize_lsmeans_wide(
lyt,
variables,
ref_level,
treatment_levels,
conf_level,
pval_sided = "2",
include_variance = TRUE,
include_pval = TRUE,
formats = list(lsmean = jjcsformat_xx("xx.x"), mse = jjcsformat_xx("xx.x"), df =
jjcsformat_xx("xx."), lsmean_diff = jjcsformat_xx("xx.x"), se =
jjcsformat_xx("xx.xx"), ci = jjcsformat_xx("(xx.xx, xx.xx)"), pval =
jjcsformat_pval_fct(0))
)
Arguments
lyt
empty layout, i.e. result of rtables::basic_table()
variables
(named list of string)
list of additional analysis variables.
ref_level
(string)
the reference level of the treatment arm variable.
treatment_levels
(character)
the non-reference levels of the treatment arm
variable.
conf_level
(proportion)
confidence level of the interval.
pval_sided
(string)
either '2' for two-sided or '1' for 1-sided with greater than
control or '-1' for 1-sided with smaller than control alternative hypothesis.
include_variance
(flag)
whether to include the variance statistics
(M.S. error and d.f.).
include_pval
(flag)
whether to include the p-value column.
formats
(named character or list)
formats for the statistics. See Details in analyze_vars for more
information on the 'auto' setting.
Value
Modified layout.
Examples
variables <- list(
response = "FEV1",
covariates = c("RACE", "SEX"),
arm = "ARMCD",
id = "USUBJID",
visit = "AVISIT"
)
fit <- fit_ancova(
vars = variables,
data = mmrm::fev_data,
conf_level = 0.9,
weights_emmeans = "equal"
)
anl <- broom::tidy(fit)
basic_table() |>
summarize_lsmeans_wide(
variables = variables,
ref_level = fit$ref_level,
treatment_levels = fit$treatment_levels,
pval_sided = "2",
conf_level = 0.8
) |>
build_table(df = anl)
Dynamic tabulation of MMRM results with tables
Description
These functions can be used to produce tables for MMRM results, within tables which are split by arms and visits. This is helpful when higher-level row splits are needed (e.g. splits by parameter or subgroup).
Usage
s_summarize_mmrm(
df,
.var,
variables,
ref_levels,
.spl_context,
alternative = c("two.sided", "less", "greater"),
show_relative = c("reduction", "increase"),
...
)
a_summarize_mmrm(
df,
.var,
.spl_context,
...,
.stats = NULL,
.formats = NULL,
.labels = NULL,
.indent_mods = NULL
)
Arguments
df
(data.frame)
data set containing all analysis variables.
.var
(string)
single variable name that is passed by rtables when requested
by a statistics function.
variables
(named list of string)
list of additional analysis variables.
ref_levels
(list)
with visit and arm reference levels.
.spl_context
(data.frame)
gives information about ancestor split states
that is passed by rtables.
alternative
(string)
whether two.sided, or one-sided less or greater p-value
should be displayed.
show_relative
should the 'reduction' (control - treatment, default) or the 'increase'
(treatment - control) be shown for the relative change from baseline?
...
eventually passed to fit_mmrm_j() via h_summarize_mmrm() .
.stats
(character)
statistics to select for the table.
.formats
(named character or list)
formats for the statistics. See Details in analyze_vars for more
information on the 'auto' setting.
.labels
(named character)
labels for the statistics (without indent).
.indent_mods
(named integer)
indent modifiers for the labels. Defaults to 0, which corresponds to the
unmodified default behavior. Can be negative.
Value
-
a_summarize_mmrm()returns the corresponding list with formattedrtables::CellValue().
Functions
-
s_summarize_mmrm(): Statistics function which is extracting estimates, not including any results when in the reference visit, and only showing LS mean estimates when in the reference arm and not in reference visit. It usess_lsmeans()for the final processing. -
a_summarize_mmrm(): Formatted analysis function which is used asafun.
Examples
set.seed(123)
longdat <- data.frame(
ID = rep(DM$ID, 5),
AVAL = c(
rep(0, nrow(DM)),
rnorm(n = nrow(DM) * 4)
),
VISIT = factor(rep(paste0("V", 0:4), each = nrow(DM)))
) |>
dplyr::inner_join(DM, by = "ID")
basic_table() |>
split_rows_by("VISIT") |>
split_cols_by("ARM") |>
analyze(
vars = "AVAL",
afun = a_summarize_mmrm,
na_str = tern::default_na_str(),
show_labels = "hidden",
extra_args = list(
variables = list(
covariates = c("AGE"),
id = "ID",
arm = "ARM",
visit = "VISIT"
),
conf_level = 0.9,
cor_struct = "toeplitz",
ref_levels = list(VISIT = "V0", ARM = "B: Placebo")
)
) |>
build_table(longdat) |>
prune_table(all_zero)
Layout Creating Function Adding Row Counts
Description
This is a simple wrapper of rtables::summarize_row_groups() and the main
additional value is that we can choose whether we want to use the alternative
(usually ADSL) data set for the counts (default) or use the original data set.
Usage
summarize_row_counts(lyt, label_fstr = "%s", alt_counts = TRUE)
Arguments
lyt
(layout)
input layout where analyses will be added to.
label_fstr
(string)
a sprintf style format string.
It can contain up to one %s which takes the current split value and
generates the row label.
alt_counts
(flag)
whether row counts should be taken from
alt_counts_df (TRUE) or from df (FALSE).
Value
A modified layout where the latest row split now has a row group summaries (as created by rtables::summarize_row_groups for the counts. for the counts.
Examples
basic_table() |>
split_cols_by("ARM") |>
add_colcounts() |>
split_rows_by("RACE", split_fun = drop_split_levels) |>
summarize_row_counts(label_fstr = "RACE value - %s") |>
analyze("AGE", afun = list_wrap_x(summary), format = "xx.xx") |>
build_table(DM, alt_counts_df = rbind(DM, DM))
Tabulation of Least Square Means Results
Description
These functions can be used to produce tables from LS means, e.g. from fit_mmrm_j()
or fit_ancova() .
Usage
## S3 method for class 'tern_model'
tidy(x, ...)
s_lsmeans(
df,
.in_ref_col,
alternative = c("two.sided", "less", "greater"),
show_relative = c("reduction", "increase")
)
a_lsmeans(
df,
ref_path,
.spl_context,
...,
.stats = NULL,
.formats = NULL,
.labels = NULL,
.indent_mods = NULL
)
Arguments
x
(numeric)
vector of numbers we want to analyze.
...
additional arguments for the lower level functions.
df
(data.frame)
data set containing all analysis variables.
.in_ref_col
(logical)
TRUE when working with the reference level, FALSE otherwise.
alternative
(string)
whether two.sided, or one-sided less or greater p-value
should be displayed.
show_relative
should the 'reduction' (control - treatment, default) or the 'increase'
(treatment - control) be shown for the relative change from baseline?
ref_path
(character)
global reference group specification, see get_ref_info() .
.spl_context
(data.frame)
gives information about ancestor split states
that is passed by rtables.
.stats
(character)
statistics to select for the table.
.formats
(named character or list)
formats for the statistics. See Details in analyze_vars for more
information on the 'auto' setting.
.labels
(named character)
labels for the statistics (without indent).
.indent_mods
(named integer)
indent modifiers for the labels. Defaults to 0, which corresponds to the
unmodified default behavior. Can be negative.
Value
for s_lsmeans, a list containing the same statistics returned by tern.mmrm::s_mmrm_lsmeans,
with the additional diff_mean_est_ci three-dimensional statistic. For a_lsmeans,
a VertalRowsSection as returned by rtables::in_rows.
Functions
-
tidy(tern_model): Helper method (forbroom::tidy()) to prepare adata.framefrom antern_modelobject containing the least-squares means and contrasts. -
s_lsmeans(): Statistics function which is extracting estimates from a tidied least-squares means data frame. -
a_lsmeans(): Formatted Analysis function to be used asafun
Note
These functions have been forked from the tern.mmrm package. Additional features
are:
Additional
ref_pathargument for tern.mmrm::summarize_lsmeans().The function is more general in that it also works for LS means results from ANCOVA
Additional statistic
diff_mean_est_ciis returnedP-value sidedness can be chosen
Examples
result <- fit_mmrm_j(
vars = list(
response = "FEV1",
covariates = c("RACE", "SEX"),
id = "USUBJID",
arm = "ARMCD",
visit = "AVISIT"
),
data = mmrm::fev_data,
cor_struct = "unstructured",
weights_emmeans = "equal"
)
df <- broom::tidy(result)
s_lsmeans(df[8, ], .in_ref_col = FALSE)
s_lsmeans(df[8, ], .in_ref_col = FALSE, alternative = "greater", show_relative = "increase")
dat_adsl <- mmrm::fev_data |>
dplyr::select(USUBJID, ARMCD) |>
unique()
basic_table() |>
split_cols_by("ARMCD") |>
add_colcounts() |>
split_rows_by("AVISIT") |>
analyze(
"AVISIT",
afun = a_lsmeans,
show_labels = "hidden",
na_str = tern::default_na_str(),
extra_args = list(
.stats = c(
"n",
"adj_mean_se",
"adj_mean_ci",
"diff_mean_se",
"diff_mean_ci"
),
.labels = c(
adj_mean_se = "Adj. LS Mean (Std. Error)",
adj_mean_ci = "95% CI",
diff_mean_ci = "95% CI"
),
.formats = c(adj_mean_se = jjcsformat_xx("xx.x (xx.xx)")),
alternative = "greater",
ref_path = c("ARMCD", result$ref_level)
)
) |>
build_table(
df = broom::tidy(result),
alt_counts_df = dat_adsl
)
Tabulation of RBMI Results
Description
These functions can be used to produce tables from RBMI.
Usage
h_tidy_pool(x, visit_name, group_names)
s_rbmi_lsmeans(df, .in_ref_col, show_relative = c("reduction", "increase"))
a_rbmi_lsmeans(
df,
ref_path,
.spl_context,
...,
.stats = NULL,
.formats = NULL,
.labels = NULL,
.indent_mods = NULL
)
Arguments
x
(list)
is a list of pooled object from rbmi analysis results.
This list includes analysis results, confidence level, hypothesis testing type.
visit_name
(string)
single visit level.
group_names
(character)
group levels.
df
(data.frame)
input with LS means results.
.in_ref_col
(flag)
whether reference column is specified.
show_relative
(string)
'reduction' if (control - treatment, default)
or 'increase' (treatment - control) of relative change from baseline?
ref_path
(character)
global reference group specification, see get_ref_info() .
.spl_context
(data.frame)
gives information about ancestor split states
that is passed by rtables.
...
additional arguments for the lower level functions.
.stats
(character)
statistics to select for the table.
.formats
(named character or list)
formats for the statistics. See Details in analyze_vars for more
information on the 'auto' setting.
.labels
(named character)
labels for the statistics (without indent).
.indent_mods
(named integer)
indent modifiers for the labels. Defaults to 0, which corresponds to the
unmodified default behavior. Can be negative.
Value
The data.frame with results of pooled analysis for a single visit.
A list of statistics extracted from a tidied LS means data frame.
Functions
-
h_tidy_pool(): Helper function to produce data frame with results of pool for a single visit. -
s_rbmi_lsmeans(): Statistics function which is extracting estimates from a tidied RBMI results data frame. -
a_rbmi_lsmeans(): Formatted Analysis function which is used asafun.
Note
These functions have been forked from tern.rbmi. Additional features are:
Additional
ref_pathargument.Extraction of variance statistics in the
tidy()method.Adapted to
rbmiforked functions update with more than two treatment groups.
Analysis Function for TEFOS03 and Related Table Layouts
Description
Analysis Function for TEFOS03 and Related Table Layouts
Usage
tefos03_afun(df, .var, .spl_context, variables, control, formats)
Arguments
df
(data.frame)
data set containing all analysis variables.
.var
(string)
single variable name that is passed by rtables when requested
by a statistics function.
.spl_context
(data.frame)
gives information about ancestor split states
that is passed by rtables.
variables
(list)
see tern::fit_coxreg_multivar() for required variable
specifications.
control
(list)
from tern::control_coxreg() .
formats
(list)
including coef_se, hr_est, hr_ci and pval formats.
First Level Column Split Function for TEFOS03 (mmy) Table Layout
Description
First Level Column Split Function for TEFOS03 (mmy) Table Layout
Usage
tefos03_first_post_fun(ret, spl, fulldf, .spl_context)
See Also
rtables::make_split_fun() for details.
Second Level Column Split Function Factory for TEFOS03 (mmy) Table Layout
Description
Second Level Column Split Function Factory for TEFOS03 (mmy) Table Layout
Usage
tefos03_second_split_fun_fct(conf_level)
Arguments
conf_level
(proportion)
confidence level of the interval.
Value
Split function to use in the TEFOS03 (mmy) and related table layouts.
See Also
tefos03_first_post_fun() for the first level split.
Get default statistical methods and their associated formats, labels, and indent modifiers
Description
Usage
tern_get_stats(
method_groups = "analyze_vars_numeric",
stats_in = NULL,
custom_stats_in = NULL,
add_pval = FALSE,
tern_defaults = tern_default_stats
)
tern_get_formats_from_stats(
stats,
formats_in = NULL,
levels_per_stats = NULL,
tern_defaults = tern_default_formats
)
tern_get_labels_from_stats(
stats,
labels_in = NULL,
levels_per_stats = NULL,
label_attr_from_stats = NULL,
tern_defaults = tern_default_labels
)
tern_get_indents_from_stats(
stats,
indents_in = NULL,
levels_per_stats = NULL,
tern_defaults = stats::setNames(as.list(rep(0L, length(stats))), stats)
)
tern_default_labels
Format
An object of class character of length 40.
Functions
-
tern_get_stats(): Get statistics available for a given method group (analyze function). -
tern_get_formats_from_stats(): Get formats corresponding to a list of statistics. -
tern_get_labels_from_stats(): Get labels corresponding to a list of statistics. -
tern_get_indents_from_stats(): Get row indent modifiers corresponding to a list of statistics/rows. -
tern_default_labels: Namedcharactervector of default labels fortern. This is only copied here from the latest GitHub version, because otherwise a tern test fails.
Note
These functions have been copied from the tern package file
utils_default_stats_formats_labels.R from GitHub development version 0.9.7.9017.
Slight modifications have been applied to enhance functionality:
-
tern_get_statsadded thetern_statsargument to avoid hardcoding within the function's body. -
tern_get_labels_from_statsis more careful when receiving partiallabels_inand partiallabel_attr_from_stats.
Once these features are included in the tern package, this file could be removed from
the junco package, and the functions could be used from the tern namespace directly.
Helper method (for broom::tidy() ) to prepare a data frame from an
pool rbmi object containing the LS means and contrasts and multiple visits
Description
Helper method (for broom::tidy() ) to prepare a data frame from an
pool rbmi object containing the LS means and contrasts and multiple visits
Usage
## S3 method for class 'pool'
tidy(x, visits, ...)
Arguments
x
(pool) is a list of pooled object from rbmi analysis results. This list includes
analysis results, confidence level, hypothesis testing type.
visits
(character)
all visit levels. Otherwise too hard to guess this.
...
Additional arguments. Not used. Needed to match generic signature only.
Value
A data.frame.
Create TableTree as DataFrame via gentlg
Description
Create TableTree as DataFrame via gentlg
Usage
tt_to_tbldf(
tt,
fontspec = font_spec("Times", 9L, 1),
string_map = default_str_map,
markup_df = dps_markup_df
)
Arguments
tt
TableTree object to convert to a data frame
fontspec
Font specification object
string_map
Unicode mapping for special characters
markup_df
Data frame containing markup information
Value
tt represented as a "tbl" data.frame suitable for passing
to tidytlg::gentlg via the huxme argument.
TableTree to .rtf Conversion
Description
A function to convert TableTree to .rtf
Usage
tt_to_tlgrtf(
tt,
file = NULL,
orientation = c("portrait", "landscape"),
colwidths = def_colwidths(tt, fontspec, col_gap = col_gap, label_width_ins =
label_width_ins, type = tlgtype),
label_width_ins = 2,
watermark = NULL,
pagenum = ifelse(tlgtype == "Listing", TRUE, FALSE),
fontspec = font_spec("Times", 9L, 1.2),
pg_width = pg_width_by_orient(orientation == "landscape"),
margins = c(0, 0, 0, 0),
paginate = tlg_type(tt) == "Table",
col_gap = ifelse(tlgtype == "Listing", 0.5, 3),
nosplitin = list(row = character(), col = character()),
verbose = FALSE,
tlgtype = tlg_type(tt),
string_map = default_str_map,
markup_df = dps_markup_df,
combined_rtf = FALSE,
one_table = TRUE,
border_mat = make_header_bordmat(obj = tt),
...
)
Arguments
tt
TableTree object to convert to RTF
file
character(1). File to create, including path, but excluding .rtf extension.
orientation
Orientation of the output ("portrait" or "landscape")
colwidths
Column widths for the table
label_width_ins
Label width in inches
watermark
(optional) String containing the desired watermark for RTF outputs. Vectorized.
pagenum
(optional) Logical. When true page numbers are added on the right side of the footer section in the format page x/y. Vectorized. (Default = FALSE)
fontspec
Font specification object
pg_width
Page width in inches
margins
Margins in inches (top, right, bottom, left)
paginate
Whether to paginate the output
col_gap
Column gap in spaces
nosplitin
list(row=, col=). Path elements whose children should not be paginated within if it can be avoided. e.g., list(col="TRT01A") means don't split within treatment arms unless all the associated columns don't fit on a single page.
verbose
Whether to print verbose output
tlgtype
Type of the output (Table, Listing, or Figure)
string_map
Unicode mapping for special characters
markup_df
Data frame containing markup information
combined_rtf
logical(1). In the case where the result is broken up into multiple
parts due to width, should a combined rtf file also be created. Defaults to FALSE.
one_table
logical(1). If tt is a (non-MatrixPrintForm) list,
should the parts be added to the rtf within a single table (TRUE, the
default) or as separate tables. End users will not generally need to set this.
border_mat
matrix. A m x k matrix where m is the number of columns of tt
and k is the number of lines the header takes up. See tidytlg::add_bottom_borders
for what the matrix should contain. Users should only specify this when the
default behavior does not meet their needs.
...
Additional arguments passed to gentlg
Details
This function aids in converting the rtables TableTree into the desired .rtf file.
Value
If file is non-NULL, this is called for the side-effect of writing
one or more RTF files. Otherwise, returns a list of huxtable objects.
Note
file should always include path. Path will be extracted
and passed separately to gentlg.
When one_table is FALSE, only the width of the row label
pseudocolumn can be directly controlled due to a limitation in
tidytlg::gentlg. The proportion of the full page that the first value
in colwidths would take up is preserved and all other columns equally
split the remaining available width. This will cause, e.g., the
elements within the allparts rtf generated when combined_rtf is TRUE
to differ visually from the content of the individual part rtfs.
See Also
Used in all table and listing scripts
Relabel Variables in a Dataset
Description
This function relabels variables in a dataset based on a provided list of labels. It can either replace existing labels or only add labels to variables without them.
Usage
var_relabel_list(x, lbl_list, replace_existing = TRUE)
Arguments
x
(data.frame)
dataset containing variables to be relabeled.
lbl_list
(list)
named list of labels to apply to variables.
replace_existing
(logical)
if TRUE, existing labels will be replaced;
if FALSE, only variables without labels will be updated.
Value
The dataset with updated variable labels.