The goal of this notebook page is to create a facet map figure, executing this chunk of code

# tmap_arrange(inStateSolarRZmap, inStateWindRZmap, inStateSolarW2wmap, inStateWindW2wMap, partWestSolarRZmap, partWestWindRZmap, partWestSolarW2wMap, partWestWindW2wMap,fullWestSolarRZmap, fullWestWindRZmap, fullWestSolarW2wMap, fullWestWindW2wMap, ncol = 4)

There is a lot of setup required before we can get that code to work.

First create background map.

setwd("C:/Users/Emily Leslie/Documents/PathTo100/")
getwd()
## [1] "C:/Users/Emily Leslie/Documents/PathTo100"
# install sf package if you haven't already
# install.packages("sf")
# load library
library(sf)
## Linking to GEOS 3.6.1, GDAL 2.2.3, PROJ 4.9.3
# Check working directory to set this up correctly
# Commands  getwd(), my.dir <- getwd(), list.files(my.dir, recursive= TRUE) 
# getwd()
# [1] "C:/Users/Emily Leslie/Documents/earth-analytics/data"

# import data

# To import shapefiles we use the sf library function st_read(). st_read() requires the file path to the shapefile.
ct <- st_read("Data/continent/continent.shp")
## Reading layer `continent' from data source `C:\Users\Emily Leslie\Documents\PathTo100\Data\continent\continent.shp' using driver `ESRI Shapefile'
## Simple feature collection with 8 features and 5 fields
## geometry type:  MULTIPOLYGON
## dimension:      XY
## bbox:           xmin: -16900910 ymin: -6972041 xmax: 16900900 ymax: 15297990
## epsg (SRID):    NA
## proj4string:    +proj=aea +lat_1=29.5 +lat_2=45.5 +lat_0=23 +lon_0=-114 +x_0=0 +y_0=0 +datum=NAD83 +units=m +no_defs
# Reading layer `continent' from data source `C:\Users\Emily Leslie\Documents\earth-analytics\data\continent\continent.shp' using driver `ESRI Shapefile'
# Simple feature collection with 8 features and 5 fields
# geometry type:  MULTIPOLYGON
# dimension:      XY
# bbox:           xmin: -16900910 ymin: -6972041 xmax: 16900900 ymax: 15297990
# epsg (SRID):    NA
# proj4string:    +proj=aea +lat_1=29.5 +lat_2=45.5 +lat_0=23 +lon_0=-114 +x_0=0 +y_0=0 +datum=NAD83 +units=m +no_defs

# install packages and load tmap library if you haven't already 
# install.packages("tmap")
library(tmap)
# Display data
tm_shape(ct) + tm_fill()

# Note the area displayred is too big. 

# Define the area of interest, which can be done by creating a new spatial object, ct_region.
bg_region = st_bbox(c(xmin = -874210.8, xmax = 1051539,
                      ymin = 535177.8, ymax = 2926678),
                    crs = st_crs(ct)) %>% 
  st_as_sfc()

# where did the coordinates for the bounding box come from?  
# we had previously been exploring the "windCF" raster and identified its extent
# get desired spatial extent using bbox()
# load raster library
# library(raster)
# open raster data
# myRas <- raster(x = "week_03/windCF.tif")
# bbox(myRas)
#         min     max
# s1 -874210.8 1051539
# s2  535177.8 2926678

# now that we have created a spatial object representing the extent of the area of interest, we can plot the continent simple feature
ct_map = tm_shape(ct, bbox = bg_region) + tm_fill() 
#set the background color to blue for the ocean
map2 = ct_map + tm_layout(bg.color = "lightblue")


