TL Catalog
  1. Tables
  2. Adverse Events
  3. TSFAE07B
  • Introduction

  • Index

  • Tables
    • Adverse Events
      • TSFAE01A
      • TSFAE01B
      • TSFAE02
      • TSFAE02A
      • TSFAE03
      • TSFAE03A
      • TSFAE04
      • TSFAE04A
      • TSFAE05
      • TSFAE05A
      • TSFAE06A
      • TSFAE06B
      • TSFAE07A
      • TSFAE07B
      • TSFAE08
      • TSFAE09
      • TSFAE10
      • TSFAE11
      • TSFAE12
      • TSFAE13
      • TSFAE14
      • TSFAE15
      • TSFAE16
      • TSFAE17A
      • TSFAE17B
      • TSFAE17C
      • TSFAE17D
      • TSFAE19A
      • TSFAE19B
      • TSFAE19C
      • TSFAE19D
      • TSFAE20A
      • TSFAE20B
      • TSFAE20C
      • TSFAE21A
      • TSFAE21B
      • TSFAE21C
      • TSFAE21D
      • TSFAE22A
      • TSFAE22B
      • TSFAE22C
      • TSFAE23A
      • TSFAE23B
      • TSFAE23C
      • TSFAE23D
      • TSFAE24A
      • TSFAE24B
      • TSFAE24C
      • TSFAE24D
      • TSFAE24F
      • TSFDTH01
    • Clinical Laboratory Evaluation
      • TSFLAB01
      • TSFLAB01A
      • TSFLAB02
      • TSFLAB02A
      • TSFLAB02B
      • TSFLAB03
      • TSFLAB03A
      • TSFLAB04A
      • TSFLAB04B
      • TSFLAB05
      • TSFLAB06
      • TSFLAB07
    • Demographic
      • TSIDEM01
      • TSIDEM02
      • TSIMH01
    • Disposition of Subjects
      • TSIDS01
      • TSIDS02
      • TSIDS02A
    • Electrocardiograms
      • TSFECG01
      • TSFECG01A
      • TSFECG02
      • TSFECG03
      • TSFECG04
      • TSFECG05
    • Exposure
      • TSIEX01
      • TSIEX02
      • TSIEX03
      • TSIEX04
      • TSIEX06
      • TSIEX07
      • TSIEX08
      • TSIEX09
      • TSIEX10
      • TSIEX11
    • Pharmacokinetics
      • TPK01A
      • TPK01B
      • TPK02
      • TPK03
    • Prior and Concomitant Therapies
      • TSICM01
      • TSICM02
      • TSICM03
      • TSICM04
      • TSICM05
      • TSICM06
      • TSICM07
      • TSICM08
    • Vital Signs and Physical Findings
      • TSFVIT01
      • TSFVIT01A
      • TSFVIT02
      • TSFVIT03
      • TSFVIT04
      • TSFVIT05
      • TSFVIT06
  • Listings
    • Adverse Events
      • LSFAE01
      • LSFAE02
      • LSFAE03
      • LSFAE04
      • LSFAE05
      • LSFAE06A
      • LSFAE06B
      • LSFDTH01
    • Clinical Laboratory Evaluation
      • LSFLAB01
    • Demographic
      • LSIDEM01
      • LSIDEM02
      • LSIMH01
    • Disposition of Subjects
      • LSIDS01
      • LSIDS02
      • LSIDS03
      • LSIDS04
      • LSIDS05
    • Electrocardiograms
      • LSFECG01
      • LSFECG02
    • Exposure
      • LSIEX01
      • LSIEX02
      • LSIEX03
    • Prior and Concomitant Therapies
      • LSICM01
    • Vital Signs and Physical Findings
      • LSFVIT01
      • LSFVIT02

  • Reproducibility

  • Changelog

On this page

  • Output
  • Edit this page
  • Report an issue
  1. Tables
  2. Adverse Events
  3. TSFAE07B

TSFAE07B

Subjects With Treatment-emergent Adverse Events of Special Interest - AESI Grouping


Output

  • Preview
Code
# Program Name:              tsfae07b.R

# Prep Environment

library(envsetup)
library(tern)
library(dplyr)
library(rtables)
library(junco)

# Define script level parameters:

# - Define output ID and file location

tblid <- "TSFAE07b"
fileid <- tblid
tab_titles <- get_titles_from_file(input_path = '../../_data/', tblid)
string_map <- default_str_map


trtvar <- "TRT01A"
popfl <- "SAFFL"

special_interest_var <- "CQ01NAM"
aerelvar <- "AEREL"
aeactionvar <- "AEACN"

combined_colspan_trt <- TRUE
risk_diff <- TRUE
rr_method <- "wald"
ctrl_grp <- "Placebo"

if (combined_colspan_trt == TRUE) {
  # Set up levels and label for the required combined columns
  add_combo <- add_combo_facet(
    "Combined",
    label = "Combined",
    levels = c("Xanomeline High Dose", "Xanomeline Low Dose")
  )

  # choose if any facets need to be removed - e.g remove the combined column for placebo
  rm_combo_from_placebo <- cond_rm_facets(
    facets = "Combined",
    ancestor_pos = NA,
    value = " ",
    split = "colspan_trt"
  )

  mysplit <- make_split_fun(post = list(add_combo, rm_combo_from_placebo))
}

