Hi Baptiste,
thank you very much for that link. I think that is a very
good starting point for my plot...
...anyway there is a problem with the example,
1) it does use the function unit() and therefore libarary(grid) must be loaded (thats not the problem)
2) I can't reproduce the output of the example for the L-shape, I only
get a line for the x-axis... not for both (x and y)
Any suggestions what I am doing wrong resp. how the code has to
change to fit to the new version of ggplot2?
Here the example from the link:
library(grid)
library(gglot2)
theme_minimal <- function (base_size = 12, base_family = "")
{
structure(list(axis.line = theme_blank(), axis.text.x = theme_text(family = base_family,
size = base_size * 0.8, lineheight = 0.9, vjust = 1),
axis.text.y = theme_text(family = base_family, size = base_size *
0.8, lineheight = 0.9, hjust = 1), axis.ticks = theme_segment(colour = "black",
size = 0.2), axis.title.x = theme_text(family = base_family,
size = base_size, vjust = 1), axis.title.y = theme_text(family = base_family,
size = base_size, angle = 90, vjust = 0.5), axis.ticks.length = unit(0.3,
"lines"), axis.ticks.margin = unit(0.5, "lines"), legend.background = theme_rect(colour = NA),
legend.margin = unit(0.2, "cm"), legend.key = theme_rect(colour = NA),
legend.key.size = unit(1.2, "lines"), legend.key.height = NULL,
legend.key.width = NULL, legend.text = theme_text(family = base_family,
size = base_size * 0.8), legend.text.align = NULL,
legend.title = theme_text(family = base_family, size = base_size *
0.8, face = "bold", hjust = 0), legend.title.align = NULL,
legend.position = "right", legend.direction = "vertical", legend.justification = "center",
legend.box = NULL, panel.background = theme_rect(fill = "white",
colour = NA), panel.border = theme_rect(fill = NA,
colour = "grey90"), panel.grid.major = theme_line(colour = "grey90",
size = 0.2), panel.grid.minor = theme_line(colour = "grey98",
size = 0.5), panel.margin = unit(0.25, "lines"),
strip.background = theme_rect(fill = NA, colour = NA),
strip.text.x = theme_text(family = base_family, size = base_size *
0.8), strip.text.y = theme_text(family = base_family,
size = base_size * 0.8, angle = -90), plot.background = theme_rect(colour = NA),
plot.title = theme_text(family = base_family, size = base_size *
1.2), plot.margin = unit(c(1, 1, 0.5, 0.5), "lines")),
class = "options")
}
theme_minimal_cb_L <- function (base_size = 12, base_family = "", ...){
modifyList (theme_minimal (base_size = base_size, base_family = base_family),
list (axis.line = theme_segment (colour = "black")))
}
mdf <- data.frame(x <- seq(0, 10), y=rnorm(x),
f=factor(rep(letters[1:2], each=3, length=length(x))))
p <- qplot(x, y, data=mdf, colour=f, geom=c("line", "point")) +
scale_x_continuous(expand=c(0,0))+
scale_y_continuous(expand=c(0,0))+
theme_minimal_cb_L()
Thank you and
best regards,
Johannes
-------- Original-Nachricht --------
> Datum: Thu, 26 Apr 2012 21:44:43 +1200
> Von: baptiste auguie <
baptist...@googlemail.com>
> An: Johannes Radinger <
JRad...@gmx.at>
> CC:
ggp...@googlegroups.com
> Betreff: Re: L-shaped box around plot