# Add the Western states
# first create a simple feature object "states"
# use st_read function as before
states <- st_read("Data/USAboundaries_aea/USAboundaries_aea.shp")
## Reading layer `USAboundaries_aea' from data source `C:\Users\Emily Leslie\Documents\PathTo100\Data\USAboundaries_aea\USAboundaries_aea.shp' using driver `ESRI Shapefile'
## Simple feature collection with 51 features and 56 fields
## geometry type:  MULTIPOLYGON
## dimension:      XY
## bbox:           xmin: -4703607 ymin: 456533.4 xmax: 3563081 ymax: 5625473
## epsg (SRID):    NA
## proj4string:    +proj=aea +lat_1=29.5 +lat_2=45.5 +lat_0=23 +lon_0=-114 +x_0=0 +y_0=0 +datum=NAD83 +units=m +no_defs
fullWest <- st_read("Data/geogMasks/fullWest.shp")
## Reading layer `fullWest' from data source `C:\Users\Emily Leslie\Documents\PathTo100\Data\geogMasks\fullWest.shp' using driver `ESRI Shapefile'
## Simple feature collection with 11 features and 57 fields
## geometry type:  MULTIPOLYGON
## dimension:      XY
## bbox:           xmin: -872377.6 ymin: 922080.2 xmax: 1052019 ymax: 2926679
## epsg (SRID):    NA
## proj4string:    +proj=aea +lat_1=29.5 +lat_2=45.5 +lat_0=23 +lon_0=-114 +x_0=0 +y_0=0 +datum=NAD83 +units=m +no_defs
# Then add the map object "states" to the map. options are tm_boundary, tm_fill, or others.  
# When using tm_fill(), it will set the fill color to grey by default.
backgroundMap = map2 + tm_shape(states) + tm_fill() + 
  tm_shape(fullWest) + tm_polygons(col = "white")
backgroundMap

Add the raster layers that will be plotted over the background map.

# Use the raster library to import a raster.
library(raster)
## Loading required package: sp
solarRZCat1 <- raster(x = "Data/ResourceAssessment/solarRZ/solarCat1RZ_ras.tif")
solarRZCat2 <- raster(x = "Data/ResourceAssessment/solarRZ/solarCat2RZ_ras.tif")
solarRZCat3 <- raster(x = "Data/ResourceAssessment/solarRZ/solarCat3RZ_ras.tif")
solarRZCat4 <- raster(x = "Data/ResourceAssessment/solarRZ/solarCat4RZ_ras.tif")
solarW2wCat1 <- raster(x = "Data/ResourceAssessment/solarW2W/solarCat1w2wRas.tif")
windRZCat1 <- raster(x = "Data/ResourceAssessment/windRZ/windCat1RZ_ras.tif")
#windSSCat2 <- raster(x = "wind/windCat2CF.tif")
#windSSCat3 <- raster(x = "wind/windCat3CF.tif")
#windSSCat4 <- raster(x = "wind/windCat4CF.tif")
windW2wCat1 <- raster(x = "Data/ResourceAssessment/windW2W/windCat1w2w_ras.tif")


# Install RcolorBrewer package if you haven't already
# Install.packages("RColorBrewer")
# Use interactive viewer to choose color palette: http://colorbrewer2.org/
library(RColorBrewer)

solarCat1RZMap = backgroundMap + tm_shape(solarRZCat1) + tm_raster(palette = "Oranges") +
   tm_layout(title = "Solar Category 1 RESOLVE Zones", legend.position = c("left","bottom")) 
solarCat1RZMap
## Raster object has 41728206 (5798 by 7197) cells, which is larger than 1e+07, the maximum size determined by the option max.raster. Therefore, the raster will be shown at a decreased resolution of 1e+07 cells. Set tmap_options(max.raster = c(plot = 41728206, view = 41728206)) to show the whole raster.

solarCat2RZMap = backgroundMap + tm_shape(solarRZCat2) + tm_raster(palette = "Oranges") +
   tm_layout(title = "Solar Category 2 RESOLVE Zones", legend.position = c("left","bottom")) 
solarCat2RZMap
## Raster object has 41891499 (5811 by 7209) cells, which is larger than 1e+07, the maximum size determined by the option max.raster. Therefore, the raster will be shown at a decreased resolution of 1e+07 cells. Set tmap_options(max.raster = c(plot = 41891499, view = 41891499)) to show the whole raster.

