Skip to content

Commit

Permalink
Delete emtpy rows
Browse files Browse the repository at this point in the history
  • Loading branch information
Thomas Knecht authored and Thomas Knecht committed Sep 18, 2019
1 parent 2782c9d commit 3d61c3a
Showing 1 changed file with 0 additions and 4 deletions.
4 changes: 0 additions & 4 deletions R/position-nudgestack.R
Original file line number Diff line number Diff line change
Expand Up @@ -29,8 +29,6 @@ position_nudgestack <- function(x = 0, y = 0, vjust = 1, reverse = FALSE) {
)
}



#' @rdname ggplot2-ggproto
#' @format NULL
#' @usage NULL
Expand Down Expand Up @@ -99,8 +97,6 @@ PositionNudgeStack <- ggproto("PositionNudgeStack", Position,

data <- rbind(neg, pos)[match(seq_len(nrow(data)), c(which(negative), which(!negative))), ]



# transform only the dimensions for which non-zero nudging is requested
if (any(params$x != 0)) {
if (any(params$y != 0)) {
Expand Down

0 comments on commit 3d61c3a

Please sign in to comment.