Skip to content

Commit

Permalink
Add package spezifications
Browse files Browse the repository at this point in the history
  • Loading branch information
ThomasKnecht committed Oct 7, 2019
1 parent af4abb5 commit 831d569
Showing 1 changed file with 3 additions and 3 deletions.
6 changes: 3 additions & 3 deletions R/position-nudgestack.R
Original file line number Diff line number Diff line change
Expand Up @@ -17,9 +17,9 @@
#'
#' ESM_prep <- ESM %>%
#' dplyr::mutate(time = as.Date(paste0(format(time, "%Y-%m"), "-1"))) %>%
#' group_by(id, time) %>%
#' summarize(value = mean(value)) %>%
#' filter(time >= "1995-01-01" & time < "1998-01-01")
#' dplyr::group_by(id, time) %>%
#' dplyr::summarize(value = mean(value)) %>%
#' dplyr::filter(time >= "1995-01-01" & time < "1998-01-01")
#'
#' ggplot(data = ESM_prep, mapping = aes(x = time, y = value, fill = id)) +
#' geom_col(position = position_nudgestack(x = 15))
Expand Down

0 comments on commit 831d569

Please sign in to comment.