Learn R Programming

lrstat

The goal of lrstat is to calculate power and sample size under non-proportional hazards using weighted log-rank tests both analytically and using simulations in a time-to-event group-sequential trial.

It has built-in capabilities to use error-spending functions and can calcualte power, accrual duration, follow-up duration, and absolute accrual rates for the Fleming-Harrington's class of weighting functions.

Example

This is a basic example which shows you how to solve a common problem:

library(lrstat)
## basic example code for a two-stage group sequential trial with interim
## analysis at 80% of total number of events using Lan-DeMets O'Brien-Fleming
## error-spending. The accrual has a ramp-up periof of 9 months before 
## reaching 26 patients per month. The survival distribution for the treatment
## group has a delay effect of 6 months and a hazard ratio 0.58 after the delay. 
## The annual dropout rate is 5%. The accrual duration is 22 months. 
## The follow-up duration is 18 months for the last randomized patients. 
## The FH(0,1) weighted log-rank test is used for power calculation. 

lrpower(kMax = 2, informationRates = c(0.8, 1),
        alpha = 0.025, typeAlphaSpending = "sfOF",
        allocationRatioPlanned = 1, accrualTime = seq(0, 9),
        accrualIntensity = c(26/9*seq(1, 9), 26),
        piecewiseSurvivalTime = c(0, 6),
        lambda1 = c(0.0533, 0.0309),
        lambda2 = c(0.0533, 0.0533),
        gamma1 = -log(1-0.05)/12,
        gamma2 = -log(1-0.05)/12, 
        accrualDuration = 22,
        followupTime = 18, fixedFollowup = FALSE, 
        rho1 = 0, rho2 = 1,
        numSubintervals = 2000)

Copy Link

Version

Install

install.packages('lrstat')

Monthly Downloads

472

Version

0.2.14

License

GPL (>= 2)

Issues

Pull Requests

Stars

Forks

Maintainer

Kaifeng Lu

Last Published

June 9th, 2025

Functions in lrstat (0.2.14)

errorSpent

Error Spending
covrmst

Covariance Between Restricted Mean Survival Times
BOINTable

BOIN Decision Table for Dose-Finding Trials
binary_tte_sim

Simulation for a Binary and a Time-to-Event Endpoint in Group Sequential Trials
caltime

Calendar Times for Target Number of Events
accrual

Number of Enrolled Subjects
ad

Number of Patients Enrolled During an Interval and Having an Event by Specified Calendar Times
exitprob

Stagewise Exit Probabilities
fadjpsim

Adjusted p-Values for Simes-Based Graphical Approaches
fseqbon

Group Sequential Trials Using Bonferroni-Based Graphical Approaches
findInterval3

Find Interval Numbers of Indices
fadjpdun

Adjusted p-Values for Dunnett-Based Graphical Approaches
adaptDesign

Adaptive Design at an Interim Look
ClopperPearsonCI

Clopper-Pearson Confidence Interval for One-Sample Proportion
aml

Acute myelogenous leukemia survival data from the survival package
fmodmix

Adjusted p-Values for Modified Mixture Gatekeeping Procedures
fstp2seq

Adjusted p-Values for Stepwise Testing Procedures for Two Sequences
ftrunc

Adjusted p-Values for Holm, Hochberg, and Hommel Procedures
getAccrualDurationFromN

Accrual Duration to Enroll Target Number of Subjects
getCI

Confidence Interval After Trial Termination
getBound

Efficacy Boundaries for Group Sequential Design
getADCI

Confidence Interval After Adaptation
getDesign

Power and Sample Size for a Generic Group Sequential Design
fwgtmat

Weight Matrix for All Intersection Hypotheses
fquantile

The Quantiles of a Survival Distribution
fadjpbon

Adjusted p-Values for Bonferroni-Based Graphical Approaches
float_to_fraction

Converting a decimal to a fraction
fstdmix

Adjusted p-Values for Standard Mixture Gatekeeping Procedures
getADRCI

Repeated Confidence Interval After Adaptation
getCP

Conditional Power Allowing for Varying Parameter Values
getDesignMeanDiffCarryoverEquiv

Power and Sample Size for Equivalence in Direct Treatment Effects in Crossover Trials
getDesignANOVAContrast

Power and Sample Size for One-Way ANOVA Contrast
getDesignAgreement

Power and Sample Size for Cohen's kappa
getDesignMeanDiff

