xtable.xbal {RItools}R Documentation

An xtable method for xbalance objects

Description

This function uses the xtable package framework to display the results of a call to xBalance in LaTeX format. At the moment, it ignores the omnibus chi-squared test information.

Usage

## S3 method for class 'xbal':
xtable(x, caption = NULL, label = NULL, align = c("l", rep(".", ncol(xvardf))), digits = 2, display = NULL, col.labels = NULL, ...)

Arguments

x an object resulting from a call to xBalance
caption See xtable.
label See xtable.
align See xtable. Our default is decimal aligned columns. This will require the use of the dcolumn package within LaTeX and also a new column definition using \newcolumntype{.}{D{.}{.}{2.2}.
digits See xtable. Default is 2.
display See xtable
col.labels Labels for the columns (the test statistics). Default are come from the call to print.xbal.
... Other arguments to print.xbal

Value

This function produces an xtable object which can then be printed with the appropriate print method (see print.xtable).

Examples

##---- Should be DIRECTLY executable !! ----
##-- ==>  Define data, use random,
##--    or do  help(data=index)  for the standard data sets.

data(nuclearplants)
require(xtable)

xb1<-xBalance(pr~ date + t1 + t2 + cap + ne + ct + bw + cum.n,
             strata=data.frame(unstrat=factor(character(32)),
               pt=factor(nuclearplants$pt)),
             data=nuclearplants,
             report=c('adj.means','adj.mean.diffs','std.diffs', 'z.scores', 'chisquare.test','p.values'))

xb1.xtab<-xtable(xb1)
print(xb1.xtab,add.to.row=attr(xb1.xtab,"latex.add.to.row"),hline.after=c(0,nrow(xb1.xtab)),sanitize.text.function=function(x){x},floating=TRUE,floating.environment="sidewaystable")

## The function is currently defined as
function (x, pvals = FALSE, caption = NULL, label = NULL, align = c("l", 
    rep(".", ncol(xvardf))), digits = 2, display = NULL, col.labels = NULL, 
    ...) 
{
    require(xtable)
    xprint <- print.xbal(x, digits = digits[1], printme = FALSE, 
        ...)
    numstrata <- dim(x$results)[3]
    latex.annotation <- attr(xprint, "latex.annotation")
    xvardf <- data.frame(xprint$vartable[, ])
    row.names(xvardf) <- attr(xprint$vartable, "row.vars")[["vars"]]
    names(xvardf) <- if (!is.null(col.labels)) {
        col.labels
    }
    else {
        paste("\multicolumn{1}{c}{", rep(attr(xprint$vartable, 
            "col.vars")[["stat"]], numstrata), "}", sep = "")
    }
    vartab <- xtable(xvardf, digits = digits, align = align, 
        hline.after = c(0, nrow(xvardf)), ...)
    structure(vartab, latex.add.to.row = list(pos = list(-1), 
        command = latex.annotation))
  }

[Package RItools version 0.1-5 Index]