# Optional lab section parameters
labsection <- TRUE
lab_params <- c("AST", "ALT")
lab_labels <- c("AST>5xULN", "ALT>5xULN")
lab_var <- c("MCRIT1MN", "MCRIT1MN")
lab_vals <- c("2,3", "2,3") # Note both character or numeric values can be enclosed within in one set of double quotations here

# Process Data:

adsl <- pharmaverseadamjnj::adsl %>%
  filter(!!rlang::sym(popfl) == "Y") %>%
  select(STUDYID, USUBJID, all_of(trtvar), all_of(popfl))

lbdata <- NULL

# Optional lab section
if (labsection == TRUE) {
  for (i in 1:length(lab_params)) {
    filter_val <- unlist(strsplit(lab_vals[[i]], ","))

    adlb <- pharmaverseadamjnj::adlb %>%
      filter(
        TRTEMFL == "Y" &
          PARAMCD == lab_params[[i]] &
          !!rlang::sym(lab_var[[i]]) %in% filter_val
      ) %>%
      mutate(criteria = lab_labels[[i]]) %>%
      select(USUBJID, TRTEMFL, PARAMCD, all_of(lab_var[[i]]), criteria)

    lbdata <- bind_rows(adlb, lbdata)
  }

  adlb <- lbdata %>%
    group_by(USUBJID, TRTEMFL, PARAMCD, criteria) %>%
    slice(1) %>%
    ungroup()

  # Create flag variable for each parameter that met the condition to merge back onto adsl
  # Overall row
  adlbparamall <- adlb %>%
    filter(PARAMCD %in% lab_params) %>%
    mutate(lab_flag = "Y") %>%
    group_by(USUBJID) %>%
    slice(1) %>%
    ungroup() %>%
    select(USUBJID, lab_flag)

  adsl <- left_join(adsl, adlbparamall, by = c("USUBJID"))

  # Loop through each parameter that the user has specified and merge flag variable onto adsl
  for (i in 1:length(lab_params)) {
    flagvar <- paste0("lab_flag", i)

    adlbparam <- adlb %>%
      filter(PARAMCD == lab_params[[i]] & criteria == lab_labels[[i]]) %>%
      mutate(!!flagvar := lab_labels[[i]]) %>%
      group_by(USUBJID) %>%
      slice(1) %>%
      ungroup() %>%
      select(USUBJID, all_of(flagvar))
    adsl <- left_join(adsl, adlbparam, by = c("USUBJID"))
  }
}

adae <- pharmaverseadamjnj::adae %>%
  filter(TRTEMFL == "Y" & !is.na(!!rlang::sym(special_interest_var))) %>%
  select(
    USUBJID,
    TRTEMFL,
    AEBODSYS,
    AEDECOD,
    AETOXGR,
    all_of(special_interest_var),
    AESER,
    AEOUT,
    all_of(aeactionvar),
    all_of(aerelvar)
  )

adsl$colspan_trt <- factor(
  ifelse(adsl[[trtvar]] == "Placebo", " ", "Active Study Agent"),
  levels = c("Active Study Agent", " ")
)

if (risk_diff == TRUE) {
  adsl$rrisk_header <- "Risk Difference (%) (95% CI)"
  adsl$rrisk_label <- paste(adsl[[trtvar]], paste("vs", ctrl_grp))
}

# join data together
ae <- adae %>% right_join(., adsl, by = c("USUBJID"))

# Keep only maximum toxicity for the particular AESI
ae <- ae %>%
  mutate(
    ATOXGR = factor(
      ifelse(
        is.na(AETOXGR),
        "Missing",
        as.character(paste0("Grade ", AETOXGR))
      ),
      levels = c(
        "Grade 5",
        "Grade 4",
        "Grade 3",
        "Grade 2",
        "Grade 1",
        "Missing"
      )
    ),
    rowhead = "Maximum toxicity"
  ) %>%
  arrange(USUBJID, special_interest_var, ATOXGR) %>%
  group_by(USUBJID, .data[[special_interest_var]]) %>%
  slice(1) %>%
  ungroup()

# Remove Missing as a level since not required in table
levels(ae$ATOXGR)[levels(ae$ATOXGR) == "Missing"] <- NA

colspan_trt_map <- create_colspan_map(
  adsl,
  non_active_grp = ctrl_grp,
  non_active_grp_span_lbl = " ",
  active_grp_span_lbl = "Active Study Agent",
  colspan_var = "colspan_trt",
  trt_var = trtvar
)

# Define layout and build table:

ref_path <- c("colspan_trt", " ", "TRT01A", "Placebo")
extra_args_rr <- list(
  method = rr_method,
  ref_path = ref_path,
  .stats = c("count_unique_fraction")
)

lyt <- basic_table(
  top_level_section_div = " ",
  show_colcounts = TRUE,
  colcount_format = "N=xx"
) %>%
  split_cols_by(
    "colspan_trt",
    split_fun = trim_levels_to_map(map = colspan_trt_map)
  )