Group Sequential Design for Two-Sample Mean Difference
getDesignLogistic

Power and Sample Size for Logistic Regression
getDesignMeanDiffEquiv

Group Sequential Design for Equivalence in Two-Sample Mean Difference
getDesignANOVA

Power and Sample Size for One-Way ANOVA
getDesignMeanDiffCarryover

Power and Sample Size for Direct Treatment Effects in Crossover Trials
getDesignFisherExact

Power and Sample Size for Fisher's Exact Test for Two Proportions
getDesignEquiv

Power and Sample Size for a Generic Group Sequential Equivalence Design
getDesignMeanRatioXO

Group Sequential Design for Mean Ratio in 2x2 Crossover
getDesignMeanRatioXOEquiv

Group Sequential Design for Equivalence in Mean Ratio in 2x2 Crossover
getDesignMeanDiffXO

Group Sequential Design for Mean Difference in 2x2 Crossover
getDesignOddsRatioEquiv

Group Sequential Design for Equivalence in Two-Sample Odds Ratio
getDesignMeanDiffXOEquiv

Group Sequential Design for Equivalence in Mean Difference in 2x2 Crossover
getDesignMeanDiffMMRM

Group Sequential Design for Two-Sample Mean Difference From the MMRM Model
getDesignOneMean

Group Sequential Design for One-Sample Mean
getDesignMeanRatioEquiv

Group Sequential Design for Equivalence in Two-Sample Mean Ratio
getDesignMeanRatio

Group Sequential Design for Two-Sample Mean Ratio
getDesignOddsRatio

Group Sequential Design for Two-Sample Odds Ratio
getDesignOneSlope

Group Sequential Design for One-Sample Slope
getDesignOneRateExact

Power and Sample Size for One-Sample Poisson Rate Exact Test
getDesignOneProportion

Group Sequential Design for One-Sample Proportion
getDesignPairedMeanRatioEquiv

Group Sequential Design for Equivalence in Paired Mean Ratio
getDesignPairedMeanDiff

Group Sequential Design for Paired Mean Difference
getDesignOneMultinom

Power and Sample Size for One-Sample Multinomial Response
getDesignPairedMeanRatio

Group Sequential Design for Paired Mean Ratio
getDesignOrderedBinom

Power and Sample Size for Cochran-Armitage Trend Test for Ordered Multi-Sample Binomial Response
getDesignPairedPropMcNemar

Group Sequential Design for McNemar's Test for Paired Proportions
getDesignPairedMeanDiffEquiv

Group Sequential Design for Equivalence in Paired Mean Difference
getDesignRepeatedANOVA

Power and Sample Size for Repeated-Measures ANOVA
getDesignRiskRatioExact

Power and Sample Size for Exact Unconditional Test for Risk Ratio
getDesignRiskDiffExact

Power and Sample Size for Exact Unconditional Test for Risk Difference
getDesignRiskRatioExactEquiv

Power and Sample Size for Exact Unconditional Test for Equivalence in Risk Ratio
getDesignRiskDiff

Group Sequential Design for Two-Sample Risk Difference
getDesignRiskDiffEquiv

Group Sequential Design for Equivalence in Two-Sample Risk Difference
getDesignRiskDiffExactEquiv

Power and Sample Size for Exact Unconditional Test for Equivalence in Risk Difference
getDesignRiskRatioEquiv

Group Sequential Design for Equivalence in Two-Sample Risk Ratio
getDesignRepeatedANOVAContrast

Power and Sample Size for One-Way Repeated Measures ANOVA Contrast
getDesignRiskRatio

Group Sequential Design for Two-Sample Risk Ratio
getDesignTwoOrdinal

Power and Sample Size for the Wilcoxon Test for Two-Sample Ordinal Response
getDesignTwoMultinom

Power and Sample Size for Difference in Two-Sample Multinomial Responses
getDesignSlopeDiff

Group Sequential Design for Two-Sample Slope Difference
getDesignUnorderedBinom

Power and Sample Size for Unordered Multi-Sample Binomial Response
getDurationFromNevents

Range of Accrual Duration for Target Number of Events
getDesignRiskRatioFM

Group Sequential Design for Two-Sample Risk Ratio Based on the Farrington-Manning Score Test
getDesignSlopeDiffMMRM

Group Sequential Design for Two-Sample Slope Difference From the MMRM Model
getDesignUnorderedMultinom

