Skip to content

Instantly share code, notes, and snippets.

@muschellij2
Created January 23, 2013 14:31
Show Gist options
  • Star 0 You must be signed in to star a gist
  • Fork 0 You must be signed in to fork a gist
  • Save muschellij2/4606458 to your computer and use it in GitHub Desktop.
Save muschellij2/4606458 to your computer and use it in GitHub Desktop.
Modifications to forestplot2 from package rmeta in R (CRAN)
forestplot2 <- function (labeltext, mean, lower, upper, align = NULL, is.summary = FALSE,
clip = c(-Inf, Inf), xlab = "", zero = 0, graphwidth = unit(2,
"inches"), col = meta.colors(), xlog = FALSE, xticks = NULL,
boxsize = NULL, fontsize=5, xrange=NULL, add=FALSE, cgap = unit(8, "mm"), type="rect", ...)
{
require("grid") || stop("`grid' package not found")
require("rmeta") || stop("`rmeta' package not found")
drawNormalCI <- function(LL, OR, UL, size, boxcol, linecol, itype) {
circle <- ifelse(itype == "circle", TRUE, FALSE)
size = 0.75 * size
clipupper <- convertX(unit(UL, "native"), "npc", valueOnly = TRUE) >
1
cliplower <- convertX(unit(LL, "native"), "npc", valueOnly = TRUE) <
0
box <- convertX(unit(OR, "native"), "npc", valueOnly = TRUE)
clipbox <- box < 0 || box > 1
if (clipupper || cliplower) {
ends <- "both"
lims <- unit(c(0, 1), c("npc", "npc"))
if (!clipupper) {
ends <- "first"
lims <- unit(c(0, UL), c("npc", "native"))
}
if (!cliplower) {
ends <- "last"
lims <- unit(c(LL, 1), c("native", "npc"))
}
grid.lines(x = lims, y = 0.5, arrow = arrow(ends = ends,
length = unit(0.05, "inches")), gp = gpar(col = linecol))
if (!clipbox) {
if (circle) grid.circle(x = unit(OR, "native"), r = unit(size, "snpc"), gp = gpar(fill = boxcol, col = boxcol))
else grid.rect(x = unit(OR, "native"), width = unit(size,
"snpc"), height = unit(size, "snpc"), gp = gpar(fill = boxcol,
col = boxcol))
}
}
else {
grid.lines(x = unit(c(LL, UL), "native"), y = 0.5,
gp = gpar(col = linecol))
if (circle) grid.circle(x = unit(OR, "native"), r = unit(size,
"snpc"), gp = gpar(fill = boxcol,
col = boxcol))
else grid.rect(x = unit(OR, "native"), width = unit(size,
"snpc"), height = unit(size, "snpc"), gp = gpar(fill = boxcol,
col = boxcol))
if ((convertX(unit(OR, "native") + unit(0.5 * size,
"lines"), "native", valueOnly = TRUE) > UL) &&
(convertX(unit(OR, "native") - unit(0.5 * size,
"lines"), "native", valueOnly = TRUE) < LL))
grid.lines(x = unit(c(LL, UL), "native"), y = 0.5,
gp = gpar(col = linecol))
}
}
drawSummaryCI <- function(LL, OR, UL, size) {
grid.polygon(x = unit(c(LL, OR, UL, OR), "native"), y = unit(0.5 +
c(0, 0.5 * size, 0, -0.5 * size), "npc"), gp = gpar(fill = col$summary,
col = col$summary))
}
if (!add) plot.new()
# print(labeltext)
widthcolumn <- !apply(is.na(labeltext), 1, any)
nc <- NCOL(labeltext)
labels <- vector("list", nc)
if (is.null(align))
align <- c("l", rep("r", nc - 1))
else align <- rep(align, length = nc)
nr <- NROW(labeltext)
is.summary <- rep(is.summary, length = nr)
if (length(fontsize) == 1) fontsize <- rep(fontsize, nr)
if (length(col$text) == 1) col$text <- rep(col$text, nr)
for (j in 1:nc) {
labels[[j]] <- vector("list", nr)
for (i in 1:nr) {
if (is.na(labeltext[i, j]))
next
x <- switch(align[j], l = 0, r = 1, c = 0.5)
just <- switch(align[j], l = "left", r = "right",
c = "center")
labels[[j]][[i]] <- textGrob(labeltext[i, j], x = x,
just = just, gp = gpar(fontface = if (is.summary[i])
"bold"
else "plain", col = rep(col$text[i], length = nr)[i], fontsize=fontsize[i]))
}
}
# print(labels[[1]][widthcolumn])
colgap <- cgap
colwidths <- unit.c(max(unit(rep(1, sum(widthcolumn)), "grobwidth",
labels[[1]][widthcolumn])), colgap)
if (nc > 1) {
for (i in 2:nc) colwidths <- unit.c(colwidths, max(unit(rep(1,
sum(widthcolumn)), "grobwidth", labels[[i]][widthcolumn])),
colgap)
}
# print(colwidths)
colwidths <- unit.c(colwidths, graphwidth)
# print(colwidths)
pushViewport(viewport(layout = grid.layout(nr + 1, nc * 2 +
1, widths = colwidths, heights = unit(c(rep(1, nr), 0.5),
"lines"))))
cwidth <- (upper - lower)
if (is.null(xrange)) xrange <- c(max(min(lower, na.rm = TRUE), clip[1]), min(max(upper,
na.rm = TRUE), clip[2]))
info <- 1/cwidth
info <- info/max(info[!is.summary], na.rm = TRUE)
info[is.summary] <- 1
if (!is.null(boxsize))
info <- rep(boxsize, length = length(info))
for (j in 1:nc) {
for (i in 1:nr) {
if (!is.null(labels[[j]][[i]])) {
pushViewport(viewport(layout.pos.row = i, layout.pos.col = 2 *
j - 1))
grid.draw(labels[[j]][[i]])
popViewport()
}
}
}
pushViewport(viewport(layout.pos.col = 2 * nc + 1, xscale = xrange))
grid.lines(x = unit(zero, "native"), y = 0:1, gp = gpar(col = col$zero))
if (xlog) {
if (is.null(xticks)) {
ticks <- pretty(exp(xrange))
ticks <- ticks[ticks > 0]
}
else {
ticks <- xticks
}
if (length(ticks)) {
if (min(lower, na.rm = TRUE) < clip[1])
ticks <- c(exp(clip[1]), ticks)
if (max(upper, na.rm = TRUE) > clip[2])
ticks <- c(ticks, exp(clip[2]))
xax <- xaxisGrob(gp = gpar(cex = 0.6, col = col$axes),
at = log(ticks), name = "xax")
xax1 <- editGrob(xax, gPath("labels"), label = format(ticks,
digits = 2))
grid.draw(xax1)
}
}
else {
if (is.null(xticks)) {
grid.xaxis(gp = gpar(cex = 0.6, col = col$axes))
}
else if (length(xticks)) {
grid.xaxis(at = xticks, gp = gpar(cex = 0.6, col = col$axes))
}
}
grid.text(xlab, y = unit(-2, "lines"), gp = gpar(col = col$axes))
# print(xlab)
popViewport()
if (length(col$box) == 1) col$box <- rep(col$box, nr)
if (length(col$lines) == 1) col$lines <- rep(col$lines, nr)
if (length(type) == 1) type <- rep(type, nr)
for (i in 1:nr) {
if (is.na(mean[i]))
next
pushViewport(viewport(layout.pos.row = i, layout.pos.col = 2 *
nc + 1, xscale = xrange))
if (is.summary[i])
drawSummaryCI(lower[i], mean[i], upper[i], info[i], col$box[i], col$lines[i], type[i])
else drawNormalCI(lower[i], mean[i], upper[i], info[i], col$box[i], col$lines[i], type[i])
popViewport()
}
popViewport()
}
environment(forestplot2) <- as.environment("package:rmeta")
Sign up for free to join this conversation on GitHub. Already have an account? Sign in to comment