if (combined_colspan_trt == TRUE) {
  lyt <- lyt %>%
    split_cols_by(trtvar, split_fun = mysplit)
} else {
  lyt <- lyt %>%
    split_cols_by(trtvar)
}

if (risk_diff == TRUE) {
  lyt <- lyt %>%
    split_cols_by("rrisk_header", nested = FALSE) %>%
    split_cols_by(
      trtvar,
      labels_var = "rrisk_label",
      split_fun = remove_split_levels("Placebo")
    )
}

lyt <- lyt %>%
  split_rows_by(
    special_interest_var,
    split_label = "",
    split_fun = trim_levels_in_group("AEDECOD"),
    label_pos = "topleft",
    indent_mod = 0,
    section_div = c(" ")
  ) %>%
  summarize_row_groups(
    special_interest_var,
    cfun = a_freq_j,
    extra_args = append(extra_args_rr, NULL)
  ) %>%
  analyze(
    "AEDECOD",
    var_labels = "Preferred Term",
    afun = a_freq_j,
    indent_mod = 0,
    show_labels = "visible",
    extra_args = append(extra_args_rr, NULL)
  ) %>%
  split_rows_by(
    "rowhead",
    split_label = "",
    # ,split_fun = trim_levels_in_group("ATOXGR")
    label_pos = "topleft",
    indent_mod = 0,
    section_div = c(" ")
  ) %>%
  analyze(
    "ATOXGR",
    afun = a_freq_j,
    indent_mod = 0,
    extra_args = append(extra_args_rr, NULL)
  ) %>%
  split_rows_by(
    "AESER",
    split_fun = keep_split_levels("Y"),
    section_div = " "
  ) %>%
  summarize_row_groups(
    "AESER",
    cfun = a_freq_j,
    extra_args = append(extra_args_rr, list(label = "Serious", NULL))
  ) %>%
  analyze(
    "AEOUT",
    afun = a_freq_j,
    show_labels = "hidden",
    extra_args = append(
      extra_args_rr,
      list(label = "Deaths", val = "FATAL", NULL)
    )
  ) %>%
  analyze(
    aeactionvar,
    afun = a_freq_j,
    show_labels = "hidden",
    nested = FALSE,
    extra_args = append(
      extra_args_rr,
      list(
        label = "Resulting in treatment discontinuation",
        val = "DRUG WITHDRAWN",
        NULL
      )
    )
  ) %>%
  analyze(
    aerelvar,
    afun = a_freq_j,
    show_labels = "hidden",
    nested = FALSE,
    extra_args = append(
      extra_args_rr,
      list(label = "Related~[super a]", val = "RELATED", NULL)
    )
  )

if (labsection == TRUE) {
  lyt <- lyt %>%
    analyze(
      "lab_flag",
      afun = a_freq_j,
      show_labels = "hidden",
      nested = FALSE,
      extra_args = append(
        extra_args_rr,
        list(label = "Laboratory assessment~[super b]", NULL)
      )
    )

  for (i in 1:length(lab_params)) {
    aflagvar <- paste0("lab_flag", i)

    lyt <- lyt %>%
      analyze(
        aflagvar,
        afun = a_freq_j,
        indent_mod = 1,
        show_labels = "hidden",
        nested = TRUE,
        extra_args = append(extra_args_rr, NULL)
      )
  }
}

lyt <- lyt %>%
  append_topleft("AESI Assessment, n (%)")

result <- build_table(lyt, ae, alt_counts_df = adsl)

## Remove the N=xx column headers for the risk difference columns
result <- remove_col_count(result)

## Remove any rogue null rows
result <- result %>%
  safe_prune_table(prune_func = keep_rows(keep_non_null_rows))

# Add titles and footnotes:

result <- set_titles(result, tab_titles)

# Convert to tbl file and output table

tt_to_tlgrtf(string_map = string_map, tt = result, file = fileid, orientation = "landscape")

TSFAE07b: Subjects With Treatment-emergent Adverse Events of Special Interest - [AESI Grouping]; Safety Analysis Set (Study jjcs - core)

Active Study Agent

Risk Difference (%) (95% CI)

Xanomeline High Dose

Xanomeline Low Dose

Combined

Placebo

Xanomeline High Dose vs Placebo

Xanomeline Low Dose vs Placebo

AESI Assessment, n (%)

N=53

N=73

N=126

N=59

Seizure

48 (90.6%)

56 (76.7%)

104 (82.5%)

36 (61.0%)

29.5 (14.8, 44.3)

15.7 (-0.1, 31.5)

Preferred Term

ABNORMAL UTERINE
 BLEEDING

1 (1.9%)

0

1 (0.8%)

0

1.9 (-1.8, 5.5)

0.0 (0.0, 0.0)

AGITATION

0

1 (1.4%)

1 (0.8%)

1 (1.7%)

-1.7 (-5.0, 1.6)

-0.3 (-4.6, 3.9)

APPLICATION SITE
 DERMATITIS

