###################################################
### chunk number 1: options eval=FALSE
###################################################
## options(width=50, digits=2)


###################################################
### chunk number 2: corrln
###################################################
library(lattice)
set.seed(2)
n <- 50
x <- rnorm(n)
df <- data.frame(X=x,
                 Y=c(x  + rnorm(n) / 4,
                     2 + x + rnorm(n) / 4,
                     rnorm(n) / 4),
                 Group=rep(LETTERS[1:3], each=n))
trellis.par.set("superpose.symbol", list(pch=20, cex=2))
show(xyplot(Y~X, group=Group, df, pch=20, cex=2,
            auto.key=list(pch=20, cex=2, corner=c(.05, .95))))