solarCat3RZMap = backgroundMap + tm_shape(solarRZCat3) + tm_raster(palette = "Oranges") +
   tm_layout(title = "Solar Category 3 RESOLVE Zones",legend.position = c("left","bottom")) 
solarCat3RZMap
## Raster object has 41891499 (5811 by 7209) cells, which is larger than 1e+07, the maximum size determined by the option max.raster. Therefore, the raster will be shown at a decreased resolution of 1e+07 cells. Set tmap_options(max.raster = c(plot = 41891499, view = 41891499)) to show the whole raster.

solarCat4RZMap = backgroundMap + tm_shape(solarRZCat4) + tm_raster(palette = "Oranges") +
   tm_layout(title = "Solar Category 4 RESOLVE Zones",legend.position = c("left","bottom"))
solarCat4RZMap
## Raster object has 41891499 (5811 by 7209) cells, which is larger than 1e+07, the maximum size determined by the option max.raster. Therefore, the raster will be shown at a decreased resolution of 1e+07 cells. Set tmap_options(max.raster = c(plot = 41891499, view = 41891499)) to show the whole raster.

solarCat1W2wMap = backgroundMap + tm_shape(solarW2wCat1) + tm_raster(palette = "Oranges") +
   tm_layout(title = "Solar Category 1 Wall to Wall",legend.position = c("left","bottom")) 
solarCat1W2wMap
## Raster object has 115630960 (9652 by 11980) cells, which is larger than 1e+07, the maximum size determined by the option max.raster. Therefore, the raster will be shown at a decreased resolution of 1e+07 cells. Set tmap_options(max.raster = c(plot = 115630960, view = 115630960)) to show the whole raster.

windCat1RZMap = backgroundMap + tm_shape(windRZCat1) + tm_raster(palette = "Blues") +
   tm_layout(title = "Wind Category 1 RESOLVE Zones", legend.position = c("left","bottom")) 
windCat1RZMap
## Raster object has 116095346 (9673 by 12002) cells, which is larger than 1e+07, the maximum size determined by the option max.raster. Therefore, the raster will be shown at a decreased resolution of 1e+07 cells. Set tmap_options(max.raster = c(plot = 116095346, view = 116095346)) to show the whole raster.

windCat1W2wMap = backgroundMap + tm_shape(windW2wCat1) + tm_raster(palette = "Blues") +
   tm_layout(title = "Wind Category 1 Wall to Wall",legend.position = c("left","bottom")) 
windCat1W2wMap
## Raster object has 73686898 (9566 by 7703) cells, which is larger than 1e+07, the maximum size determined by the option max.raster. Therefore, the raster will be shown at a decreased resolution of 1e+07 cells. Set tmap_options(max.raster = c(plot = 73686898, view = 73686898)) to show the whole raster.