2 (3.8%)

0

2 (1.6%)

2 (3.4%)

0.4 (-6.5, 7.3)

-3.4 (-8.0, 1.2)

APPLICATION SITE
 DESQUAMATION

0

1 (1.4%)

1 (0.8%)

0

0.0 (0.0, 0.0)

1.4 (-1.3, 4.0)

APPLICATION SITE
 ERYTHEMA

3 (5.7%)

3 (4.1%)

6 (4.8%)

0

5.7 (-0.6, 11.9)

4.1 (-0.4, 8.7)

APPLICATION SITE
 IRRITATION

4 (7.5%)

3 (4.1%)

7 (5.6%)

1 (1.7%)

5.9 (-2.0, 13.7)

2.4 (-3.2, 8.0)

APPLICATION SITE PRURITUS

4 (7.5%)

4 (5.5%)

8 (6.3%)

1 (1.7%)

5.9 (-2.0, 13.7)

3.8 (-2.4, 10.0)

APPLICATION SITE SWELLING

1 (1.9%)

1 (1.4%)

2 (1.6%)

0

1.9 (-1.8, 5.5)

1.4 (-1.3, 4.0)

APPLICATION SITE VESICLES

0

2 (2.7%)

2 (1.6%)

0

0.0 (0.0, 0.0)

2.7 (-1.0, 6.5)

ATRIAL FIBRILLATION

0

1 (1.4%)

1 (0.8%)

0

0.0 (0.0, 0.0)

1.4 (-1.3, 4.0)

BACK PAIN

1 (1.9%)

0

1 (0.8%)

1 (1.7%)

0.2 (-4.7, 5.1)

-1.7 (-5.0, 1.6)

BLEEDING ANOVULATORY

0

1 (1.4%)

1 (0.8%)

0

0.0 (0.0, 0.0)

1.4 (-1.3, 4.0)

BLISTER

1 (1.9%)

1 (1.4%)

2 (1.6%)

0

1.9 (-1.8, 5.5)

1.4 (-1.3, 4.0)

BLOOD GLUCOSE INCREASED

1 (1.9%)

1 (1.4%)

2 (1.6%)

0

1.9 (-1.8, 5.5)

1.4 (-1.3, 4.0)

CHEST DISCOMFORT

0

1 (1.4%)

1 (0.8%)

0

0.0 (0.0, 0.0)

1.4 (-1.3, 4.0)

CHEST PAIN

1 (1.9%)

0

1 (0.8%)

0

1.9 (-1.8, 5.5)

0.0 (0.0, 0.0)

COLON CANCER

0

1 (1.4%)

1 (0.8%)

0

0.0 (0.0, 0.0)

1.4 (-1.3, 4.0)

COMPLEX PARTIAL SEIZURES

0

1 (1.4%)

1 (0.8%)

0

0.0 (0.0, 0.0)

1.4 (-1.3, 4.0)

CONFUSIONAL STATE

0

1 (1.4%)

1 (0.8%)

0

0.0 (0.0, 0.0)

1.4 (-1.3, 4.0)

DECREASED APPETITE

0

0

0

1 (1.7%)

-1.7 (-5.0, 1.6)

-1.7 (-5.0, 1.6)

DELUSION

1 (1.9%)

0

1 (0.8%)

0

1.9 (-1.8, 5.5)

0.0 (0.0, 0.0)

DEPRESSED MOOD

0

1 (1.4%)

1 (0.8%)

0

0.0 (0.0, 0.0)

1.4 (-1.3, 4.0)

DIARRHOEA

0

1 (1.4%)

1 (0.8%)

1 (1.7%)

-1.7 (-5.0, 1.6)

-0.3 (-4.6, 3.9)

DISTURBANCE IN SEXUAL
 AROUSAL

0

0

0

1 (1.7%)

-1.7 (-5.0, 1.6)

-1.7 (-5.0, 1.6)

DIZZINESS

2 (3.8%)

2 (2.7%)

4 (3.2%)

0

3.8 (-1.4, 8.9)

2.7 (-1.0, 6.5)

DYSPEPSIA

0

1 (1.4%)

1 (0.8%)

1 (1.7%)

-1.7 (-5.0, 1.6)

-0.3 (-4.6, 3.9)

DYSURIA

0

1 (1.4%)

1 (0.8%)

0

0.0 (0.0, 0.0)

1.4 (-1.3, 4.0)

EAR INFECTION

0

0

0

1 (1.7%)

-1.7 (-5.0, 1.6)

-1.7 (-5.0, 1.6)

ELECTROCARDIOGRAM ST
 SEGMENT DEPRESSION

0

0

0

2 (3.4%)

-3.4 (-8.0, 1.2)

-3.4 (-8.0, 1.2)

ELECTROCARDIOGRAM T
 WAVE INVERSION

0

0

0

1 (1.7%)

-1.7 (-5.0, 1.6)

-1.7 (-5.0, 1.6)

ERECTILE DYSFUNCTION

1 (1.9%)

0

1 (0.8%)

0

1.9 (-1.8, 5.5)

0.0 (0.0, 0.0)