Power and Sample Size for Unordered Multi-Sample Multinomial Response
getDesignTwoWayANOVA

Power and Sample Size for Two-Way ANOVA
getDesignWilcoxon

Group Sequential Design for Two-Sample Wilcoxon Test
hd

Integrated Event Probability Over an Interval With Constant Hazard
kmest

Kaplan-Meier Estimates of Survival Curve
kmpower

Power for Difference in Milestone Survival Probabilities
hedgesg

Hedges' g Effect Size
getNeventsFromHazardRatio

Required Number of Events Given Hazard Ratio
getRCI

Repeated Confidence Interval for Group Sequential Design
kmdiff

Estimate of Milestone Survival Difference
ingots

The binary data from Cox and Snell (1989, pp. 10-11).
immdef

Simulated CONCORDE trial data from the rpsftm package
heart

Stanford heart transplant data from the survival package
kmpowerequiv

Power for Equivalence in Milestone Survival Probability Difference
kmsamplesizeequiv

Sample Size for Equivalence in Milestone Survival Probability Difference
kmstat

Stratified Difference in Milestone Survival Probabilities
liferegr

Parametric Regression Models for Failure Time Data
kmsurv

Kaplan-Meier Survival Probability Based on Pooled Sample
kmpower1s

Power for One-Sample Milestone Survival Probability
logisregr

Logistic Regression Models for Binary Data
kmsamplesize

Sample Size for Difference in Milestone Survival Probabilities
kmsamplesize1s

Sample Size for One-Sample Milestone Survival Probability
kmstat1

Milestone Survival Probability by Stratum
lrschoenfeld

Schoenfeld Method for Log-Rank Test Sample Size Calculation
lrsim2e3a

Log-Rank Test Simulation for Two Endpoints and Three Arms
lrpowerequiv

Power for Equivalence in Hazard Ratio
lrsamplesize

Log-Rank Test Sample Size
lrpower

Log-Rank Test Power
lrsim

Log-Rank Test Simulation
lrsim2e

Log-Rank Test Simulation for Two Endpoints
lrstat-package

Power and Sample Size Calculation for Non-Proportional Hazards and Beyond
lrsamplesizeequiv

Sample Size for Equivalence in Hazard Ratio
lrsim3a

Log-Rank Test Simulation for Three Arms
mnRiskDiffCI

Miettinen-Nurminen Score Confidence Interval for Two-Sample Risk Difference
mnOddsRatioCI

Miettinen-Nurminen Score Confidence Interval for Two-Sample Odds Ratio
lrstat1

Number of Subjects Having an Event and Log-Rank Statistic for a hypothesized hazard ratio at a given calendar time
lrstat

Number of Subjects Having an Event and Log-Rank Statistics
mTPI2Table

mTPI-2 Decision Table
lrtest

Log-Rank Test of Survival Curve Difference
mnRateDiffCI

Miettinen-Nurminen Score Confidence Interval for Two-Sample Rate Difference
natrisk

Number of Subjects at Risk
mnRiskRatioCI

Miettinen-Nurminen Score Confidence Interval for Two-Sample Risk Ratio
mnRateRatioCI

Miettinen-Nurminen Score Confidence Interval for Two-Sample Rate Ratio
nbsamplesize

Sample Size for Negative Binomial Rate Ratio
nbpower

Power for Negative Binomial Rate Ratio
nbstat1

Negative Binomial Rate Ratio by Stratum
nbpower1s

Power for One-Sample Negative Binomial Rate
nbstat

Negative Binomial Rate Ratio
nbpowerequiv

Power for Equivalence in Negative Binomial Rate Ratio
nbsamplesize1s

Sample Size for One-Sample Negative Binomial Rate
nbsamplesizeequiv

Sample Size for Equivalence in Negative Binomial Rate Ratio
nevent2

Number of Subjects Having an Event by Calendar Time
nevent

Number of Subjects Having an Event
param_efficacyStopping

Parameter Description: efficacyStopping
param_gamma

Parameter Description: gamma
param_alpha

Parameter Description: alpha
param_criticalValues

Parameter Description: criticalValues
param_gamma1

Parameter Description: gamma1
param_futilityBounds

Parameter Description: futilityBounds
param_accrualDuration

Parameter Description: accrualDuration
param_futilityStopping

Parameter Description: futilityStopping
param_fixedFollowup

Parameter Description: fixedFollowup
param_estimateHazardRatio

