Skip to content

Commit

Permalink
Add dummy data to layer to fix tidyverse#1655
Browse files Browse the repository at this point in the history
  • Loading branch information
thomasp85 committed Aug 1, 2016
1 parent b5a54e2 commit 87b7767
Show file tree
Hide file tree
Showing 3 changed files with 3 additions and 3 deletions.
2 changes: 1 addition & 1 deletion R/annotation-custom.r
Expand Up @@ -42,7 +42,7 @@ NULL
#' annotation_custom(grob = g, xmin = 1, xmax = 10, ymin = 8, ymax = 10)
annotation_custom <- function(grob, xmin = -Inf, xmax = Inf, ymin = -Inf, ymax = Inf) {
layer(
data = NULL,
data = data.frame(x = NA),
stat = StatIdentity,
position = PositionIdentity,
geom = GeomCustomAnn,
Expand Down
2 changes: 1 addition & 1 deletion R/annotation-map.r
Expand Up @@ -34,7 +34,7 @@ annotation_map <- function(map, ...) {
stopifnot(all(c("x", "y", "id") %in% names(map)))

layer(
data = NULL,
data = data.frame(x = NA),
stat = StatIdentity,
geom = GeomAnnotationMap,
position = PositionIdentity,
Expand Down
2 changes: 1 addition & 1 deletion R/annotation-raster.r
Expand Up @@ -43,7 +43,7 @@ annotation_raster <- function(raster, xmin, xmax, ymin, ymax,
raster <- grDevices::as.raster(raster)

layer(
data = NULL,
data = data.frame(x = NA),
mapping = NULL,
stat = StatIdentity,
position = PositionIdentity,
Expand Down

0 comments on commit 87b7767

Please sign in to comment.