# tmap_arrange(solarCat1RZMap, windCat1RZMap, solarCat1W2wMap, windCat1W2wMap)
fullWest <- st_read("Data/geogMasks/fullWest.shp")
## Reading layer `fullWest' from data source `C:\Users\Emily Leslie\Documents\PathTo100\Data\geogMasks\fullWest.shp' using driver `ESRI Shapefile'
## Simple feature collection with 11 features and 57 fields
## geometry type:  MULTIPOLYGON
## dimension:      XY
## bbox:           xmin: -872377.6 ymin: 922080.2 xmax: 1052019 ymax: 2926679
## epsg (SRID):    NA
## proj4string:    +proj=aea +lat_1=29.5 +lat_2=45.5 +lat_0=23 +lon_0=-114 +x_0=0 +y_0=0 +datum=NAD83 +units=m +no_defs
partWestMask <- st_read("Data/geogMasks/partWestMask.shp")
## Reading layer `partWestMask' from data source `C:\Users\Emily Leslie\Documents\PathTo100\Data\geogMasks\partWestMask.shp' using driver `ESRI Shapefile'
## Simple feature collection with 5 features and 57 fields
## geometry type:  POLYGON
## dimension:      XY
## bbox:           xmin: -257148.4 ymin: 1550369 xmax: 1052019 ymax: 2926679
## epsg (SRID):    NA
## proj4string:    +proj=aea +lat_1=29.5 +lat_2=45.5 +lat_0=23 +lon_0=-114 +x_0=0 +y_0=0 +datum=NAD83 +units=m +no_defs
inStateMask <- st_read("Data/geogMasks/inStateMask.shp")
## Reading layer `inStateMask' from data source `C:\Users\Emily Leslie\Documents\PathTo100\Data\geogMasks\inStateMask.shp' using driver `ESRI Shapefile'
## Simple feature collection with 10 features and 57 fields
## geometry type:  MULTIPOLYGON
## dimension:      XY
## bbox:           xmin: -856592.1 ymin: 922080.2 xmax: 1052019 ymax: 2926679
## epsg (SRID):    NA
## proj4string:    +proj=aea +lat_1=29.5 +lat_2=45.5 +lat_0=23 +lon_0=-114 +x_0=0 +y_0=0 +datum=NAD83 +units=m +no_defs
solarCat1RZInStateMap = backgroundMap + tm_shape(solarRZCat1) + tm_raster(palette = "Oranges") +
  tm_shape(inStateMask) + tm_fill() +
  tm_shape(states) +  tm_borders() + 
  tm_layout(title = "Solar RESOLVE Zones In-State", legend.position = c("left","bottom")) 
solarCat1RZInStateMap
## Raster object has 41728206 (5798 by 7197) cells, which is larger than 1e+07, the maximum size determined by the option max.raster. Therefore, the raster will be shown at a decreased resolution of 1e+07 cells. Set tmap_options(max.raster = c(plot = 41728206, view = 41728206)) to show the whole raster.

windCat1RZInStateMap = backgroundMap + tm_shape(windRZCat1) + tm_raster(palette = "Blues") +
  tm_shape(inStateMask) + tm_fill() +
  tm_shape(states) +  tm_borders() + 
  tm_layout(title = "Wind RESOLVE Zones In-State", legend.position = c("left","bottom")) 
windCat1RZInStateMap
## Raster object has 116095346 (9673 by 12002) cells, which is larger than 1e+07, the maximum size determined by the option max.raster. Therefore, the raster will be shown at a decreased resolution of 1e+07 cells. Set tmap_options(max.raster = c(plot = 116095346, view = 116095346)) to show the whole raster.

solarCat1w2wInStateMap = backgroundMap + tm_shape(solarW2wCat1) + tm_raster(palette = "Oranges") +
  tm_shape(inStateMask) + tm_fill() +
  tm_shape(states) +  tm_borders() + 
  tm_layout(title = "Solar Wall-to-Wall In-State", legend.position = c("left","bottom")) 
solarCat1w2wInStateMap 
## Raster object has 115630960 (9652 by 11980) cells, which is larger than 1e+07, the maximum size determined by the option max.raster. Therefore, the raster will be shown at a decreased resolution of 1e+07 cells. Set tmap_options(max.raster = c(plot = 115630960, view = 115630960)) to show the whole raster.

windCat1w2wInStateMap = backgroundMap + tm_shape(windW2wCat1) + tm_raster(palette = "Blues") +
  tm_shape(inStateMask) + tm_fill() +
  tm_shape(states) +  tm_borders() + 
  tm_layout(title = "Wind Wall-to-Wall In-State", legend.position = c("left","bottom")) 
windCat1w2wInStateMap
## Raster object has 73686898 (9566 by 7703) cells, which is larger than 1e+07, the maximum size determined by the option max.raster. Therefore, the raster will be shown at a decreased resolution of 1e+07 cells. Set tmap_options(max.raster = c(plot = 73686898, view = 73686898)) to show the whole raster.

solarCat1RZPartWestMap = backgroundMap + tm_shape(solarRZCat1) + tm_raster(palette = "Oranges") +
    tm_shape(partWestMask) + tm_fill() +
  tm_shape(states) +  tm_borders() +
   tm_layout(title = "Solar RESOLVE Zones Part-West", legend.position = c("left","bottom")) 
