Skip to content

Commit

Permalink
Adjust filter criterion in examples
Browse files Browse the repository at this point in the history
  • Loading branch information
Thomas Knecht authored and ThomasKnecht committed Oct 1, 2019
1 parent 87c00fa commit d35ea70
Showing 1 changed file with 1 addition and 1 deletion.
2 changes: 1 addition & 1 deletion R/position-nudgestack.R
Original file line number Diff line number Diff line change
Expand Up @@ -26,7 +26,7 @@
#' tidyr::gather(key = key, value = value, -date) %>%
#' group_by(date, key) %>%
#' summarize(value = mean(value)) %>%
#' filter(date >= "1995-01-01" & date <= "1997-12-01")
#' filter(date >= "1995-01-01" & date < "1998-01-01")
#'
#' ggplot(data = ESM_prep, mapping = aes(x = date, y = value, fill = key)) +
#' geom_col(position = position_nudgestack(x = 15))
Expand Down

0 comments on commit d35ea70

Please sign in to comment.