Skip to content

Commit 3e9c42b

Browse files
dariobuttariwch
authored andcommitted
Adding linetype functionality to the legend of the boxplot geom. This fixes #608. Code fix was provided by Kohske Takahashi.
1 parent 5cce66c commit 3e9c42b

File tree

1 file changed

+1
-1
lines changed

1 file changed

+1
-1
lines changed

R/geom-boxplot.r

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -180,7 +180,7 @@ GeomBoxplot <- proto(Geom, {
180180
guide_geom <- function(.) "boxplot"
181181
draw_legend <- function(., data, ...) {
182182
data <- aesdefaults(data, .$default_aes(), list(...))
183-
gp <- with(data, gpar(col=colour, fill=alpha(fill, alpha), lwd=size * .pt))
183+
gp <- with(data, gpar(col=colour, fill=alpha(fill, alpha), lwd=size * .pt, lty = linetype))
184184
gTree(gp = gp, children = gList(
185185
linesGrob(0.5, c(0.1, 0.25)),
186186
linesGrob(0.5, c(0.75, 0.9)),

0 commit comments

Comments
 (0)