Skip to content

Commit 831d569

Browse files
committed
Add package spezifications
1 parent af4abb5 commit 831d569

File tree

1 file changed

+3
-3
lines changed

1 file changed

+3
-3
lines changed

R/position-nudgestack.R

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -17,9 +17,9 @@
1717
#'
1818
#' ESM_prep <- ESM %>%
1919
#' dplyr::mutate(time = as.Date(paste0(format(time, "%Y-%m"), "-1"))) %>%
20-
#' group_by(id, time) %>%
21-
#' summarize(value = mean(value)) %>%
22-
#' filter(time >= "1995-01-01" & time < "1998-01-01")
20+
#' dplyr::group_by(id, time) %>%
21+
#' dplyr::summarize(value = mean(value)) %>%
22+
#' dplyr::filter(time >= "1995-01-01" & time < "1998-01-01")
2323
#'
2424
#' ggplot(data = ESM_prep, mapping = aes(x = time, y = value, fill = id)) +
2525
#' geom_col(position = position_nudgestack(x = 15))

0 commit comments

Comments
 (0)