An R package of spatial map layers for British Columbia.
Provides access to various spatial layers of British Columbia, such
as administrative boundaries, natural resource management boundaries,
watercourses etc. All layers are available in the BC
Albers projection, which is the B.C. Government standard as
sf
or Spatial
objects.
Most layers are assessed directly from the B.C. Data Catalogue using the bcdata R package. See each layers individual help file for more detail.
You can install bcmaps
from CRAN:
install.packages("bcmaps")
To install the development version of the bcmaps
package, you need to install the remotes
package then the
bcmaps
package.
install.packages("remotes")
::install_github("bcgov/bcmaps") remotes
To see the layers that are available, run the
available_layers()
function:
library(bcmaps)
available_layers()
Most layers are accessible by a shortcut function by the same name as
the object. Then you can use the data as you would any sf
or Spatial
object. The first time you run try to access a
layer, you will be prompted for permission to download that layer to
your hard drive. Subsequently that layer is available locally for easy
future access. For example:
library(sf)
<- bc_bound()
bc plot(st_geometry(bc))
By default, all layers are returned as sf
spatial
objects:
library(bcmaps)
library(sf)
# Load and plot the boundaries of B.C.
<- bc_bound()
bc plot(st_geometry(bc))
## Next load the Regional Districts data, then extract and plot the Kootenays
<- regional_districts()
rd <- rd[rd$ADMIN_AREA_NAME == "Regional District of Central Kootenay", ]
kootenays plot(st_geometry(kootenays), col = "lightseagreen", add = TRUE)
The cded_raster
and cded_stars
functions
return the 1:250,000 digital elevation model for British Columbia
bounded by some area of interest. Here we are retrieving the area
bounded by the Logan Lake census subdivision:
library(raster)
<- census_subdivision()[census_subdivision()$CENSUS_SUBDIVISION_NAME == "Logan Lake", ]
aoi <- cded_raster(aoi)
aoi_raster plot(aoi_raster)
A handy layer for creating maps for display is the
bc_neighbours
layer, accessible with the function by the
same name. This example also illustrates using the popular ggplot2 package to plot maps
in R using geom_sf
:
library(ggplot2)
ggplot() +
geom_sf(data = bc_neighbours(), mapping = aes(fill = name)) +
geom_sf(data = bc_cities()) +
coord_sf(datum = NA) +
scale_fill_viridis_d(name = "Jurisdiction") +
theme_minimal()
As of version 0.15.0 the B.C. BEC (Biogeoclimatic Ecosystem
Classification) map is available via the bec()
function,
and an accompanying function bec_colours()
function to
colour it:
<- bec()
bec library(ggplot2)
<- bec[bec$ZONE %in% c("BG", "PP"),]
bec_sub ggplot() +
geom_sf(data = bec_sub,
aes(fill = ZONE, col = ZONE)) +
scale_fill_manual(values = bec_colors()) +
scale_colour_manual(values = bec_colours())
If you aren’t using the sf
package and prefer the old
standard sp
way of
doing things, set class = "sp"
in either
get_layer
or the shortcut functions:
library("sp")
# Load watercourse data and plot with boundaries of B.C.
plot(bc_bound(class = "sp"))
plot(watercourses_15M(class = "sp"), add = TRUE)
When you first call a layer function bcmaps will remind you when that
layer was last updated in your cache with a message. For a number of
reasons, it might be necessary to get a fresh layer in your bcmaps
cache. The easiest way to update is to use the force
argument:
<- ecoprovinces(force = TRUE) ep
Another option is to actively manage your cache by deleting the old layer and calling the function again:
delete_cache('ecoprovinces')
<- ecoprovinces(force = TRUE) ep
After installing the package you can view vignettes by typing
browseVignettes("bcmaps")
in your R session.
The package also contains a couple of handy utility functions:
fix_geo_problems()
for fixing invalid topologies in
sf
or Spatial
objects such as orphaned holes
and self-intersectionstransform_bc_albers()
for transforming any
sf
or Spatial
object to BC Albers projection.self_union()
Union a SpatialPolygons*
object with itself to remove overlaps, while retaining attributesTo report bugs/issues/feature requests, please file an issue.
Pull requests of new B.C. layers are welcome. If you would like to contribute to the package, please see our CONTRIBUTING guidelines.
Please note that this project is released with a Contributor Code of Conduct. By participating in this project you agree to abide by its terms.
The source datasets used in this package come from various sources
under open licences, including DataBC (Open
Government Licence - British Columbia) and Statistics Canada (Statistics Canada
Open Licence Agreement). See the data-raw
folder for
details on each source dataset.
# Copyright 2017 Province of British Columbia
#
# Licensed under the Apache License, Version 2.0 (the "License");
# you may not use this file except in compliance with the License.
# You may obtain a copy of the License at
#
# http://www.apache.org/licenses/LICENSE-2.0
#
# Unless required by applicable law or agreed to in writing, software distributed under the License is distributed on an "AS IS" BASIS,
# WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
# See the License for the specific language governing permissions and limitations under the License.
This repository is maintained by Environmental Reporting BC. Click here for a complete list of our repositories on GitHub.