solarCat1RZPartWestMap
## Raster object has 41728206 (5798 by 7197) cells, which is larger than 1e+07, the maximum size determined by the option max.raster. Therefore, the raster will be shown at a decreased resolution of 1e+07 cells. Set tmap_options(max.raster = c(plot = 41728206, view = 41728206)) to show the whole raster.

solarCat1w2wPartWestMap = backgroundMap + tm_shape(solarW2wCat1) + tm_raster(palette = "Oranges") +
  tm_shape(partWestMask) + tm_fill() +
  tm_shape(states) +  tm_borders() + 
  tm_layout(title = "Solar Wall-to-Wall Part-West", legend.position = c("left","bottom")) 
solarCat1w2wPartWestMap 
## Raster object has 115630960 (9652 by 11980) cells, which is larger than 1e+07, the maximum size determined by the option max.raster. Therefore, the raster will be shown at a decreased resolution of 1e+07 cells. Set tmap_options(max.raster = c(plot = 115630960, view = 115630960)) to show the whole raster.

windCat1RZPartWestMap = backgroundMap + tm_shape(windRZCat1) + tm_raster(palette = "Blues") +
    tm_shape(partWestMask) + tm_fill() +
  tm_shape(states) +  tm_borders() +
   tm_layout(title = "Wind RESOLVE Zones Part-West", legend.position = c("left","bottom")) 
windCat1RZPartWestMap
## Raster object has 116095346 (9673 by 12002) cells, which is larger than 1e+07, the maximum size determined by the option max.raster. Therefore, the raster will be shown at a decreased resolution of 1e+07 cells. Set tmap_options(max.raster = c(plot = 116095346, view = 116095346)) to show the whole raster.

windCat1w2wPartWestMap = backgroundMap + tm_shape(windW2wCat1) + tm_raster(palette = "Blues") +
  tm_shape(partWestMask) + tm_fill() +
  tm_shape(states) +  tm_borders() + 
  tm_layout(title = "Wind Wall-to-Wall Part-West", legend.position = c("left","bottom")) 
windCat1w2wPartWestMap
## Raster object has 73686898 (9566 by 7703) cells, which is larger than 1e+07, the maximum size determined by the option max.raster. Therefore, the raster will be shown at a decreased resolution of 1e+07 cells. Set tmap_options(max.raster = c(plot = 73686898, view = 73686898)) to show the whole raster.

solarCat1RZFullWestMap = backgroundMap + tm_shape(solarRZCat1) + tm_raster(palette = "Oranges") +
   tm_layout(title = "Solar RESOLVE Zones Full-West", legend.position = c("left","bottom")) 
solarCat1RZFullWestMap
## Raster object has 41728206 (5798 by 7197) cells, which is larger than 1e+07, the maximum size determined by the option max.raster. Therefore, the raster will be shown at a decreased resolution of 1e+07 cells. Set tmap_options(max.raster = c(plot = 41728206, view = 41728206)) to show the whole raster.

windCat1RZFullWestMap = backgroundMap + tm_shape(windRZCat1) + tm_raster(palette = "Blues") +
   tm_layout(title = "Wind RESOLVE Zones Full-West", legend.position = c("left","bottom")) 
windCat1RZFullWestMap
## Raster object has 116095346 (9673 by 12002) cells, which is larger than 1e+07, the maximum size determined by the option max.raster. Therefore, the raster will be shown at a decreased resolution of 1e+07 cells. Set tmap_options(max.raster = c(plot = 116095346, view = 116095346)) to show the whole raster.

solarCat1w2wFullWestMap = backgroundMap + tm_shape(solarW2wCat1) + tm_raster(palette = "Oranges") +
  tm_shape(states) +  tm_borders() + 
  tm_layout(title = "Solar Wall-to-Wall Full-West", legend.position = c("left","bottom")) 
solarCat1w2wFullWestMap
## Raster object has 115630960 (9652 by 11980) cells, which is larger than 1e+07, the maximum size determined by the option max.raster. Therefore, the raster will be shown at a decreased resolution of 1e+07 cells. Set tmap_options(max.raster = c(plot = 115630960, view = 115630960)) to show the whole raster.

windCat1w2wFullWestMap = backgroundMap + tm_shape(windW2wCat1) + tm_raster(palette = "Blues") +
  tm_shape(states) +  tm_borders() + 
  tm_layout(title = "Wind Wall-to-Wall Full-West", legend.position = c("left","bottom")) 
windCat1w2wFullWestMap
## Raster object has 73686898 (9566 by 7703) cells, which is larger than 1e+07, the maximum size determined by the option max.raster. Therefore, the raster will be shown at a decreased resolution of 1e+07 cells. Set tmap_options(max.raster = c(plot = 73686898, view = 73686898)) to show the whole raster.

# tmap_arrange(solarCat1Map, solarCat2Map, solarCat3Map, solarCat4Map)

#tmap_arrange(solarCat1RZMap, windCat1RZMap, solarCat1W2wMap, windCat1W2wMap,ncol = 4)

#tmap_arrange(solarCat1RZInStateMap, windCat1RZInStateMap, solarCat1w2wInStateMap, windCat1w2wInStateMap, 
#             solarCat1RZPartWestMap, windCat1RZPartWestMap, solarCat1w2wPartWestMap, windCat1w2wPartWestMap, ncol = 4)


tmap_arrange(solarCat1RZInStateMap, windCat1RZInStateMap, solarCat1w2wInStateMap, windCat1w2wInStateMap, 
             solarCat1RZPartWestMap, windCat1RZPartWestMap, solarCat1w2wPartWestMap, windCat1w2wPartWestMap, 
             solarCat1RZFullWestMap, windCat1RZFullWestMap, solarCat1w2wFullWestMap, windCat1w2wFullWestMap, ncol = 4)
## Raster object has 41728206 (5798 by 7197) cells, which is larger than 1e+07, the maximum size determined by the option max.raster. Therefore, the raster will be shown at a decreased resolution of 1e+07 cells. Set tmap_options(max.raster = c(plot = 41728206, view = 41728206)) to show the whole raster.
## Legend labels were too wide. The labels have been resized to 0.42, 0.42, 0.42, 0.42, 0.42, 0.42, 0.42, 0.42. Increase legend.width (argument of tm_layout) to make the legend wider and therefore the labels larger.
## Raster object has 116095346 (9673 by 12002) cells, which is larger than 1e+07, the maximum size determined by the option max.raster. Therefore, the raster will be shown at a decreased resolution of 1e+07 cells. Set tmap_options(max.raster = c(plot = 116095346, view = 116095346)) to show the whole raster.
## Legend labels were too wide. The labels have been resized to 0.52, 0.52, 0.52, 0.52, 0.52, 0.52. Increase legend.width (argument of tm_layout) to make the legend wider and therefore the labels larger.
## Raster object has 115630960 (9652 by 11980) cells, which is larger than 1e+07, the maximum size determined by the option max.raster. Therefore, the raster will be shown at a decreased resolution of 1e+07 cells. Set tmap_options(max.raster = c(plot = 115630960, view = 115630960)) to show the whole raster.
## Legend labels were too wide. The labels have been resized to 0.42, 0.42, 0.42, 0.42. Increase legend.width (argument of tm_layout) to make the legend wider and therefore the labels larger.
## Raster object has 73686898 (9566 by 7703) cells, which is larger than 1e+07, the maximum size determined by the option max.raster. Therefore, the raster will be shown at a decreased resolution of 1e+07 cells. Set tmap_options(max.raster = c(plot = 73686898, view = 73686898)) to show the whole raster.
## Legend labels were too wide. The labels have been resized to 0.52, 0.52, 0.52, 0.52, 0.52, 0.52, 0.52. Increase legend.width (argument of tm_layout) to make the legend wider and therefore the labels larger.
## Raster object has 41728206 (5798 by 7197) cells, which is larger than 1e+07, the maximum size determined by the option max.raster. Therefore, the raster will be shown at a decreased resolution of 1e+07 cells. Set tmap_options(max.raster = c(plot = 41728206, view = 41728206)) to show the whole raster.
## Legend labels were too wide. The labels have been resized to 0.42, 0.42, 0.42, 0.42, 0.42, 0.42, 0.42, 0.42. Increase legend.width (argument of tm_layout) to make the legend wider and therefore the labels larger.
## Raster object has 116095346 (9673 by 12002) cells, which is larger than 1e+07, the maximum size determined by the option max.raster. Therefore, the raster will be shown at a decreased resolution of 1e+07 cells. Set tmap_options(max.raster = c(plot = 116095346, view = 116095346)) to show the whole raster.
## Legend labels were too wide. The labels have been resized to 0.52, 0.52, 0.52, 0.52, 0.52, 0.52. Increase legend.width (argument of tm_layout) to make the legend wider and therefore the labels larger.
## Raster object has 115630960 (9652 by 11980) cells, which is larger than 1e+07, the maximum size determined by the option max.raster. Therefore, the raster will be shown at a decreased resolution of 1e+07 cells. Set tmap_options(max.raster = c(plot = 115630960, view = 115630960)) to show the whole raster.
## Legend labels were too wide. The labels have been resized to 0.42, 0.42, 0.42, 0.42. Increase legend.width (argument of tm_layout) to make the legend wider and therefore the labels larger.
## Raster object has 73686898 (9566 by 7703) cells, which is larger than 1e+07, the maximum size determined by the option max.raster. Therefore, the raster will be shown at a decreased resolution of 1e+07 cells. Set tmap_options(max.raster = c(plot = 73686898, view = 73686898)) to show the whole raster.
## Legend labels were too wide. The labels have been resized to 0.52, 0.52, 0.52, 0.52, 0.52, 0.52, 0.52. Increase legend.width (argument of tm_layout) to make the legend wider and therefore the labels larger.
## Raster object has 41728206 (5798 by 7197) cells, which is larger than 1e+07, the maximum size determined by the option max.raster. Therefore, the raster will be shown at a decreased resolution of 1e+07 cells. Set tmap_options(max.raster = c(plot = 41728206, view = 41728206)) to show the whole raster.
## Legend labels were too wide. The labels have been resized to 0.42, 0.42, 0.42, 0.42, 0.42, 0.42, 0.42, 0.42. Increase legend.width (argument of tm_layout) to make the legend wider and therefore the labels larger.
## Raster object has 116095346 (9673 by 12002) cells, which is larger than 1e+07, the maximum size determined by the option max.raster. Therefore, the raster will be shown at a decreased resolution of 1e+07 cells. Set tmap_options(max.raster = c(plot = 116095346, view = 116095346)) to show the whole raster.
## Legend labels were too wide. The labels have been resized to 0.52, 0.52, 0.52, 0.52, 0.52, 0.52. Increase legend.width (argument of tm_layout) to make the legend wider and therefore the labels larger.
## Raster object has 115630960 (9652 by 11980) cells, which is larger than 1e+07, the maximum size determined by the option max.raster. Therefore, the raster will be shown at a decreased resolution of 1e+07 cells. Set tmap_options(max.raster = c(plot = 115630960, view = 115630960)) to show the whole raster.
## Legend labels were too wide. The labels have been resized to 0.42, 0.42, 0.42, 0.42. Increase legend.width (argument of tm_layout) to make the legend wider and therefore the labels larger.
## Raster object has 73686898 (9566 by 7703) cells, which is larger than 1e+07, the maximum size determined by the option max.raster. Therefore, the raster will be shown at a decreased resolution of 1e+07 cells. Set tmap_options(max.raster = c(plot = 73686898, view = 73686898)) to show the whole raster.
## Legend labels were too wide. The labels have been resized to 0.52, 0.52, 0.52, 0.52, 0.52, 0.52, 0.52. Increase legend.width (argument of tm_layout) to make the legend wider and therefore the labels larger.