ERYTHEMA

4 (7.5%)

3 (4.1%)

7 (5.6%)

2 (3.4%)

4.2 (-4.3, 12.6)

0.7 (-5.8, 7.2)

EYE LASER SURGERY

0

0

0

1 (1.7%)

-1.7 (-5.0, 1.6)

-1.7 (-5.0, 1.6)

EYE PRURITUS

0

0

0

1 (1.7%)

-1.7 (-5.0, 1.6)

-1.7 (-5.0, 1.6)

FALL

0

0

0

1 (1.7%)

-1.7 (-5.0, 1.6)

-1.7 (-5.0, 1.6)

FATIGUE

0

1 (1.4%)

1 (0.8%)

0

0.0 (0.0, 0.0)

1.4 (-1.3, 4.0)

HEMIANOPIA HOMONYMOUS

0

1 (1.4%)

1 (0.8%)

0

0.0 (0.0, 0.0)

1.4 (-1.3, 4.0)

HYPERHIDROSIS

1 (1.9%)

1 (1.4%)

2 (1.6%)

1 (1.7%)

0.2 (-4.7, 5.1)

-0.3 (-4.6, 3.9)

HYPOTENSION

0

0

0

1 (1.7%)

-1.7 (-5.0, 1.6)

-1.7 (-5.0, 1.6)

INFLUENZA

0

0

0

1 (1.7%)

-1.7 (-5.0, 1.6)

-1.7 (-5.0, 1.6)

LOWER RESPIRATORY TRACT
 INFECTION

1 (1.9%)

0

1 (0.8%)

0

1.9 (-1.8, 5.5)

0.0 (0.0, 0.0)

MYOCARDIAL INFARCTION

0

0

0

1 (1.7%)

-1.7 (-5.0, 1.6)

-1.7 (-5.0, 1.6)

NASOPHARYNGITIS

1 (1.9%)

0

1 (0.8%)

0

1.9 (-1.8, 5.5)

0.0 (0.0, 0.0)

NAUSEA

2 (3.8%)

1 (1.4%)

3 (2.4%)

0

3.8 (-1.4, 8.9)

1.4 (-1.3, 4.0)

PALPITATIONS

0

1 (1.4%)

1 (0.8%)

0

0.0 (0.0, 0.0)

1.4 (-1.3, 4.0)

PARKINSON'S DISEASE

0

0

0

1 (1.7%)

-1.7 (-5.0, 1.6)

-1.7 (-5.0, 1.6)

PRURITUS

7 (13.2%)

5 (6.8%)

12 (9.5%)

2 (3.4%)

9.8 (-0.4, 20.0)

3.5 (-3.9, 10.9)

PSYCHOMOTOR
 HYPERACTIVITY

0

0

0

1 (1.7%)

-1.7 (-5.0, 1.6)

-1.7 (-5.0, 1.6)

RASH

0

2 (2.7%)

2 (1.6%)

3 (5.1%)

-5.1 (-10.7, 0.5)

-2.3 (-9.1, 4.4)

RASH PRURITIC

0

1 (1.4%)

1 (0.8%)

0

0.0 (0.0, 0.0)

1.4 (-1.3, 4.0)

SECRETION DISCHARGE

0

1 (1.4%)

1 (0.8%)

0

0.0 (0.0, 0.0)

1.4 (-1.3, 4.0)

SINUS ARRHYTHMIA

0

0

0

1 (1.7%)

-1.7 (-5.0, 1.6)

-1.7 (-5.0, 1.6)

SINUS BRADYCARDIA

4 (7.5%)

0

4 (3.2%)

0

7.5 (0.4, 14.7)

0.0 (0.0, 0.0)

SKIN IRRITATION

0

3 (4.1%)

3 (2.4%)

1 (1.7%)

-1.7 (-5.0, 1.6)

2.4 (-3.2, 8.0)

SKIN LACERATION

0

1 (1.4%)

1 (0.8%)

0

0.0 (0.0, 0.0)

1.4 (-1.3, 4.0)

SKIN ULCER

0

0

0

1 (1.7%)

-1.7 (-5.0, 1.6)

-1.7 (-5.0, 1.6)

SUPRAVENTRICULAR
 TACHYCARDIA

0

1 (1.4%)

1 (0.8%)

0

0.0 (0.0, 0.0)

1.4 (-1.3, 4.0)

SYNCOPE

1 (1.9%)

0

1 (0.8%)

0

1.9 (-1.8, 5.5)

0.0 (0.0, 0.0)

TRANSIENT ISCHAEMIC
 ATTACK

0

1 (1.4%)

1 (0.8%)

0

0.0 (0.0, 0.0)

1.4 (-1.3, 4.0)

ULCER

0

1 (1.4%)

1 (0.8%)

0

0.0 (0.0, 0.0)

1.4 (-1.3, 4.0)

UPPER RESPIRATORY TRACT
 INFECTION

1 (1.9%)

0

1 (0.8%)

3 (5.1%)

-3.2 (-9.9, 3.5)

-5.1 (-10.7, 0.5)

URTICARIA

0

1 (1.4%)

