Skip to content

Commit

Permalink
don't test any long-running examples
Browse files Browse the repository at this point in the history
  • Loading branch information
paleolimbot committed Jul 8, 2022
1 parent 1d949a0 commit 1c85861
Show file tree
Hide file tree
Showing 8 changed files with 16 additions and 0 deletions.
2 changes: 2 additions & 0 deletions R/geom-polypath.R
Original file line number Diff line number Diff line change
Expand Up @@ -26,10 +26,12 @@
#' @export
#'
#' @examples
#' \donttest{
#' library(ggplot2)
#' load_longlake_data(which = "longlake_waterdf")
#' ggplot(df_spatial(longlake_waterdf), aes(x, y, group = piece_id)) +
#' geom_polypath()
#' }
#'
geom_polypath <- function (mapping = NULL, data = NULL, stat = "identity", position = "identity",
na.rm = FALSE, show.legend = NA, inherit.aes = TRUE, rule = "winding",
Expand Down
2 changes: 2 additions & 0 deletions R/layer-spatial-bbox.R
Original file line number Diff line number Diff line change
Expand Up @@ -13,6 +13,7 @@
#' @export
#'
#' @examples
#' \donttest{
#' library(ggplot2)
#' load_longlake_data(which = c("longlake_waterdf", "longlake_depthdf"))
#' ggplot() +
Expand All @@ -24,6 +25,7 @@
#' ggplot() +
#' shadow_spatial(longlake_waterdf) +
#' layer_spatial(longlake_depthdf)
#' }
#'
layer_spatial.bbox <- function(data, mapping = aes(), ..., detail = 30) {
layer_spatial(sf_bbox_to_sf(data, detail = detail), mapping = mapping, ...)
Expand Down
2 changes: 2 additions & 0 deletions R/layer-spatial-raster.R
Original file line number Diff line number Diff line change
Expand Up @@ -17,10 +17,12 @@
#' @export
#'
#' @examples
#' \donttest{
#' library(ggplot2)
#' load_longlake_data(which = c("longlake_osm", "longlake_depth_raster"))
#' ggplot() + layer_spatial(longlake_osm)
#' ggplot() + layer_spatial(longlake_depth_raster) + scale_fill_continuous(na.value = NA)
#' }
#'
layer_spatial.Raster <- function(data, mapping = NULL, interpolate = NULL, is_annotation = FALSE,
lazy = FALSE, dpi = 150, ...) {
Expand Down
2 changes: 2 additions & 0 deletions R/layer-spatial.R
Original file line number Diff line number Diff line change
Expand Up @@ -16,6 +16,7 @@
#' @importFrom ggplot2 aes
#'
#' @examples
#' \donttest{
#' library(ggplot2)
#' load_longlake_data(
#' which = c(
Expand Down Expand Up @@ -43,6 +44,7 @@
#'
#' # spatial-aware automagic north arrow
#' annotation_north_arrow(location = "br", which_north = "true")
#' }
#'
layer_spatial <- function(data, mapping, ...) {
UseMethod("layer_spatial")
Expand Down
2 changes: 2 additions & 0 deletions man/geom_polypath.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 2 additions & 0 deletions man/layer_spatial.Raster.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 2 additions & 0 deletions man/layer_spatial.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 2 additions & 0 deletions man/layer_spatial.bbox.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit 1c85861

Please sign in to comment.