Skip to contents

Introduction

This article describes how to cut study SDTM data using a modular approach to enable any further study or project specific customization.

Programming Flow

Read in Data

To start, all SDTM data to be cut needs to be read into the environment. These should be stored in a list.

library(datacutr)
library(admiraldev)
library(dplyr)
library(lubridate)
library(stringr)
library(purrr)

source(here::here("inst/templates/dummy_data.R"))
source_data <- list(ds = ds, dm = dm, ae = ae, sc = sc, lb = lb, fa = fa, ts = ts)

Create DCUT Dataset

The next step is to create the DCUT dataset containing the datacut date and description.

dcut <- create_dcut(dataset_ds = ds,
                    ds_date_var = DSSTDTC,
                    filter = DSDECOD == "RANDOMIZATION",
                    cut_date = "2022-06-04",
                    cut_description = "Clinical Cutoff Date")

Preprocess Datasets

If any pre-processing of datasets is needed, for example in the case of FA, where there are multiple date variables, this should be done next.

source_data$fa <- source_data$fa %>%
  mutate(DCUT_TEMP_FAXDTC = case_when(
    FASTDTC != "" ~ FASTDTC,
    FADTC != "" ~ FADTC,
    TRUE        ~ as.character(NA)
  ))

Specify Cut Types

We’ll next specify the cut types for each dataset (patient cut, date cut or no cut) and in the case of date cut which date variable should be used.

patient_cut_list <- c("sc", "ds")

date_cut_list <- rbind(c("ae", "AESTDTC"),
                       c("lb", "LBDTC"),
                       c("fa", "DCUT_TEMP_FAXDTC"))

no_cut_list <- list(ts = source_data$ts)

Patient Cut

Next we’ll apply the patient cut.

patient_cut_data <- lapply(
  source_data[patient_cut_list], pt_cut, dataset_cut = dcut
)

This adds on temporary flag variables indicating which observations will be removed, for example for SC:

Date Cut

Next we’ll apply the date cut.

date_cut_data <- pmap(
  .l = list(dataset_sdtm = source_data[date_cut_list[, 1]],
          sdtm_date_var = syms(date_cut_list[, 2])),
  .f = date_cut,
  dataset_cut = dcut,
  cut_var = DCUTDTM
)

This again adds on temporary flag variables indicating which observations will be removed, for example for AE:

DM Cut

Then lastly we’ll apply the special DM cut which also updates the death related variables.

dm_cut <- special_dm_cut(dataset_dm = source_data$dm,
                         dataset_cut = dcut,
                         cut_var = DCUTDTM)

This adds on temporary variables indicating any death records that would change as a result of applying a datacut:

Apply Cut

The last step is to create the RMD report, to summarize which patients and observations will be cut, and then apply the cut to strip out all observations flagged as to be removed.

cut_data <- purrr::map(
  c(patient_cut_data, date_cut_data, list(dm = dm_cut)),
  apply_cut,
  dcutvar = DCUT_TEMP_REMOVE,
  dthchangevar = DCUT_TEMP_DTHCHANGE
)

Output Final List of Cut Datasets

Lastly, we create the final list of all the cut SDTM data, adding in the SDTM where no cut was needed.

final_data <- c(cut_data, no_cut_list, list(dcut = dcut))

list2env(final_data, envir = globalenv())
#> <environment: R_GlobalEnv>