Composite Endpoint Analysis Report"

\newpage

Data Summary

library(xtable);
data.all <- get.data();
summary(data.all$data);

Analysis Summary

The basic settings of the analysis are as follows:

    print(data.all);

Missingness Summary

    mis.tbl <- summary(data.all, type = "misstable");
    print(xtable(mis.tbl), comment = FALSE, align=c("r", rep("c",4)));

Survival

    plot(data.all, type = "KM");

\newpage

Imputation Result

Imputed Outcomes

deltas   <- get.deltas();
imp.data <- get.imputed.full();

if (any(is.null(c(imp.data)))) {
  print("Not available");
} else {
    plot(imp.data, type = "imputed",
         deltas = sort(unique(c(0, range(deltas)))));
}

Imputed Endpoint

if (is.null(c(imp.data))) {
  print("Not available");
} else {
    plot(imp.data, type = "imputed",
         deltas = sort(unique(c(0, range(deltas)))),
         endp = TRUE);
}

Composite Quantile

if (is.null(imp.data)) {
  print("Not available");
} else {
  plot(imp.data, type = "composite");
}

\newpage

Bootstrap Results

Hypothesis Testing

sum.boot <- get.rst.boot();
if (!is.null(sum.boot)) {
    print(xtable(sum.boot$theta), comment=FALSE);
} else {
  print("Not available");
}

Median

if (!is.null(sum.boot)) {
    print(xtable(sum.boot$effect.quantiles), comment=FALSE);
} else {
  print("Not available");
}

Contour plot

   plot(sum.boot, nlevels = 30, con.v=0.05, zlim=c(0, 0.05));


Try the idem package in your browser

Any scripts or data that you put into this service are public.

idem documentation built on Aug. 9, 2023, 5:08 p.m.