Parameter Description: estimateHazardRatio
param_accrualIntensity

Parameter Description: accrualIntensity
param_informationRates

Parameter Description: informationRates
param_accrualTime

Parameter Description: accrualTime
param_allocationRatioPlanned

Parameter Description: allocationRatioPlanned
param_parameterBetaSpending

Parameter Description: parameterBetaSpending
param_gamma1_stratified

Parameter Description: gamma1_stratified
param_lambda2_stratified

Parameter Description: lambda2_stratified
param_gamma2_stratified

Parameter Description: gamma2_stratified
param_lambda

Parameter Description: lambda
param_piecewiseSurvivalTime

Parameter Description: piecewiseSurvivalTime
param_parameterAlphaSpending

Parameter Description: parameterAlphaSpending
param_gamma2

Parameter Description: gamma2
param_followupTime

Parameter Description: followupTime
param_lambda1_stratified

Parameter Description: lambda1_stratified
param_minFollowupTime

Parameter Description: minFollowupTime
patrisk

Probability of Being at Risk
param_lambda2

Parameter Description: lambda2
param_kMax

Parameter Description: kMax
pd

Integrated Event Probability Over an Interval
param_hazardRatioH0

Parameter Description: hazardRatioH0
param_maxFollowupTime

Parameter Description: maxFollowupTime
phregr

Proportional Hazards Regression Models
param_typeOfComputation

Parameter Description: typeOfComputation
param_userBetaSpending

Parameter Description: userBetaSpending
param_rho2

Parameter Description: rho2
param_typeAlphaSpending

Parameter Description: typeAlphaSpending
param_rho1

Parameter Description: rho1
param_lambda1

Parameter Description: lambda1
param_stratumFraction

Parameter Description: stratumFraction
param_userAlphaSpending

Parameter Description: userAlphaSpending
pevent

Probability of Having an Event
print.adaptDesign

Print Adaptive Group Sequential Design
print.designMeanDiffXOEquiv

Print Power and Sample Size Results for Equivalence in Mean Difference in 2x2 Crossover
print.designLogistic

Print Power and Sample Size Results for Logistic Regression
print.designMeanDiffXO

Print Power and Sample Size Results for Mean Difference in 2x2 Crossover
powerFisherExact

Power for Fisher's Exact Test for Two Proportions
powerRiskDiffExactEquiv

Power for Exact Unconditional Test of Equivalence in Risk Difference
param_typeBetaSpending

Parameter Description: typeBetaSpending
print.BOINTable

Print the Decision Table for the BOIN Design
powerRiskRatioExact

Power for Exact Unconditional Test of Risk Ratio
print.designAgreement

Print Power and Sample Size Results for Cohen's kappa.
powerRiskRatioExactEquiv

Power for Exact Unconditional Test of Equivalence in Risk Ratio
print.design

Print Group Sequential Design
powerOnePropExact

Power for Binomial One-Sample Exact Test
print.designPairedMeanRatio

Print Power and Sample Size Results for Paired Mean Ratio
print.designRiskRatioFM

Print Power and Sample Size Results for Two-Sample Risk Ratio Based on the Farrington-Manning Score Test
print.designMeanDiff

Print Power and Sample Size Results for Two-Sample Mean Difference
print.designOddsRatio

Print Power and Sample Size Results for Two-Sample Odds Ratio
print.designPairedPropMcNemar

Print Power and Sample Size Results for McNemar's Test for Paired Proportions
print.designMeanDiffCarryover

Print Power and Sample Size Results for Direct Treatment Effects in Crossover Trials With or Without Accounting for Carryover Effects
print.designMeanDiffEquiv

Print Power and Sample Size Results for Equivalence in Two-Sample Mean Difference
powerOneRateExact

Power for Poisson One-Sample Exact Test
print.designPairedMeanRatioEquiv

Print Power and Sample Size Results for Equivalence in Paired Mean Ratio
print.designPairedMeanDiffEquiv

Print Power and Sample Size Results for Equivalence in Paired Mean Difference
print.designMeanDiffCarryoverEquiv

Print Power and Sample Size Results for Equivalence in Direct Treatment Effects in Crossover Trials With or Without Accounting for Carryover Effects
print.designSlopeDiff

Print Power and Sample Size Results for Two-Sample Slope Difference
print.designRepeatedANOVA

