Skip to content

Commit c9ce195

Browse files
committed
remove all library(leaflet) in .Rd
1 parent 9576363 commit c9ce195

15 files changed

+2
-31
lines changed

R/data.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -9,7 +9,7 @@
99
#' @source The US Census Bureau:
1010
#' \url{http://www.census.gov/popest/data/intercensal/cities/cities2010.html}
1111
#' @noRd
12-
#' @examples library(leaflet)
12+
#' @examples
1313
#' str(uspop2000)
1414
#' p = uspop2000$Pop2010
1515
#' p = (p - min(p))/(max(p) - min(p))

R/methods.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -11,7 +11,7 @@
1111
#' @return The modified map widget.
1212
#' @describeIn map-methods Set the view of the map (center and zoom level)
1313
#' @export
14-
#' @examples library(leaflet)
14+
#' @examples
1515
#' m <- leaflet() %>% addTiles() %>% setView(-71.0382679, 42.3489054, zoom = 18)
1616
#' m # the RStudio 'headquarter'
1717
#' m %>% fitBounds(-72, 40, -70, 43)

R/plugin-easybutton.R

Lines changed: 0 additions & 4 deletions
Original file line numberDiff line numberDiff line change
@@ -75,8 +75,6 @@ easyButton <- function(
7575
#' @param map a map widget object
7676
#' @param button the button object created with \code{\link{easyButton}}
7777
#' @examples
78-
#' library(leaflet)
79-
#'
8078
#' leaf <- leaflet() %>%
8179
#' addTiles() %>%
8280
#' addEasyButton(easyButton(
@@ -128,8 +126,6 @@ addEasyButton <- function(
128126
#' @param ... a list of buttons created with \code{\link{easyButton}}
129127
#' @seealso \code{\link{addEasyButton}}
130128
#' @examples
131-
#' library(leaflet)
132-
#'
133129
#' leaf <- leaflet() %>%
134130
#' addTiles() %>%
135131
#' addEasyButtonBar(

R/plugin-graticule.R

Lines changed: 0 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -20,8 +20,6 @@ leafletGraticuleDependencies <- function() {
2020
#' @param group the name of the group this layer belongs to.
2121
#' @param options the path options for the graticule layer
2222
#' @examples
23-
#' library(leaflet)
24-
#'
2523
#' leaf <- leaflet() %>%
2624
#' addTiles() %>%
2725
#' addGraticule()

R/plugin-measure.R

Lines changed: 0 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -42,8 +42,6 @@ leafletMeasureDependencies <- function() {
4242
#'
4343
#' @return modified map
4444
#' @examples
45-
#' library(leaflet)
46-
#'
4745
#' leaf <- leaflet() %>%
4846
#' addTiles() %>%
4947
#' # central park

R/plugin-minimap.R

Lines changed: 0 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -55,8 +55,6 @@ leafletMiniMapDependencies <- function() {
5555
#' @param mapOptions Sets Leaflet options for the MiniMap map.
5656
#' It does not override the MiniMap default map options but extends them.
5757
#' @examples
58-
#' library(leaflet)
59-
#'
6058
#' leaf <- leaflet() %>%
6159
#' addTiles() %>%
6260
#' addMiniMap()

R/plugin-simplegraticule.R

Lines changed: 0 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -23,8 +23,6 @@ leafletSimpleGraticuleDependencies <- function() {
2323
#' @param layerId the layer id
2424
#' @param group the name of the group this layer belongs to.
2525
#' @examples
26-
#' library(leaflet)
27-
#'
2826
#' leaflet() %>%
2927
#' addTiles() %>%
3028
#' addSimpleGraticule()

R/plugin-terminator.R

Lines changed: 0 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -22,8 +22,6 @@ leafletTerminatorDependencies <- function() {
2222
#' @param group the name of the group this layer belongs to.
2323
#' @param options the path options for the daynight layer
2424
#' @examples
25-
#' library(leaflet)
26-
#'
2725
#' leaf <- leaflet() %>%
2826
#' addTiles() %>%
2927
#' addTerminator()

man/addGraticule.Rd

Lines changed: 0 additions & 2 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/addMeasure.Rd

Lines changed: 0 additions & 2 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)