### R code from vignette source 'parody.Rnw'

###################################################
### code chunk number 1: rune
###################################################
library(parody)


###################################################
### code chunk number 2: parody.Rnw:100-101
###################################################
options(width=56)


###################################################
### code chunk number 3: run32
###################################################
lead <- c(83, 70, 62, 55, 56, 57, 57, 58, 59, 50, 51, 
        52, 52, 52, 54, 54, 45, 46, 48,
        48, 49, 40, 40, 41, 42, 42, 44, 
        44, 35, 37, 38, 38, 34, 13, 14)


###################################################
### code chunk number 4: dobo
###################################################
boxplot(lead)


###################################################
### code chunk number 5: dob1
###################################################
calout.detect(lead,alpha=.05,method="boxplot", scaling=
function(n,alpha)1.5)


###################################################
### code chunk number 6: dobi
###################################################
calout.detect(lead,alpha=.05,method="boxplot",ftype="ideal")


###################################################
### code chunk number 7: dor
###################################################
calout.detect(lead,alpha=.05,method="GESD",k=5)


###################################################
### code chunk number 8: dha
###################################################
calout.detect(lead,alpha=.05,method="medmad",scaling=hamp.scale.3)


###################################################
### code chunk number 9: dos
###################################################
calout.detect(lead,alpha=.05,method="shorth")


###################################################
### code chunk number 10: dot
###################################################
data(tcost)
ostr = mv.calout.detect(tcost)
ostr


###################################################
### code chunk number 11: dop
###################################################
thecol = rep("black", nrow(tcost))
thecol[ostr$ind] = "red"


###################################################
### code chunk number 12: dopr
###################################################
pairs(tcost, col=thecol, pch=19)


###################################################
### code chunk number 13: dopc
###################################################
pc = prcomp(tcost)


###################################################
### code chunk number 14: dobip
###################################################
biplot(pc)


###################################################
### code chunk number 15: dor
###################################################
ftcost = tcost[-c(9,21),]
fpc = prcomp(ftcost)


###################################################
### code chunk number 16: rfig
###################################################
biplot(fpc)