#tmap code ##Constant visual values
library(tmap)
tm_shape(World)+
tm_polygons(
fill = "#ffce00", # fill color
col = "black", # line color
lwd = 0.2, # line width
lty = "dashed") # line type
## [tip] Consider a suitable map projection, e.g. by adding `+ tm_crs("auto")`.
## This message is displayed once per session.
##
tm_shape(World)+
tm_polygons(fill = "grey90") + # constant fill color
tm_symbols(size = "pop_est", # data variable, mapped to symbol size
fill = "well_being", # data variable, mapped to symbol fill color
shape = "income_grp") # data variable, mapped to symbol shape
ttmp()
## ℹ tmap mode set to "view".
## ℹ switch back to "plot" mode with `tmap::ttm()`
tm_shape(metro) +
tm_bubbles(size = "pop2020") +
tm_basemap("OpenTopoMap")
tm_shape(metro) +
tm_bubbles(size = "pop2020") +
tm_basemap("Esri.OceanBasemap")
tm_shape(metro) +
tm_bubbles(size = "pop2020") +
tm_basemap("Stamen.TonerLite")
tm_shape(World) +
tm_polygons(
fill = "economy",
fill.chart = tm_chart_bar())
## charts not implemented in view mode
ttmp()
## ℹ tmap mode set to "plot".
## ℹ switch back to "view" mode with `tmap::ttm()`
tm_shape(World,
bbox = "FULL",
crs = "+proj=ortho +lat_0=30 +lon_0=0") +
tm_polygons() +
tm_xlab("Longitudes") +
tm_ylab("Latitudes")
` ``{r} tm_shape(World, bbox = “FULL”, crs = “+proj=ortho +lat_0=30 +lon_0=0”) + tm_polygons() + tm_xlab(“Longitudes”) + tm_ylab(“Latitudes”)+ tm_graticules(n.x = 20, n.y = 10, col = “black”, lwd = 2, labels.show = FALSE)
``` r
tm_shape(World,
bbox = "FULL",
crs = "+proj=ortho +lat_0=30 +lon_0=0") +
tm_polygons() +
tm_xlab("Longitudes") +
tm_ylab("Latitudes")+
tm_graticules(n.x = 20, n.y = 10, col = "black", lwd = 2, labels.show = FALSE)
tm_shape(World,
bbox = "FULL",
crs = "+proj=ortho +lat_0=30 +lon_0=0") +
tm_polygons() +
tm_xlab("Longitudes") +
tm_ylab("Latitudes")+
tm_graticules(n.x = 20, n.y = 10, col = "black", lwd = 2, labels.show = FALSE)
``` r
tm_shape(World,
bbox = "FULL",
crs = "+proj=ortho +lat_0=30 +lon_0=0") +
tm_polygons() +
tm_xlab("Longitudes") +
tm_ylab("Latitudes")+
tm_graticules(n.x = 20, n.y = 10, col = "black", lwd = 2, labels.show = FALSE)+
tm_style("natural")