Skip to content

Commit 602a772

Browse files
committed
Fix other http:// URLs
1 parent 106bf86 commit 602a772

File tree

11 files changed

+25
-37
lines changed

11 files changed

+25
-37
lines changed

R/data.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -7,7 +7,7 @@
77
#' \code{Long}, and population estimates from 2000 to 2010 (columns
88
#' \code{Pop2000} to \code{Pop2010}).
99
#' @source The US Census Bureau:
10-
#' \url{http://www.census.gov/popest/data/intercensal/cities/cities2010.html}
10+
#' \url{https://www.census.gov/data/datasets/time-series/demo/popest/intercensal-2000-2010-cities-and-towns.html}
1111
#' @noRd
1212
#' @examples
1313
#' str(uspop2000)

R/layers.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -163,7 +163,7 @@ addTiles <- function(
163163
if (missing(urlTemplate) && is.null(options$attribution))
164164
options$attribution <- paste(
165165
"&copy; <a href=\"https://openstreetmap.org\">OpenStreetMap</a>",
166-
"contributors, <a href=\"http://creativecommons.org/licenses/by-sa/2.0/\">CC-BY-SA</a>"
166+
"contributors, <a href=\"https://creativecommons.org/licenses/by-sa/2.0/\">CC-BY-SA</a>"
167167
)
168168
invokeMethod(map, data, "addTiles", urlTemplate, layerId, group,
169169
options)

R/legacy.R

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -93,14 +93,14 @@ createLeafletMap <- function(session, outputId) {
9393
#' @export
9494
leafletMap <- function(
9595
outputId, width, height,
96-
initialTileLayer = "http://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png",
96+
initialTileLayer = "https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png",
9797
initialTileLayerAttribution = NULL,
9898
options = NULL) {
9999

100100
if (missing(initialTileLayer) && is.null(initialTileLayerAttribution))
101101
initialTileLayerAttribution <- paste(
102-
"&copy; <a href=\"http://openstreetmap.org\">OpenStreetMap</a>",
103-
"contributors, <a href=\"http://creativecommons.org/licenses/by-sa/2.0/\">CC-BY-SA</a>"
102+
"&copy; <a href=\"https://openstreetmap.org\">OpenStreetMap</a>",
103+
"contributors, <a href=\"https://creativecommons.org/licenses/by-sa/2.0/\">CC-BY-SA</a>"
104104
)
105105

106106
shiny::addResourcePath("leaflet-legacy", system_file("legacy/www", package = "leaflet"))

R/plugin-providers.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -15,7 +15,7 @@ leafletProviderDependencies <- function() {
1515
#'
1616
#' @param map the map to add the tile layer to
1717
#' @param provider the name of the provider (see
18-
#' \url{http://leaflet-extras.github.io/leaflet-providers/preview/} and
18+
#' \url{https://leaflet-extras.github.io/leaflet-providers/preview/} and
1919
#' \url{https://github.com/leaflet-extras/leaflet-providers})
2020
#' @param layerId the layer id to assign
2121
#' @param group the name of the group the newly created layers should belong to

inst/examples/geojson.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -30,7 +30,7 @@ leaflet() %>% addTiles() %>%
3030

3131
#' <br/><br/>
3232
#' Another examples this time with polygons
33-
url <- "http://www.partners-popdev.org/wp-content/themes/original-child/vendor/Geojson/States/Maharashtra.geojson"
33+
url <- "https://www.partners-popdev.org/wp-content/themes/original-child/vendor/Geojson/States/Maharashtra.geojson"
3434

3535
mhSPDF <- geojsonio::geojson_read(url, what = "sp")
3636

inst/examples/leaflet.R

Lines changed: 4 additions & 10 deletions
Original file line numberDiff line numberDiff line change
@@ -39,13 +39,6 @@ m %>% addMarkers(rnorm(30, 175), rnorm(30, -37), icon = list(
3939
iconUrl = Rlogo, iconSize = c(25, 19)
4040
))
4141

42-
m %>% addMarkers(
43-
c(-71.0382679, -122.1217866), c(42.3489054, 47.6763144), icon = list(
44-
iconUrl = "http://www.rstudio.com/wp-content/uploads/2014/03/blue-125.png"
45-
), popup = c("RStudio @ Boston", "RStudio @ Seattle")
46-
)
47-
48-
4942
# circle (units in metres)
5043
m %>% addCircles(rand_lng(50), rand_lat(50), radius = runif(50, 50, 150))
5144

@@ -130,10 +123,10 @@ m %>% setView(-122.36075812146, 47.6759920119894, zoom = 13) %>% addGeoJSON(seat
130123

131124

132125
# use the Dark Matter layer from CartoDB
133-
leaflet() %>% addTiles("http://{s}.basemaps.cartocdn.com/dark_all/{z}/{x}/{y}.png",
126+
leaflet() %>% addTiles("https://{s}.basemaps.cartocdn.com/dark_all/{z}/{x}/{y}.png",
134127
attribution = paste(
135-
"&copy; <a href=\"http://openstreetmap.org\">OpenStreetMap</a> contributors",
136-
"&copy; <a href=\"http://cartodb.com/attributions\">CartoDB</a>"
128+
"&copy; <a href=\"https://openstreetmap.org\">OpenStreetMap</a> contributors",
129+
"&copy; <a href=\"https://cartodb.com/attributions\">CartoDB</a>"
137130
)
138131
) %>% setView(-122.36, 47.67, zoom = 10)
139132

@@ -159,3 +152,4 @@ m %>% addCircleMarkers(~lng, ~lat, radius = ~size,
159152
color = ~greens(value), fillOpacity = 0.5)
160153

161154
}
155+

inst/examples/proj4Leaflet-PolarProjections.R

Lines changed: 6 additions & 6 deletions
Original file line numberDiff line numberDiff line change
@@ -7,7 +7,7 @@ library(leaflet)
77

88
#' ## Artic Projections
99

10-
#' There is a [polarmap.js](http://webmap.arcticconnect.org/)
10+
#' There is a [polarmap.js](http://webmap.arcticconnect.ca/)
1111
#' leaflet plugin available, but that one is not easy to integrate in to the R package.<br/>
1212
#' But thankfully it does provide Tiles in different projections
1313
#' which can be used with Proj4Leaflet.
@@ -18,9 +18,9 @@ library(leaflet)
1818

1919
#' All these numbers and calculations come from the polarmap.js plugin, specifically from these files
2020
#'
21-
#' - http://webmap.arcticconnect.org/polarmap.js/dist/polarmap-src.js
22-
#' - http://webmap.arcticconnect.org/tiles.html
23-
#' - http://webmap.arcticconnect.org/usage.html
21+
#' - http://webmap.arcticconnect.ca/polarmap.js/dist/polarmap-src.js
22+
#' - http://webmap.arcticconnect.ca/tiles.html
23+
#' - http://webmap.arcticconnect.ca/usage.html
2424
#'
2525
extent <- 11000000 + 9036842.762 + 667
2626
origin <- c(-extent, extent)
@@ -57,7 +57,7 @@ crses <- purrr::map(projections, function(code) {
5757

5858
# Tile URL Template for each projection
5959
tileURLtemplates <- purrr::map(projections, function(code) {
60-
sprintf("http://{s}.tiles.arcticconnect.org/osm_%s/{z}/{x}/{y}.png",
60+
sprintf("https://tiles.arcticconnect.ca/osm_%s/{z}/{x}/{y}.png",
6161
code)
6262
})
6363

@@ -115,7 +115,7 @@ crsAntartica <- leafletCRS(
115115
bounds = list( c(-4194304, -4194304), c(4194304, 4194304) )
116116
)
117117

118-
antarticaTilesURL <- "//map1{s}.vis.earthdata.nasa.gov/wmts-antarctic/MODIS_Aqua_CorrectedReflectance_TrueColor/default/2014-12-01/EPSG3031_250m/{z}/{y}/{x}.jpg"
118+
antarticaTilesURL <- "https://map1{s}.vis.earthdata.nasa.gov/wmts-antarctic/MODIS_Aqua_CorrectedReflectance_TrueColor/default/2014-12-01/EPSG3031_250m/{z}/{y}/{x}.jpg"
119119

120120
leaflet(options = leafletOptions(
121121
crs = crsAntartica, minZoom = zoom, maxZoom = maxZoom, worldCopyJump = FALSE)) %>%

inst/examples/proj4Leaflet.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -29,8 +29,8 @@ leaflet(
2929
)
3030
)) %>%
3131
addTiles(
32-
urlTemplate = "http://api.geosition.com/tile/osm-bright-3006/{z}/{x}/{y}.png",
33-
attribution = "Map data &copy; <a href=\"http://www.openstreetmap.org/copyright\">OpenStreetMap contributors</a>, Imagery &copy; 2013 <a href=\"http://www.kartena.se/\">Kartena</a>",
32+
urlTemplate = "https://api.geosition.com/tile/osm-bright-3006/{z}/{x}/{y}.png",
33+
attribution = "Map data &copy; <a href=\"https://www.openstreetmap.org/copyright\">OpenStreetMap contributors</a>, Imagery &copy; 2013 <a href=\"http://www.kartena.se/\">Kartena</a>",
3434
options = tileOptions(minZoom = 0, maxZoom = 14)) %>%
3535
setView(11.965, 57.704, 13)
3636

man/addProviderTiles.Rd

Lines changed: 1 addition & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/deprecated.Rd

Lines changed: 1 addition & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)