Skip to content

Commit

Permalink
fixing styling and rd files
Browse files Browse the repository at this point in the history
  • Loading branch information
kartikeyakirar committed Nov 8, 2023
1 parent bbbee71 commit cb4bccc
Show file tree
Hide file tree
Showing 16 changed files with 40 additions and 38 deletions.
2 changes: 1 addition & 1 deletion R/tm_g_barchart_simple.R
Original file line number Diff line number Diff line change
Expand Up @@ -18,7 +18,7 @@
#'
#' ADSL <- tmc_ex_adsl %>%
#' dplyr::mutate(ITTFL = factor("Y") %>%
#' formatters::with_label("Intent-To-Treat Population Flag"))
#' formatters::with_label("Intent-To-Treat Population Flag"))
#' ADAE <- tmc_ex_adae %>%
#' dplyr::filter(!((AETOXGR == 1) & (AESEV == "MILD") & (ARM == "A: Drug X")))
#'
Expand Down
10 changes: 7 additions & 3 deletions R/tm_g_ipp.R
Original file line number Diff line number Diff line change
Expand Up @@ -188,9 +188,13 @@ template_g_ipp <- function(dataname = "ANL",
#' @examples
#' library(nestcolor)
#'
#' ADSL <- tmc_ex_adsl %>% dplyr::slice(1:20) %>% df_explicit_na()
#' ADLB <- tmc_ex_adlb %>% dplyr::filter(USUBJID %in% ADSL$USUBJID) %>%
#' df_explicit_na() %>% dplyr::filter(AVISIT != "SCREENING")
#' ADSL <- tmc_ex_adsl %>%
#' dplyr::slice(1:20) %>%
#' df_explicit_na()
#' ADLB <- tmc_ex_adlb %>%
#' dplyr::filter(USUBJID %in% ADSL$USUBJID) %>%
#' df_explicit_na() %>%
#' dplyr::filter(AVISIT != "SCREENING")
#'
#' app <- init(
#' data = cdisc_data(
Expand Down
2 changes: 1 addition & 1 deletion R/tm_g_pp_patient_timeline.R
Original file line number Diff line number Diff line change
Expand Up @@ -376,7 +376,7 @@ template_patient_timeline <- function(dataname = "ANL",
#'
#' datanames(data) <- c("ADSL", "ADAE", "ADCM")
#' data@join_keys <- join_keys(
#' join_key("ADSL",keys = get_cdisc_keys("ADSL")),
#' join_key("ADSL", keys = get_cdisc_keys("ADSL")),
#' join_key("ADAE", keys = get_cdisc_keys("ADAE")),
#' join_key("ADCM", keys = adcm_keys),
#' join_key("ADAE", "ADSL", c("USUBJID", "STUDYID")),
Expand Down
4 changes: 2 additions & 2 deletions R/tm_g_pp_therapy.R
Original file line number Diff line number Diff line change
Expand Up @@ -281,8 +281,8 @@ template_therapy <- function(dataname = "ANL",
#' ",
#' join_keys = join_keys(
#' join_key("ADSL", keys = get_cdisc_keys("ADSL")),
#' join_key("ADCM", keys = adcm_keys),
#' join_key("ADCM", "ADSL", keys = c("USUBJID", "STUDYID"))
#' join_key("ADCM", keys = adcm_keys),
#' join_key("ADCM", "ADSL", keys = c("USUBJID", "STUDYID"))
#' )
#' ),
#' modules = modules(
Expand Down
1 change: 0 additions & 1 deletion R/tm_t_events_summary.R
Original file line number Diff line number Diff line change
Expand Up @@ -534,7 +534,6 @@ template_events_summary <- function(anl_name,
#'
#' ae_anl_vars <- names(ADAE)[startsWith(names(ADAE), "TMPFL_")]
#' aesi_vars <- names(ADAE)[startsWith(names(ADAE), "TMP_")]
#'
#' })
#'
#' datanames <- c("ADSL", "ADAE")
Expand Down
4 changes: 2 additions & 2 deletions R/tm_t_mult_events.R
Original file line number Diff line number Diff line change
Expand Up @@ -294,8 +294,8 @@ template_mult_events <- function(dataname,
#' ",
#' join_keys = join_keys(
#' join_key("ADSL", keys = get_cdisc_keys("ADSL")),
#' join_key("ADCM", keys = adcm_keys),
#' join_key("ADCM", "ADSL", keys = c("USUBJID", "STUDYID"))
#' join_key("ADCM", keys = adcm_keys),
#' join_key("ADCM", "ADSL", keys = c("USUBJID", "STUDYID"))
#' )
#' ),
#' modules = modules(
Expand Down
4 changes: 2 additions & 2 deletions R/tm_t_pp_prior_medication.R
Original file line number Diff line number Diff line change
Expand Up @@ -90,8 +90,8 @@ template_prior_medication <- function(dataname = "ANL",
#' ",
#' join_keys = join_keys(
#' join_key("ADSL", keys = get_cdisc_keys("ADSL")),
#' join_key("ADCM", keys = adcm_keys),
#' join_key("ADCM", "ADSL", keys = c("USUBJID", "STUDYID"))
#' join_key("ADCM", keys = adcm_keys),
#' join_key("ADCM", "ADSL", keys = c("USUBJID", "STUDYID"))
#' )
#' ),
#' modules = modules(
Expand Down
12 changes: 5 additions & 7 deletions man/template_g_lineplot.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/tm_g_barchart_simple.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

10 changes: 7 additions & 3 deletions man/tm_g_ipp.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

12 changes: 5 additions & 7 deletions man/tm_g_lineplot.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/tm_g_pp_patient_timeline.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

4 changes: 2 additions & 2 deletions man/tm_g_pp_therapy.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

1 change: 0 additions & 1 deletion man/tm_t_events_summary.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

4 changes: 2 additions & 2 deletions man/tm_t_mult_events.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

4 changes: 2 additions & 2 deletions man/tm_t_pp_prior_medication.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit cb4bccc

Please sign in to comment.