Print Power and Sample Size Results for One-Way Repeated Measures ANOVA
print.designRepeatedANOVAContrast

Print Power and Sample Size Results for a Single Contrast in One-Way Repeated Measures ANOVA
print.kmpowerequiv

Print Power and Sample Size Results for Equivalence in Milestone Survival Probability Difference
print.designMeanDiffMMRM

Print Power and Sample Size Results for Two-Sample Mean Difference at the Last Time Point From the MMRM Model
print.designMeanRatioXO

Print Power and Sample Size Results for Mean Ratio in 2x2 Crossover
print.designRiskDiffEquiv

Print Power and Sample Size Results for Equivalence in Two-Sample Risk Difference
print.designOddsRatioEquiv

Print Power and Sample Size Results for Equivalence in Two-Sample Odds Ratio
print.designMeanRatioEquiv

Print Power and Sample Size Results for Equivalence in Two-Sample Mean Ratio
print.designMeanRatio

Print Power and Sample Size Results for Two-Sample Mean Ratio
print.designANOVAContrast

Print Power and Sample Size Results for a Single Contrast in One-Way ANOVA
print.designOneMean

Print Power and Sample Size Results for One-Sample Mean
print.designANOVA

Print Power and Sample Size Results for One-Way ANOVA
print.designRiskDiff

Print Power and Sample Size Results for Two-Sample Risk Difference
print.designOrderedBinom

Print Power and Sample Size Results for Cochran-Armitage Trend Test for Ordered Multi-Sample Binomial Response
print.designPairedMeanDiff

Print Power and Sample Size Results for Paired Mean Difference
print.designUnorderedBinom

Print Power and Sample Size Results for Unordered Multi-Sample Binomial Response
print.designMeanRatioXOEquiv

Print Power and Sample Size Results for Equivalence in Mean Ratio in 2x2 Crossover
print.designTwoOrdinal

Print Power and Sample Size Results for Wilcoxon Test for Two-Sample Ordinal Response.
print.designRiskRatio

Print Power and Sample Size Results for Two-Sample Risk Ratio
print.designOneMultinom

Print Power and Sample Size Results for One-Sample Multinomial Response
print.designTwoWayANOVA

Print Power and Sample Size Results for Two-Way ANOVA
print.designEquiv

Print Group Sequential Equivalence Design
powerRiskDiffExact

Power for Exact Unconditional Test of Risk Difference
print.mTPI2Table

Print the Decision Table for the mTPI-2 Design
print.kmpower

Print Power and Sample Size Results for Milestone Survival Difference
ptpwexp

Distribution Function of Truncated Piecewise Exponential Distribution
print.designRiskRatioEquiv

Print Power and Sample Size Results for Equivalence in Two-Sample Risk Ratio
print.liferegr

Print liferegr Object
print.phregr

Print phregr Object
print.kmpower1s

Print Power and Sample Size Results for One-Sample Milestone Survival Probability
print.designUnorderedMultinom

Print Power and Sample Size Results for Unordered Multi-Sample Multinomial Response
riskRatioExactPValue

P-Value for Exact Unconditional Test of Risk Ratio
riskRatioExactCI

Exact Unconditional Confidence Interval for Risk Ratio
qtpwexp

Quantile Function of Truncated Piecewise Exponential Distribution
pwexpcuts

Piecewise Exponential Approximation to a Survival Distribution
print.logisregr

Print logisregr Object
print.lrpower

Print Power and Sample Size Results for Log-Rank Tests
print.nbpower1s

Print Power and Sample Size Results for One-Sample Negative Binomial Rate
print.nbpowerequiv

Print Power and Sample Size Results for Equivalence in Negative Binomial Rate Ratio
pwexploglik

Profile Log-Likelihood Function for the Change Points in Piecewise Exponential Approximation
residuals_liferegr

Residuals for Parametric Regression Models for Failure Time Data
qrcpp

QR Decomposition of a Matrix
repeatedPValue

Repeated p-Values for Group Sequential Design
remlRiskRatio

REML Estimates of Individual Proportions With Specified Risk Ratio
residuals_phregr

Residuals for Proportional Hazards Regression Models
print.designOneSlope

Print Power and Sample Size Results for One-Sample Slope
print.nbpower

Print Power and Sample Size Results for Negative Binomial Rate Ratio
print.designSlopeDiffMMRM

Print Power and Sample Size Results for Two-Sample Slope Difference at the Last Time Point From the MMRM Model
print.designOneProportion

