Termplot {memisc}R Documentation

Termplot lattices

Description

Termplot produces a lattice plot of termplots. Terms are not plotted individually, rather the terms in which a variable appears are summed and plotted.

Usage

  
## Default S3 method:
Termplot(object, ..., variables=NULL,  col.term = 2,
        lty.term = 1, lwd.term = 1.5, col.se = "orange", lty.se = 2,
        lwd.se = 1, col.res = "gray", cex = 1, pch = par("pch"),
        col.smth = "darkred", lty.smth = 2, lwd.smth = 1,
        span.smth = 2/3, aspect="fill", xlab=NULL, ylab=NULL,
        main=paste(deparse(object$call),collapse="\n"),
        models = c("rows", "columns"), layout = NULL)

Arguments

object an model fit object, or a list of model objects
... further model objects.
variables a character vector giving the names of independent variables; note that the combined effect of all terms containing the respective values will be plotted; if empty, the effect of each independent variable will be plotted. Currently, higher-order terms will be ignored.
col.term same meaning as in termplot.
lty.term same meaning as in termplot.
lwd.term same meaning as in termplot.
col.se same meaning as in termplot.
lty.se same meaning as in termplot.
lwd.se same meaning as in termplot.
col.res same meaning as in termplot.
cex same meaning as in termplot.
pch same meaning as in termplot.
col.smth same meaning as in termplot.
lty.smth same meaning as in termplot.
lwd.smth same meaning as in termplot.
span.smth same meaning as in termplot.
aspect aspect ratio of the plot(s), see xyplot.
xlab label of the x axis, see xyplot.
ylab label of the y axis, see xyplot.
main main heading, see xyplot.
models character; should models arranged in rows or columns?
layout layout specification, see xyplot.

Value

A trellis object.

Examples


library(lattice)
library(grid)


lm0 <- lm(sr ~ pop15 + pop75,              data = LifeCycleSavings)
lm1 <- lm(sr ~                 dpi + ddpi, data = LifeCycleSavings)
lm2 <- lm(sr ~ pop15 + pop75 + dpi + ddpi, data = LifeCycleSavings)

berkeley <- aggregate(wtable(Admit,Freq)~.,data=UCBAdmissions)
berk0 <- glm(cbind(Admitted,Rejected)~1,data=berkeley,family="binomial")
berk1 <- glm(cbind(Admitted,Rejected)~Gender,data=berkeley,family="binomial")
berk2 <- glm(cbind(Admitted,Rejected)~Gender+Dept,data=berkeley,family="binomial")

Termplot(lm2)
Termplot(berk2)
Termplot(lm0,lm1,lm2)
Termplot(berk0,berk1,berk2)

Termplot(By(~Gender,glm(cbind(Admitted,Rejected)~Dept,family="binomial"),data=berkeley))
Termplot(By(~Dept,glm(cbind(Admitted,Rejected)~Gender,family="binomial"),data=berkeley))

require(splines)
xyz <- data.frame(
  x = 1:100,
  z = factor(rep(LETTERS[1:4],25))
)
xyz <- transform(xyz,
  y = rnorm(100,sin(x/10)+x/50+as.numeric(z))
)
yxz.lin <- glm(y ~ x + z, data=xyz)
yxz.bs <- glm(y ~ bs(x,6) + z, data=xyz)
yxz.ns <- glm(y ~ ns(x,6) + z, data=xyz)
yxz.poly <- glm(y ~ poly(x,6) + z, data=xyz)
yxz.sincos <- glm(y ~ sin(x/10) + cos(x/10) + x + z, data=xyz)
#
# This shows off a crucial feature: terms containing
# the same variable are not plotted
# individually but their combined effect is plotted
#
Termplot(yxz.lin,yxz.bs,yxz.ns,yxz.poly,yxz.sincos,models="columns",
  span.smth=1/3)

Termplot(yxz.lin,yxz.bs,yxz.ns,yxz.poly,yxz.sincos,variables="x",
  span.smth=1/3)


  

[Package memisc version 0.11-10 Index]