1 (0.8%)

0

0.0 (0.0, 0.0)

1.4 (-1.3, 4.0)

VENTRICULAR
 EXTRASYSTOLES

1 (1.9%)

0

1 (0.8%)

0

1.9 (-1.8, 5.5)

0.0 (0.0, 0.0)

VENTRICULAR SEPTAL
 DEFECT

0

1 (1.4%)

1 (0.8%)

0

0.0 (0.0, 0.0)

1.4 (-1.3, 4.0)

VISION BLURRED

0

1 (1.4%)

1 (0.8%)

0

0.0 (0.0, 0.0)

1.4 (-1.3, 4.0)

VOMITING

2 (3.8%)

0

2 (1.6%)

0

3.8 (-1.4, 8.9)

0.0 (0.0, 0.0)

Maximum toxicity

Grade 5

17 (32.1%)

19 (26.0%)

36 (28.6%)

17 (28.8%)

3.3 (-13.8, 20.3)

-2.8 (-18.1, 12.5)

Grade 4

9 (17.0%)

15 (20.5%)

24 (19.0%)

3 (5.1%)

11.9 (0.3, 23.5)

15.5 (4.6, 26.3)

Grade 3

11 (20.8%)

10 (13.7%)

21 (16.7%)

7 (11.9%)

8.9 (-4.8, 22.6)

1.8 (-9.6, 13.2)

Grade 2

7 (13.2%)

8 (11.0%)

15 (11.9%)

3 (5.1%)

8.1 (-2.6, 18.8)

5.9 (-3.2, 15.0)

Grade 1

2 (3.8%)

2 (2.7%)

4 (3.2%)

3 (5.1%)

-1.3 (-8.9, 6.3)

-2.3 (-9.1, 4.4)

Serious

26 (49.1%)

27 (37.0%)

53 (42.1%)

19 (32.2%)

16.9 (-1.1, 34.8)

4.8 (-11.5, 21.1)

Deaths

0

0

0

0

0.0 (0.0, 0.0)

0.0 (0.0, 0.0)

Resulting in treatment
 discontinuation

3 (5.7%)

5 (6.8%)

8 (6.3%)

6 (10.2%)

-4.5 (-14.4, 5.4)

-3.3 (-13.0, 6.3)

Relateda

4 (7.5%)

5 (6.8%)

9 (7.1%)

9 (15.3%)

-7.7 (-19.3, 3.9)

-8.4 (-19.3, 2.4)

Laboratory assessment

52 (98.1%)

63 (86.3%)

115 (91.3%)

58 (98.3%)

-0.2 (-5.1, 4.7)

-12.0 (-20.6, -3.5)

AST>5xULN

49 (92.5%)

54 (74.0%)

103 (81.7%)

55 (93.2%)

-0.8 (-10.3, 8.8)

-19.2 (-31.2, -7.3)

ALT>5xULN

51 (96.2%)

51 (69.9%)

102 (81.0%)

47 (79.7%)

16.6 (5.1, 28.0)

-9.8 (-24.5, 4.9)

a As determined by investigator.

b Relevant laboratory results for AESI evaluation.

Note: Subjects are counted only once for any given event, regardless of the number of times they actually experienced the event.

Note: Adverse events are coded using MedDRA version 26.0; toxicity grade is evaluated according to NCI-CTCAE version 5.0..

Download RTF file

TSFAE07A
TSFAE08
Source Code
---
title: TSFAE07B
subtitle: Subjects With Treatment-emergent Adverse Events of Special Interest - AESI Grouping
---

------------------------------------------------------------------------

{{< include ../../_utils/envir_hook.qmd >}}

```{r setup, echo = FALSE, warning = FALSE, message = FALSE}
options(docx.add_datetime = FALSE, tidytlg.add_datetime = FALSE)
envsetup_config_name <- "default"

# Path to the combined config file
envsetup_file_path <- file.path("../..", "envsetup.yml")

Sys.setenv(ENVSETUP_ENVIRON = '')
library(envsetup)
loaded_config <- config::get(config = envsetup_config_name, file = envsetup_file_path)
envsetup::rprofile(loaded_config)


dpscomp <- compound
dpspdr <- paste(protocol,dbrelease,rpteff,sep="__")

aptcomp <- compound
aptpdr <- paste(protocol,dbrelease,rpteff,sep="__")

###### Study specific updates (formerly in envre)

dpscomp <- "standards"
dpspdr <- "jjcs__NULL__jjcs - core"

apt <- FALSE
library(junco)
default_str_map <- rbind(default_str_map, c("&ctcae", "5.0"))

```

## Output

:::: panel-tabset
## {{< fa regular file-lines sm fw >}} Preview

