Skip to content

Commit 1de6365

Browse files
author
Sebastian Kopf
committed
fix for syntax error in labeller examples
1 parent 0236669 commit 1de6365

File tree

2 files changed

+2
-2
lines changed

2 files changed

+2
-2
lines changed

R/facet-labels.r

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -130,7 +130,7 @@ label_wrap_gen <- function(width = 25) {
130130
#' 'domesticated'='Domesticated')
131131
#' ## Source: http://en.wikipedia.org/wiki/Uncyclopedia:Conservation_status
132132
#'
133-
#' p2 <- ggplot(msleep, aes(x=sleep_total, y=awake)) + geom_point() +
133+
#' p2 <- ggplot(msleep, aes(x=sleep_total, y=awake)) + geom_point()
134134
#' p2 + facet_grid(vore ~ conservation, labeller=labeller(vore=capitalize))
135135
#'
136136
#' p2 + facet_grid(vore ~ conservation,

man/labeller.Rd

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -63,7 +63,7 @@ conservation_status <- c('cd'='Conservation Dependent',
6363
'domesticated'='Domesticated')
6464
## Source: http://en.wikipedia.org/wiki/Uncyclopedia:Conservation_status
6565
66-
p2 <- ggplot(msleep, aes(x=sleep_total, y=awake)) + geom_point() +
66+
p2 <- ggplot(msleep, aes(x=sleep_total, y=awake)) + geom_point()
6767
p2 + facet_grid(vore ~ conservation, labeller=labeller(vore=capitalize))
6868
6969
p2 + facet_grid(vore ~ conservation,

0 commit comments

Comments
 (0)