Print Power and Sample Size Results for One-Sample Proportion
print.rmpower

Print Power and Sample Size Results for Restricted Mean Survival Time Difference
remlRateRatio

REML Estimates of Individual Rates With Specified Rate Ratio
remlRiskDiff

REML Estimates of Individual Proportions With Specified Risk difference
rmsamplesizeequiv

Sample Size for Equivalence in Restricted Mean Survival Time Difference
rmsamplesize1s

Sample Size for One-Sample Restricted Mean Survival Time
rawdata

A simulated time-to-event data set with 10 replications
print.designTwoMultinom

Print Power and Sample Size Results for Difference in Two-Sample Multinomial Response
rmst

Restricted Mean Survival Time
rmstat

Stratified Difference in Restricted Mean Survival Times
print.rmpower1s

Print Power and Sample Size Results for One-Sample Restricted Mean Survival Time
rmest

Estimate of Restricted Mean Survival Time
rmdiff

Estimate of Restricted Mean Survival Time Difference
remlOddsRatio

REML Estimates of Individual Proportions With Specified Odds Ratio
print.designWilcoxon

Print Power and Sample Size Results for Two-Sample Wilcoxon Test
print.rmpowerequiv

Print Power and Sample Size Results for Equivalence in Restricted Mean Survival Time Difference
print.estimateCI

Print the Point Estimate and Confidence Interval
print.lrsim

Print Simulation Results for Log-Rank Tests
print.lrpowerequiv

Print Power and Sample Size Results for Equivalence in Hazard Ratio
riskDiffExactPValue

P-Value for Exact Unconditional Test of Risk Difference
riskDiffExactCI

Exact Unconditional Confidence Interval for Risk Difference
rmpower

Power for Difference in Restricted Mean Survival Times
rmstat1

Restricted Mean Survival Time by Stratum
remlRateDiff

REML Estimates of Individual Rates With Specified Rate Difference
rtpwexp

Random Number Generation Function of Truncated Piecewise Exponential Distribution
rmpowerequiv

Power for Equivalence in Restricted Mean Survival Time Difference
samplesizeRiskRatioExactEquiv

Sample Size for Exact Unconditional Test of Equivalence in Risk Ratio
samplesizeRiskRatioExact

Sample Size for Exact Unconditional Test of Risk Ratio
rmsamplesize

Sample Size for Difference in Restricted Mean Survival Times
runShinyApp_lrstat

Run Shiny App
samplesizeFisherExact

Sample Size for Fisher's Exact Test for Two Proportions
rmpower1s

Power for One-Sample Restricted Mean Survival Time
samplesizeRiskDiffExact

Sample Size for Exact Unconditional Test of Risk Difference
samplesizeOneRateExact

Sample Size for Poisson One-Sample Exact Test
samplesizeOnePropExact

Sample Size for Binomial One-Sample Exact Test
samplesizeRiskDiffExactEquiv

Sample Size for Exact Unconditional Test of Equivalence in Risk Difference
survQuantile

Brookmeyer-Crowley Confidence Interval for Quantiles of Right-Censored Time-to-Event Data
survfit_phregr

Survival Curve for Proportional Hazards Regression Models
simonBayesAnalysis

Analysis of Simon's Bayesian Basket Trials
simon2stage

Simon's Two-Stage Design
svdcpp

Singular Value Decomposition of a Matrix
survsplit

Split a survival data set at specified cut points
zstatOddsRatio

Miettinen-Nurminen Score Test Statistic for Two-Sample Odds Ratio
zstatRateDiff

Miettinen-Nurminen Score Test Statistic for Two-Sample Rate Difference
zstatRateRatio

Miettinen-Nurminen Score Test Statistic for Two-Sample Rate Ratio
zstatRiskDiff

Miettinen-Nurminen Score Test Statistic for Two-Sample Risk difference
shilong

The randomized clinical trial SHIVA data in long format from the ipcwswitch package
updateGraph

Update Graph for Graphical Approaches
zstatRiskRatio

Miettinen-Nurminen Score Test Statistic for Two-Sample Risk Ratio
tobin

Tobin's tobit data from the survival package
sexagg

Urinary tract infection data from the logistf package
simonBayesSim

Simulation of Simon's Bayesian Basket Trials
six

The repeated measures data from the "Six Cities" study of the health effects of air pollution (Ware et al. 1984).