```{r variant1, results='hide', warning = FALSE, message = FALSE}

# Program Name:              tsfae07b.R

# Prep Environment

library(envsetup)
library(tern)
library(dplyr)
library(rtables)
library(junco)

# Define script level parameters:

# - Define output ID and file location

tblid <- "TSFAE07b"
fileid <- tblid
tab_titles <- get_titles_from_file(input_path = '../../_data/', tblid)
string_map <- default_str_map


trtvar <- "TRT01A"
popfl <- "SAFFL"

special_interest_var <- "CQ01NAM"
aerelvar <- "AEREL"
aeactionvar <- "AEACN"

combined_colspan_trt <- TRUE
risk_diff <- TRUE
rr_method <- "wald"
ctrl_grp <- "Placebo"

if (combined_colspan_trt == TRUE) {
  # Set up levels and label for the required combined columns
  add_combo <- add_combo_facet(
    "Combined",
    label = "Combined",
    levels = c("Xanomeline High Dose", "Xanomeline Low Dose")
  )

  # choose if any facets need to be removed - e.g remove the combined column for placebo
  rm_combo_from_placebo <- cond_rm_facets(
    facets = "Combined",
    ancestor_pos = NA,
    value = " ",
    split = "colspan_trt"
  )

  mysplit <- make_split_fun(post = list(add_combo, rm_combo_from_placebo))
}

# Optional lab section parameters
labsection <- TRUE
lab_params <- c("AST", "ALT")
lab_labels <- c("AST>5xULN", "ALT>5xULN")
lab_var <- c("MCRIT1MN", "MCRIT1MN")
lab_vals <- c("2,3", "2,3") # Note both character or numeric values can be enclosed within in one set of double quotations here

# Process Data:

adsl <- pharmaverseadamjnj::adsl %>%
  filter(!!rlang::sym(popfl) == "Y") %>%
  select(STUDYID, USUBJID, all_of(trtvar), all_of(popfl))

lbdata <- NULL

# Optional lab section
if (labsection == TRUE) {
  for (i in 1:length(lab_params)) {
    filter_val <- unlist(strsplit(lab_vals[[i]], ","))

    adlb <- pharmaverseadamjnj::adlb %>%
      filter(
        TRTEMFL == "Y" &
          PARAMCD == lab_params[[i]] &
          !!rlang::sym(lab_var[[i]]) %in% filter_val
      ) %>%
      mutate(criteria = lab_labels[[i]]) %>%
      select(USUBJID, TRTEMFL, PARAMCD, all_of(lab_var[[i]]), criteria)

    lbdata <- bind_rows(adlb, lbdata)
  }

  adlb <- lbdata %>%
    group_by(USUBJID, TRTEMFL, PARAMCD, criteria) %>%
    slice(1) %>%
    ungroup()

  # Create flag variable for each parameter that met the condition to merge back onto adsl
  # Overall row
  adlbparamall <- adlb %>%
    filter(PARAMCD %in% lab_params) %>%
    mutate(lab_flag = "Y") %>%
    group_by(USUBJID) %>%
    slice(1) %>%
    ungroup() %>%
    select(USUBJID, lab_flag)

  adsl <- left_join(adsl, adlbparamall, by = c("USUBJID"))

  # Loop through each parameter that the user has specified and merge flag variable onto adsl
  for (i in 1:length(lab_params)) {
    flagvar <- paste0("lab_flag", i)

    adlbparam <- adlb %>%
      filter(PARAMCD == lab_params[[i]] & criteria == lab_labels[[i]]) %>%
      mutate(!!flagvar := lab_labels[[i]]) %>%
      group_by(USUBJID) %>%
      slice(1) %>%
      ungroup() %>%
      select(USUBJID, all_of(flagvar))
    adsl <- left_join(adsl, adlbparam, by = c("USUBJID"))
  }
}

adae <- pharmaverseadamjnj::adae %>%
  filter(TRTEMFL == "Y" & !is.na(!!rlang::sym(special_interest_var))) %>%
  select(
    USUBJID,
    TRTEMFL,
    AEBODSYS,
    AEDECOD,
    AETOXGR,
    all_of(special_interest_var),
    AESER,
    AEOUT,
    all_of(aeactionvar),
    all_of(aerelvar)
  )

adsl$colspan_trt <- factor(
  ifelse(adsl[[trtvar]] == "Placebo", " ", "Active Study Agent"),
  levels = c("Active Study Agent", " ")
)

if (risk_diff == TRUE) {
  adsl$rrisk_header <- "Risk Difference (%) (95% CI)"
  adsl$rrisk_label <- paste(adsl[[trtvar]], paste("vs", ctrl_grp))
}

# join data together
ae <- adae %>% right_join(., adsl, by = c("USUBJID"))

# Keep only maximum toxicity for the particular AESI
ae <- ae %>%
  mutate(
    ATOXGR = factor(
      ifelse(
        is.na(AETOXGR),
        "Missing",
        as.character(paste0("Grade ", AETOXGR))
      ),
      levels = c(
        "Grade 5",
        "Grade 4",
        "Grade 3",
        "Grade 2",
        "Grade 1",
        "Missing"
      )
    ),
    rowhead = "Maximum toxicity"
  ) %>%
  arrange(USUBJID, special_interest_var, ATOXGR) %>%
  group_by(USUBJID, .data[[special_interest_var]]) %>%
  slice(1) %>%
  ungroup()

# Remove Missing as a level since not required in table
levels(ae$ATOXGR)[levels(ae$ATOXGR) == "Missing"] <- NA

colspan_trt_map <- create_colspan_map(
  adsl,
  non_active_grp = ctrl_grp,
  non_active_grp_span_lbl = " ",
  active_grp_span_lbl = "Active Study Agent",
  colspan_var = "colspan_trt",
  trt_var = trtvar
)

# Define layout and build table:

ref_path <- c("colspan_trt", " ", "TRT01A", "Placebo")
extra_args_rr <- list(
  method = rr_method,
  ref_path = ref_path,
  .stats = c("count_unique_fraction")
)

lyt <- basic_table(
  top_level_section_div = " ",
  show_colcounts = TRUE,
  colcount_format = "N=xx"
) %>%
  split_cols_by(
    "colspan_trt",
    split_fun = trim_levels_to_map(map = colspan_trt_map)
  )

if (combined_colspan_trt == TRUE) {
  lyt <- lyt %>%
    split_cols_by(trtvar, split_fun = mysplit)
} else {
  lyt <- lyt %>%
    split_cols_by(trtvar)
}

if (risk_diff == TRUE) {
  lyt <- lyt %>%
    split_cols_by("rrisk_header", nested = FALSE) %>%
    split_cols_by(
      trtvar,
      labels_var = "rrisk_label",
      split_fun = remove_split_levels("Placebo")
    )
}

lyt <- lyt %>%
  split_rows_by(
    special_interest_var,
    split_label = "",
    split_fun = trim_levels_in_group("AEDECOD"),
    label_pos = "topleft",
    indent_mod = 0,
    section_div = c(" ")
  ) %>%
  summarize_row_groups(
    special_interest_var,
    cfun = a_freq_j,
    extra_args = append(extra_args_rr, NULL)
  ) %>%
  analyze(
    "AEDECOD",
    var_labels = "Preferred Term",
    afun = a_freq_j,
    indent_mod = 0,
    show_labels = "visible",
    extra_args = append(extra_args_rr, NULL)
  ) %>%
  split_rows_by(
    "rowhead",
    split_label = "",
    # ,split_fun = trim_levels_in_group("ATOXGR")
    label_pos = "topleft",
    indent_mod = 0,
    section_div = c(" ")
  ) %>%
  analyze(
    "ATOXGR",
    afun = a_freq_j,
    indent_mod = 0,
    extra_args = append(extra_args_rr, NULL)
  ) %>%
  split_rows_by(
    "AESER",
    split_fun = keep_split_levels("Y"),
    section_div = " "
  ) %>%
  summarize_row_groups(
    "AESER",
    cfun = a_freq_j,
    extra_args = append(extra_args_rr, list(label = "Serious", NULL))
  ) %>%
  analyze(
    "AEOUT",
    afun = a_freq_j,
    show_labels = "hidden",
    extra_args = append(
      extra_args_rr,
      list(label = "Deaths", val = "FATAL", NULL)
    )
  ) %>%
  analyze(
    aeactionvar,
    afun = a_freq_j,
    show_labels = "hidden",
    nested = FALSE,
    extra_args = append(
      extra_args_rr,
      list(
        label = "Resulting in treatment discontinuation",
        val = "DRUG WITHDRAWN",
        NULL
      )
    )
  ) %>%
  analyze(
    aerelvar,
    afun = a_freq_j,
    show_labels = "hidden",
    nested = FALSE,
    extra_args = append(
      extra_args_rr,
      list(label = "Related~[super a]", val = "RELATED", NULL)
    )
  )

if (labsection == TRUE) {
  lyt <- lyt %>%
    analyze(
      "lab_flag",
      afun = a_freq_j,
      show_labels = "hidden",
      nested = FALSE,
      extra_args = append(
        extra_args_rr,
        list(label = "Laboratory assessment~[super b]", NULL)
      )
    )

  for (i in 1:length(lab_params)) {
    aflagvar <- paste0("lab_flag", i)

    lyt <- lyt %>%
      analyze(
        aflagvar,
        afun = a_freq_j,
        indent_mod = 1,
        show_labels = "hidden",
        nested = TRUE,
        extra_args = append(extra_args_rr, NULL)
      )
  }
}

lyt <- lyt %>%
  append_topleft("AESI Assessment, n (%)")

result <- build_table(lyt, ae, alt_counts_df = adsl)

## Remove the N=xx column headers for the risk difference columns
result <- remove_col_count(result)

## Remove any rogue null rows
result <- result %>%
  safe_prune_table(prune_func = keep_rows(keep_non_null_rows))

# Add titles and footnotes:

result <- set_titles(result, tab_titles)

# Convert to tbl file and output table

tt_to_tlgrtf(string_map = string_map, tt = result, file = fileid, orientation = "landscape")
```
```{r result1, echo=FALSE, message=FALSE, warning=FALSE, test = list(result_v1 = "result")}
tt_to_flextable_j(result, tblid, string_map = string_map) 
```

[Download RTF file](`r paste0(tolower(tblid), '.rtf')`)
::::

Made with ❤️ by the J&J Team

  • Edit this page
  • Report an issue
Cookie Preferences