Blast, only pasted half the code. Here it is in a form that might even work. Apologies.
library(RGraphics)
library(gridExtra)
library(ggplot2)
chartjunk <- data.frame(xx = 16:35,
act = c( 1,5,8,42,192,171,143,114,102,133,100,94,69,69,51,34,18,12,7,1),
dg = c(0,1,1,3,12,20,17,18,21,38,29,34,30,28,22,19,11,9,6,1))
char1 <- melt(chartjunk, id.vars = c("xx"))
g1 <- ggplot(char1, aes(xx, value, colour = variable )) +
geom_line() + geom_g1 point()
g2 <- tableGrob(chartjunk)
grid.arrange(g1, g2, ncol=2)
On Wednesday, April 29, 2015 at 9:08:19 PM UTC-4, Timothy Lau wrote: