Custom key added to sf plot fails

2019-08-10 11:17发布

Trying to resolve this question I came up with this:

library(sf)
library(magrittr)
library(RColorBrewer)

nc <- st_read(system.file("shape/nc.shp", package = "sf")) %>% 
    st_transform(crs = 4326)
points <- data.frame(p = seq(15, 75, 15), 
                     long = c(-85, -80, -78, -75, -82), 
                     lat = c(34, 36, 37, 38, 35)) %>% 
        st_as_sf(coords = c('long', 'lat'), crs = 4326) 
points$p_cut <- cut(points$p, seq(0, 100, 20))

layout(matrix(1:2, ncol = 2), widths = c(1, lcm(2)))
# sf object with the extent of the points object
bb_sol <- data.frame(long = c(-85, -75, -75, -85),
                     lat = c(34, 34, 38, 38)) %>% 
        st_as_sf(coords = c('long', 'lat'), crs = 4326)
# plot extent
plot(st_geometry(bb_sol), axes = TRUE, graticule = TRUE, pch = '.')
# plot the multipolygon
plot(st_geometry(nc), axes = TRUE, graticule = TRUE, add = TRUE)
# plot the points
plot(points['p_cut'], axes = TRUE, graticule = TRUE, pch = 16, key.pos = NULL,
     pal = brewer.pal(5, 'Paired'), add = TRUE)
# plot the key
.image_scale_factor(levels(factor(points$p_cut)), col = brewer.pal(5, 'Paired'), 
                    key.length = lcm(8), key.width = lcm(2), key.pos = 4, 
                    at = 1:length(levels(points$p_cut)))

Which should work as it works without the points object:

layout(matrix(1:2, ncol = 2), widths = c(1, lcm(2)))
# sf object with the extent of the points 
bb_sol <- data.frame(long = c(-85, -75, -75, -85),
                         lat = c(34, 34, 38, 38)) %>% 
            st_as_sf(coords = c('long', 'lat'), crs = 4326)
# plot the extent
plot(st_geometry(bb_sol), axes = TRUE, graticule = TRUE, pch = '.')
# plot the multipolygon
plot(st_geometry(nc), axes = TRUE, graticule = TRUE, add = TRUE)
# plot the key
.image_scale_factor(levels(factor(points$p_cut)), col = brewer.pal(5, 'Paired'), 
                        key.length = lcm(8), key.width = lcm(2), key.pos = 4, 
                        at = 1:length(levels(points$p_cut)))

Even if only the points are plot all fails again:

layout(matrix(1:2, ncol = 2), widths = c(1, lcm(2)))
# plot the points
plot(points['p_cut'], axes = TRUE, graticule = TRUE, pch = 16, key.pos = NULL, pal = brewer.pal(5, 'Paired'))
# plot the key
.image_scale_factor(levels(factor(points$p_cut)), col = brewer.pa(5, 'Paired'), key.length = lcm(8), key.width = lcm(2), key.pos = 4, at = 1:length(levels(points$p_cut)))

Which gives the same output as the first image with this error message:

Error in par(opar[-desel]) : el valor especificado del parámetro del gráfico "pin" es inválido

What is happening? Why when plotting the points object and the key it ends in error?

标签: r plot sf
0条回答
登录 后发表回答