Nothing
# C_box(which, lty, ...)
C_box <- function(x) {
dev.set(recordDev())
# NOTE: although 'lty' is passed in, it is not explicitly handled
par <- currentPar(x[-(1:2)])
## If specified non-NA or non-NULL 'col' use that
inlineCol <- getInlinePar(x[-(1:2)], "col")
if (!is.null(inlineCol) && !is.na(inlineCol[1])) {
par$col <- inlineCol
} else {
## Else if specified non-NA or non-NULL 'fg' use that
inlineFg <- getInlinePar(x[-(1:2)], "fg")
if (!is.null(inlineFg) && !is.na(inlineFg[1])) {
par$col <- inlineFg
} else {
## Else use par("col")
par$col <- par("col")
}
}
dev.set(playDev())
which <- x[[2]]
if (which == 1) { # "plot"
depth <- gotovp(NA, "plot")
# NOTE: copy GBox which draws *polygon* (not rect) AND
# explicitly sets fill to NA
xy <- switch(par$bty,
"o"=,
"O"=list(x=c(0, 1, 1, 0), y=c(0, 0, 1, 1)),
"l"=,
"L"=list(x=c(0, 0, 1), y=c(1, 0, 0)),
"7"=list(x=c(0, 1, 1), y=c(1, 1, 0)),
"c"=,
"C"=,
"["=list(x=c(1, 0, 0, 1), y=c(1, 1, 0, 0)),
"]"=list(x=c(0, 1, 1, 0), y=c(1, 1, 0, 0)),
"u"=,
"U"=list(x=c(0, 0, 1, 1), y=c(1, 0, 0, 1)))
if (par$bty %in% c("n", "N")) {
# do nothing
} else if (par$bty %in% c("o", "O")) {
grid.polygon(xy$x, xy$y,
gp=gpar(col=par$col, lty=par$lty, lwd=par$lwd, fill=NA,
lineend=par$lend, linemitre=par$lmitre,
linejoin=par$ljoin),
name=grobname("box"))
} else {
grid.lines(xy$x, xy$y,
gp=gpar(col=par$col, lty=par$lty, lwd=par$lwd,
lineend=par$lend, linemitre=par$lmitre,
linejoin=par$ljoin),
name=grobname("box"))
}
} else if (which == 2) { # "figure"
depth <- gotovp(NA, "figure")
grid.polygon(c(0, 1, 1, 0), c(0, 0, 1, 1),
gp=gpar(col=par$col, lty=par$lty, lwd=par$lwd, fill=NA,
lineend=par$lend, linemitre=par$lmitre,
linejoin=par$ljoin),
name=grobname("box-figure"))
} else if (which == 3) { # "inner"
depth <- gotovp(NA, "inner")
grid.polygon(c(0, 1, 1, 0), c(0, 0, 1, 1),
gp=gpar(col=par$col, lty=par$lty, lwd=par$lwd, fill=NA,
lineend=par$lend, linemitre=par$lmitre,
linejoin=par$ljoin),
name=grobname("box-inner"))
} else { # "outer"
depth <- gotovp(NA, "outer")
grid.polygon(c(0, 1, 1, 0), c(0, 0, 1, 1),
gp=gpar(col=par$col, lty=par$lty, lwd=par$lwd, fill=NA,
lineend=par$lend, linemitre=par$lmitre,
linejoin=par$ljoin),
name=grobname("box-outer"))
}
upViewport(depth)
}
Any scripts or data that you put into this service are public.
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.