In this vignette we focus on providing more explanation on how the inTextSummaryTable package actually works. We would describe some of the functionalities less exposed to the users.
We assume you are already familiar on how to create and export tables, otherwise we advise to first check out the dedicated vignettes for creating and exporting tables. The vignettes are accessible with the commands below.
vignette("inTextSummaryTable-createTables", "inTextSummaryTable")
vignette("inTextSummaryTable-exportTables", "inTextSummaryTable")We will first create example data sets to show how the exporting functionalities work. The data sets used are available in the clinUtils package.
library(inTextSummaryTable)
library(clinUtils)
library(pander)
library(tools) # toTitleCase# load example data
data(dataADaMCDISCP01)
dataAll <- dataADaMCDISCP01
labelVars <- attr(dataAll, "labelVars")
dataADSL <- dataADaMCDISCP01$ADSLdataAE <-  subset(dataAll$ADAE, SAFFL == "Y" & TRTEMFL == "Y")
dataAEInterest <- subset(dataAE, AESOC %in% c(
        "INFECTIONS AND INFESTATIONS",
        "GENERAL DISORDERS AND ADMINISTRATION SITE CONDITIONS"
    )
)
# ensure that order of elements is the one specified in 
# the corresponding numeric variable
dataAEInterest$TRTA <- reorder(dataAEInterest$TRTA, dataAEInterest$TRTAN)
dataAEInterest$AESEV <- factor(dataAEInterest$AESEV, levels = c("MILD", "MODERATE"))
dataTotalAE <- subset(dataAll$ADSL, TRT01A != "Placebo")
# should contain columns specified in 'colVar'
dataTotalAE$TRTA <- dataTotalAE$TRT01A The getSummaryStatisticsTable consists of the following framework:
computeSummaryStatisticsTable functionoutputType parameterThe supporting data for the summary statistics table, is accessed via the computeSummaryStatisticsTable. This includes the entire set of statistics (as numeric) and combined statistic set.
The output from the computeSummaryStatisticsTable is equivalent of the table output by the getSummaryStatisticsTable function when the outputType is set to ‘data.frame-base’.
summaryTable <- computeSummaryStatisticsTable(
    data = dataAEInterest,
    rowVar = c("AESOC", "AEDECOD"),
    rowVarTotalInclude = c("AESOC", "AEDECOD"),
    colVar = "TRTA",
    stats = getStats("n (%)"),
    dataTotal = dataTotalAE,
    labelVars = labelVars,
    rowVarLab = c('AESOC' = "TEAE by SOC and Preferred Term\nn (%)")
)
pander(head(summaryTable, 3))| AESOC | AEDECOD | 
|---|---|
| GENERAL DISORDERS AND ADMINISTRATION SITE CONDITIONS | APPLICATION SITE DERMATITIS | 
| GENERAL DISORDERS AND ADMINISTRATION SITE CONDITIONS | APPLICATION SITE ERYTHEMA | 
| GENERAL DISORDERS AND ADMINISTRATION SITE CONDITIONS | APPLICATION SITE IRRITATION | 
| TRTA | isTotal | statN | statm | statPercTotalN | statPercN | 
|---|---|---|---|---|---|
| Xanomeline Low Dose | FALSE | 0 | 0 | 2 | 0 | 
| Xanomeline Low Dose | FALSE | 2 | 2 | 2 | 100 | 
| Xanomeline Low Dose | FALSE | 1 | 2 | 2 | 50 | 
| n (%) | 
|---|
| 0 | 
| 2 (100) | 
| 1 (50.0) | 
Please note the presence of the isTotal column, which flags the records containing the number of subjects reported in the table header.
pander(subset(summaryTable, isTotal))| AESOC | AEDECOD | TRTA | isTotal | statN | statm | |
|---|---|---|---|---|---|---|
| 13 | NA | NA | Xanomeline Low Dose | TRUE | 2 | 2 | 
| 26 | NA | NA | Xanomeline High Dose | TRUE | 3 | 3 | 
| statPercTotalN | statPercN | n (%) | |
|---|---|---|---|
| 13 | 2 | 100 | 2 (100) | 
| 26 | 3 | 100 | 3 (100) | 
The summary table is exported to the format of interest with:
export(
    summaryTable = summaryTable,
    outputType = "flextable"
)| TEAE by SOC and Preferred Term | Xanomeline Low Dose | Xanomeline High Dose | 
|---|---|---|
| Dictionary-Derived Term | ||
| Any TEAE by SOC and Preferred Term | 2 (100) | 3 (100) | 
| GENERAL DISORDERS AND ADMINISTRATION SITE CONDITIONS | 2 (100) | 3 (100) | 
| APPLICATION SITE DERMATITIS | 0 | 1 (33.3) | 
| APPLICATION SITE ERYTHEMA | 2 (100) | 1 (33.3) | 
| APPLICATION SITE IRRITATION | 1 (50.0) | 1 (33.3) | 
| APPLICATION SITE PRURITUS | 2 (100) | 2 (66.7) | 
| FATIGUE | 0 | 1 (33.3) | 
| SECRETION DISCHARGE | 1 (50.0) | 0 | 
| SUDDEN DEATH | 1 (50.0) | 0 | 
| INFECTIONS AND INFESTATIONS | 1 (50.0) | 1 (33.3) | 
| LOWER RESPIRATORY TRACT INFECTION | 0 | 1 (33.3) | 
| PNEUMONIA | 1 (50.0) | 0 | 
Please see the vignette: inTextSummaryTable-exportTables for more information on the different export types available.
combine functionSummary statistics tables can be combined with the combine function.
tableDemoCat <- computeSummaryStatisticsTable(
    data = dataADSL,
    var = c("SEX", "AGE"), varInclude0 = TRUE,
    colVar = "TRT01P",
    stats = getStats("n (%)", includeName = FALSE),
    labelVars = labelVars
)
tableDemoCont <- computeSummaryStatisticsTable(
    data = dataADSL,
    var = c("HEIGHTBL", "WEIGHTBL"),
    colVar = "TRT01P",
    stats = getStats(c("n", "Mean")),
    labelVars = labelVars
)
tableDemo <- combine(tableDemoCat, tableDemoCont)
export(tableDemo)| Placebo | Xanomeline High Dose | Xanomeline Low Dose | |
|---|---|---|---|
| Sex | |||
| F | 1 (50.0) | 2 (66.7) | 2 (100) | 
| M | 1 (50.0) | 1 (33.3) | 0 | 
| Age | 2 (100) | 3 (100) | 2 (100) | 
| Baseline Height (cm) | |||
| n | 2 | 3 | 2 | 
| Mean | 167.7 | 163 | 155.6 | 
| Baseline Weight (kg) | |||
| n | 2 | 3 | 2 | 
| Mean | 59.65 | 68.5 | 54.45 | 
The tables created via the inTextSummaryTable are simple R data.frame objects, so these can be combined/update to include extra statistics of interest.
The general workflow is to:
computeSummaryStatisticsTable function)data.frame with your statistics of relevance - in a similar formatexportSummaryStatisticsTable function)For example, we combine the descriptive statistics table created above with a set of pre-computed statistics (e.g. p-values of the difference between the treatment groups).
dataADSL$TRT01P <- with(dataADSL, reorder(TRT01P, TRT01PN))
# check format of table created with the package:
descTable <- tableDemoCont
descTable[, c("variable", "TRT01P", "isTotal", "n", "Mean")]##               variable               TRT01P isTotal n  Mean
## 1 Baseline Height (cm)              Placebo   FALSE 2 167.7
## 2 Baseline Weight (kg)              Placebo   FALSE 2 59.65
## 3                 <NA>              Placebo    TRUE 2    NA
## 4 Baseline Height (cm) Xanomeline High Dose   FALSE 3   163
## 5 Baseline Weight (kg) Xanomeline High Dose   FALSE 3  68.5
## 6                 <NA> Xanomeline High Dose    TRUE 3    NA
## 7 Baseline Height (cm)  Xanomeline Low Dose   FALSE 2 155.6
## 8 Baseline Weight (kg)  Xanomeline Low Dose   FALSE 2 54.45
## 9                 <NA>  Xanomeline Low Dose    TRUE 2    NA# add p-values in an extra row
infTable <- unique(subset(descTable, !isTotal)[, c("variable", "TRT01P"), drop = FALSE])
infTable[which(infTable$variable == "Baseline Height (cm)"), "pValue"] <- 1e-10
infTable[which(infTable$variable == "Baseline Weight (kg)"), "pValue"] <- 1e-9
summaryTable <- plyr::rbind.fill(descTable, infTable)
exportSummaryStatisticsTable(
    summaryTable = summaryTable, 
    rowVar = "variable", 
    colVar = "TRT01P", 
    statsVar = c("n", "Mean", "pValue") 
)| variable | Placebo | Xanomeline High Dose | Xanomeline Low Dose | 
|---|---|---|---|
| Baseline Height (cm) | |||
| n | 2 | 3 | 2 | 
| Mean | 167.7 | 163 | 155.6 | 
| pValue | 1e-10 | 1e-10 | 1e-10 | 
| Baseline Weight (kg) | |||
| n | 2 | 3 | 2 | 
| Mean | 59.65 | 68.5 | 54.45 | 
| pValue | 1e-09 | 1e-09 | 1e-09 | 
compLab <- "Comparison between treatments (p-value)"
# add p-values in a new column - in an extra row
infTable <- unique(subset(descTable, !isTotal)[, "variable", drop = FALSE])
infTable$TRT01P <- compLab
infTable[which(infTable$variable == "Baseline Height (cm)"), "pValue"] <- 1e-10
infTable[which(infTable$variable == "Baseline Weight (kg)"), "pValue"] <- 1e-9 
summaryTable <- plyr::rbind.fill(descTable, infTable) 
# order columns to have comparison column as last 
summaryTable$TRT01P <- factor(summaryTable$TRT01P, levels = c(levels(dataADSL$TRT01P), compLab))
exportSummaryStatisticsTable(
    summaryTable = summaryTable,  
    rowVar = "variable",  
    colVar = "TRT01P",  
    statsVar = c("n", "Mean", "pValue")
)| variable | Placebo | Xanomeline Low Dose | Xanomeline High Dose | Comparison between treatments (p-value) | 
|---|---|---|---|---|
| Baseline Height (cm) | ||||
| n | 2 | 2 | 3 | - | 
| Mean | 167.7 | 155.6 | 163 | - | 
| pValue | - | - | - | 1e-10 | 
| Baseline Weight (kg) | ||||
| n | 2 | 2 | 3 | - | 
| Mean | 59.65 | 54.45 | 68.5 | - | 
| pValue | - | - | - | 1e-09 | 
infTable <- unique(subset(descTable, !isTotal)[, "variable", drop = FALSE])
infTable$TRT01P <- compLab
infTable[which(infTable$variable == "Baseline Height (cm)"), "Mean"] <- 1e-10
infTable[which(infTable$variable == "Baseline Weight (kg)"), "Mean"] <- 1e-9
summaryTable <- plyr::rbind.fill(descTable, infTable) 
# order columns to have comparison column as last 
summaryTable$TRT01P <- factor(summaryTable$TRT01P, levels = c(levels(dataADSL$TRT01P), compLab)) 
exportSummaryStatisticsTable(
    summaryTable = summaryTable,
    rowVar = "variable",
    colVar = "TRT01P",
    statsVar = c("n", "Mean")
)| variable | Placebo | Xanomeline Low Dose | Xanomeline High Dose | Comparison between treatments (p-value) | 
|---|---|---|---|---|
| Baseline Height (cm) | ||||
| n | 2 | 2 | 3 | - | 
| Mean | 167.7 | 155.6 | 163 | 1e-10 | 
| Baseline Weight (kg) | ||||
| n | 2 | 2 | 3 | - | 
| Mean | 59.65 | 54.45 | 68.5 | 1e-09 | 
The variables used for the row and columns of the summary statistics tables should be present in a long format in the input data for the getSummaryStatisticsTable function.
In case the grouping of the rows/columns is more complex and no grouping variable is yet available in the data, the function combineVariables offers simpler functionalities to create the input data.
The label for the grouping is extracted from the SAS dataset labels if labelVars is specified, or can be customized (label parameter).
For example, the adverse events are counted for different population set: screened population, completer population, only events with high severity, or related to the treatment and with high severity.
# prepare the data: create grouping of interest
dataAEGroup <- combineVariables(
    data = dataAEInterest,
    newVar = "AEGRP",
    paramsList = list(
        # for all screened patients
        list(var = "TRTA", value = "Xanomeline High Dose"),
        # for moderate severity
        list(var = "AESEV", value = "MODERATE", labelExtra = "Moderate"),
        list(var = "AENDY", label = paste("With adverse events ending date"))
    ),
    # include also counts for all records
    includeAll = TRUE,
    labelAll = "All Adverse events", 
    labelVars = labelVars
)
labelVars["AEGRP"] <- "Patient groups of interest"
# create the table
getSummaryStatisticsTable(
    data = dataAEGroup,
    colVar = "TRTA", 
    rowVar = "AEGRP", 
    labelVars = labelVars,
    dataTotal = dataTotalAE,
    stats = list(expression(paste0(statN, " (", round(statPercN, 1), ")"))),
    title = "Table: Adverse events: counts for groups of interest",
    footer = "Statistics: n (%)"
)| Table: Adverse events: counts for groups of interest | |||
|---|---|---|---|
| Patient groups of interest | Xanomeline Low Dose | Xanomeline High Dose | |
| All Adverse events | 2 (100) | 3 (100) | 0 (NA) | 
| Actual Treatment | 0 (0) | 3 (100) | 0 (NA) | 
| Severity/Intensity Moderate | 1 (50) | 3 (100) | 0 (NA) | 
| With adverse events ending date | 2 (100) | 3 (100) | 0 (NA) | 
| Statistics: n (%) | |||
R version 4.2.2 (2022-10-31)
Platform: x86_64-pc-linux-gnu (64-bit)
locale: LC_CTYPE=en_US.UTF-8, LC_NUMERIC=C, LC_TIME=en_US.UTF-8, LC_COLLATE=C, LC_MONETARY=en_US.UTF-8, LC_MESSAGES=en_US.UTF-8, LC_PAPER=en_US.UTF-8, LC_NAME=C, LC_ADDRESS=C, LC_TELEPHONE=C, LC_MEASUREMENT=en_US.UTF-8 and LC_IDENTIFICATION=C
attached base packages: tools, stats, graphics, grDevices, utils, datasets, methods and base
other attached packages: pander(v.0.6.5), clinUtils(v.0.1.4), inTextSummaryTable(v.3.3.0) and knitr(v.1.42)
loaded via a namespace (and not attached): ggrepel(v.0.9.3), Rcpp(v.1.0.10), digest(v.0.6.31), utf8(v.1.2.3), mime(v.0.12), plyr(v.1.8.8), R6(v.2.5.1), evaluate(v.0.20), ggplot2(v.3.4.1), pillar(v.1.8.1), gdtools(v.0.3.1), rlang(v.1.0.6), curl(v.5.0.0), uuid(v.1.1-0), data.table(v.1.14.8), jquerylib(v.0.1.4), DT(v.0.27), flextable(v.0.8.6), rmarkdown(v.2.20), textshaping(v.0.3.6), stringr(v.1.5.0), htmlwidgets(v.1.6.1), munsell(v.0.5.0), shiny(v.1.7.4), compiler(v.4.2.2), httpuv(v.1.6.9), xfun(v.0.37), pkgconfig(v.2.0.3), askpass(v.1.1), systemfonts(v.1.0.4), gfonts(v.0.2.0), htmltools(v.0.5.4), openssl(v.2.0.5), tidyselect(v.1.2.0), tibble(v.3.1.8), fontBitstreamVera(v.0.1.1), httpcode(v.0.3.0), viridisLite(v.0.4.1), fansi(v.1.0.4), crayon(v.1.5.2), dplyr(v.1.1.0), later(v.1.3.0), crul(v.1.3), grid(v.4.2.2), jsonlite(v.1.8.4), xtable(v.1.8-4), gtable(v.0.3.1), lifecycle(v.1.0.3), magrittr(v.2.0.3), scales(v.1.2.1), zip(v.2.2.2), stringi(v.1.7.12), cli(v.3.6.0), cachem(v.1.0.7), reshape2(v.1.4.4), promises(v.1.2.0.1), xml2(v.1.3.3), bslib(v.0.4.2), ellipsis(v.0.3.2), ragg(v.1.2.5), generics(v.0.1.3), vctrs(v.0.5.2), cowplot(v.1.1.1), forcats(v.1.0.0), glue(v.1.6.2), officer(v.0.6.0), fontquiver(v.0.2.1), hms(v.1.1.2), crosstalk(v.1.2.0), fastmap(v.1.1.1), yaml(v.2.3.7), colorspace(v.2.1-0), fontLiberation(v.0.1.0), memoise(v.2.0.1), haven(v.2.5.1) and sass(v.0.4.5)