1 Introducción

Este cuaderno elaborado en R muestra de manera práctica cómo obtener datos sobre las propiedades del suelo —a distintas profundidades— desde la plataforma SoilGrids, desarrollada por el International Soil Reference and Information Centre (ISRIC). Estos datos se encuentran en formato raster con una resolución espacial de 250 metros, lo que permite representar de forma continua las características del suelo a escala global.

Una de las principales ventajas de realizar esta descarga mediante R es la automatización y reproducibilidad del proceso. A diferencia del método manual a través de un navegador web, el uso de R permite:

Definir con precisión el área de interés (por ejemplo, un departamento o municipio).

Descargar únicamente las capas y variables requeridas, evitando archivos innecesarios.

Integrar los datos directamente en flujos de trabajo analíticos, sin pasos intermedios.

Repetir el procedimiento fácilmente para diferentes regiones o variables, garantizando consistencia entre análisis.

En el cuaderno de referencia del profesor Iván Lizarazo (2025), se describen tres alternativas principales para acceder a los datos de SoilGrids:

Web Mapping Service (WMS): orientado a la visualización rápida de mapas en línea.

Web Coverage Service (WCS): diseñado para descargar subconjuntos específicos de mapas y usarlos en modelos o análisis espaciales.

WebDAV: la opción más flexible para obtener archivos completos en formato VRT o GeoTIFF, ideal para procesamiento local en R.

En este documento se utiliza la opción WebDAV, por ser la más adecuada para descargar y procesar grandes volúmenes de información de manera programática y eficiente dentro del entorno de RStudio.

2 Configuración

En primer lugar vamos a limpiar nuestro espacio de trabajo.

rm(list=ls())

SoilGrids puede accederse desde R a través de los siguientes servicios proporcionados por el Centro Internacional de Referencia e Información de Suelos (ISRIC) [https://www.isric.org/explore/soilgrids]:

Web Mapping Service (WMS): permite el acceso para la visualización y exploración general de los mapas.

Web Coverage Service (WCS): es la mejor opción para obtener un subconjunto de un mapa y utilizar los datos de SoilGrids como entrada en otros modelos o análisis.

Web Distributed Authoring and Versioning (WebDAV): posibilita descargar los mapas globales completos en formato VRT para su uso local.

En este cuaderno utilizaremos el servicio WebDAV, por ser el más adecuado para descargar y procesar los datos directamente desde R. En caso de cualquier duda, se recomienda consultar la documentación oficial sobre el acceso a SoilGrids WebDAV desde R.

Luego instalamos las librerías desde la consola, no desde el cuaderno.

##it is assummed that you already installed terra, ggplot2, tidyerra, sf, and leaflet
##paquetes= c('XML','rgdal', 'dplyr','devtools', 'stars', 'mapview', 'RColorBrewer')
##install.packages(paquetes)
## in addition, use either 1 or 2 options below
##option1## 
#devtools::install_github("JoshOBrien/gdalUtilities")
##option2## 
#devtools::install_github('gearslaboratory/gdalUtils')
#The utilite from 

Vamos a llamar las librerías.

library(terra)
## Warning: package 'terra' was built under R version 4.5.2
## terra 1.8.80
library(ggplot2)
## Warning: package 'ggplot2' was built under R version 4.5.2
library(tidyterra)
## Warning: package 'tidyterra' was built under R version 4.5.2
## 
## Adjuntando el paquete: 'tidyterra'
## The following object is masked from 'package:stats':
## 
##     filter
library(sf)
## Warning: package 'sf' was built under R version 4.5.2
## Linking to GEOS 3.13.1, GDAL 3.11.4, PROJ 9.7.0; sf_use_s2() is TRUE
library(leaflet)
## Warning: package 'leaflet' was built under R version 4.5.2
library(RColorBrewer)
## Warning: package 'RColorBrewer' was built under R version 4.5.2
library(gdalUtilities)
## 
## Adjuntando el paquete: 'gdalUtilities'
## The following object is masked from 'package:sf':
## 
##     gdal_rasterize
library(XML)
## Warning: package 'XML' was built under R version 4.5.2
library(dplyr)
## 
## Adjuntando el paquete: 'dplyr'
## The following objects are masked from 'package:terra':
## 
##     intersect, union
## The following objects are masked from 'package:stats':
## 
##     filter, lag
## The following objects are masked from 'package:base':
## 
##     intersect, setdiff, setequal, union

2.1 ¿Qué es SoilGrids?

SoilGrids es una plataforma global de modelamiento digital de suelos desarrollada por el ISRIC – World Soil Information, que utiliza técnicas de aprendizaje automático (machine learning) para predecir propiedades y clases del suelo a diferentes profundidades. Su objetivo principal es ofrecer una base de datos mundial, estandarizada y accesible, que permita conocer la distribución espacial de variables edáficas como el carbono orgánico, la textura, el pH o la densidad aparente, entre otras.

El sistema se fundamenta en un conjunto de covariables globales (como topografía, clima, uso del suelo, vegetación y geología) y miles de perfiles de suelo provenientes de observaciones de campo, que son integrados mediante modelos predictivos ajustados a escala planetaria. De esta forma, cada celda del mapa representa un valor estimado del suelo en una resolución espacial de 250 metros, permitiendo visualizar patrones y tendencias a gran escala.

Es importante resaltar que, aunque SoilGrids ofrece información muy útil para estudios regionales y globales, los mapas nacionales suelen ser más detallados y precisos dentro de sus áreas de cobertura. En el caso de Colombia, el Instituto Geográfico Agustín Codazzi (IGAC) es la entidad encargada de generar cartografía de suelos con mayor resolución y validación local, por lo que se recomienda comparar los resultados de SoilGrids con los mapas del IGAC al realizar análisis de carácter local o aplicado.

Por último, SoilGrids permite trabajar tanto con el valor medio (mean) como con la mediana (0.5 quantile) de cada propiedad del suelo. El valor medio representa la predicción esperada, ofreciendo una estimación imparcial, mientras que la mediana tiende a ser más robusta ante valores atípicos y puede ser útil en estudios comparativos o regionales. Set variables of interest:

Primero, definimos la URL correspondiente al sitio webDAV del ISRIC, Es decir, la ruta de acceso a los datos de SoilGrids disponibles en línea.

url = "https://files.isric.org/soilgrids/latest/data/" 

2.2 Definir variables de interés

Luego, creamos algunos objetos que indican qué información necesitamos obtener del ISRIC:

— cadenas básicas — carbono orgánico del suelo

voi = "soc" # soil organic carbon 
depth = "15-30cm"
quantile = "mean"

Concatenamos las cadenas de texto.

(variable = paste(url, voi, sep=""))
## [1] "https://files.isric.org/soilgrids/latest/data/soc"

Ahora definimos la propiedad del suelo que deseamos descargar —es decir, la capa de interés—.

(layer = paste(variable,depth,quantile, sep="_"))
## [1] "https://files.isric.org/soilgrids/latest/data/soc_15-30cm_mean"

Con esto, la especificación del archivo VRT queda completa.

(vrt_layer = paste(layer, '.vrt', sep=""))
## [1] "https://files.isric.org/soilgrids/latest/data/soc_15-30cm_mean.vrt"

3 Descargar variable de interés

Vamos a leer un geopackage de Colombia y después seleccionamos nuestro departamento de interés.

Cambia la ruta y el nombre del archivo para que coincidan con los datos que estás utilizando.

(stder = st_read("ValleDelCaucaDANE.gpkg"))
## Multiple layers are present in data source C:\Users\Yoly\OneDrive\Desktop\RstudioProyecto\ValleDelCaucaDANE.gpkg, reading layer `mgn_anm_mpios'.
## Use `st_layers' to list all layer names and their type in a data source.
## Set the `layer' argument in `st_read' to read a particular layer.
## Warning in CPL_read_ogr(dsn, layer, query, as.character(options), quiet, :
## automatically selected the first layer in a data source containing more than
## one.
## Reading layer `mgn_anm_mpios' from data source 
##   `C:\Users\Yoly\OneDrive\Desktop\RstudioProyecto\ValleDelCaucaDANE.gpkg' 
##   using driver `GPKG'
## Simple feature collection with 42 features and 6 fields
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -77.54977 ymin: 3.091239 xmax: -75.70724 ymax: 5.047394
## Geodetic CRS:  MAGNA-SIRGAS
## Simple feature collection with 42 features and 6 fields
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -77.54977 ymin: 3.091239 xmax: -75.70724 ymax: 5.047394
## Geodetic CRS:  MAGNA-SIRGAS
## First 10 features:
##    DPTO_CCDGO MPIO_CCDGO          MPIO_CNMBR MPIO_CDPMP VERSION STCTNENCUE
## 1          76        001                CALI      76001    2018     749642
## 2          76        036           ANDALUCÍA      76036    2018       9439
## 3          76        041        ANSERMANUEVO      76041    2018      10533
## 4          76        054             ARGELIA      76054    2018       2900
## 5          76        111 GUADALAJARA DE BUGA      76111    2018      48459
## 6          76        113        BUGALAGRANDE      76113    2018      10610
## 7          76        122          CAICEDONIA      76122    2018      11841
## 8          76        126              CALIMA      76126    2018      11549
## 9          76        130          CANDELARIA      76130    2018      30849
## 10         76        147             CARTAGO      76147    2018      50848
##                              geom
## 1  MULTIPOLYGON (((-76.59175 3...
## 2  MULTIPOLYGON (((-76.22406 4...
## 3  MULTIPOLYGON (((-76.01558 4...
## 4  MULTIPOLYGON (((-76.14316 4...
## 5  MULTIPOLYGON (((-76.31608 3...
## 6  MULTIPOLYGON (((-76.15131 4...
## 7  MULTIPOLYGON (((-75.8539 4....
## 8  MULTIPOLYGON (((-76.51747 4...
## 9  MULTIPOLYGON (((-76.30455 3...
## 10 MULTIPOLYGON (((-75.94518 4...

Observa el CRS (sistema de referencia de coordenadas) del objeto stder.

Dado que las capas del ISRIC utilizan la proyección Homolosine, es necesario reproyectar nuestra capa empleando la librería sf

igh='+proj=igh +lat_0=0 +lon_0=0 +datum=WGS84 +units=m +no_defs'
stder_igh <- st_transform(stder, igh)

Obtengamos ahora el cuadro delimitador (bounding box) de nuestra área de interés

(bbox <- st_bbox(stder_igh))
##       xmin       ymin       xmax       ymax 
## -8636772.5   344115.1 -8436619.1   561873.3

ul significa upper left (esquina superior izquierda) lr significa lower right (esquina inferior derecha)

ulx = bbox$xmin
uly = bbox$ymax
lrx= bbox$xmax
lry = bbox$ymin
(bb <- c(ulx, uly, lrx, lry))
##       xmin       ymax       xmax       ymin 
## -8636772.5   561873.3 -8436619.1   344115.1

Ahora podemos usar la función gdal_translate para descargar la capa en formato VRT. Primero, definamos la ubicación donde se guardarán los datos.

sg_url="/vsicurl/https://files.isric.org/soilgrids/latest/data/"
datos = 'soc/soc_15-30cm_mean.vrt'
file = "soc_igh_15_30.tif"

#Lo siguiente va sin comentarlo la primera vez que se use, luego comentarlo de vuelta

library(gdalUtilities)
gdal_translate(paste0(sg_url,datos), file ,
               tr=c(250,250),
              projwin=bb,
              projwin_srs =igh)

Se divide por 10 porque las unidades estaban en la tabla.

(stder_soc <- terra::rast(file)/10)
## class       : SpatRaster 
## size        : 872, 802, 1  (nrow, ncol, nlyr)
## resolution  : 250, 250  (x, y)
## extent      : -8637000, -8436500, 344000, 562000  (xmin, xmax, ymin, ymax)
## coord. ref. : Interrupted_Goode_Homolosine 
## source(s)   : memory
## varname     : soc_igh_15_30 
## name        : soc_igh_15_30 
## min value   :          13.2 
## max value   :         313.4

4 Exploración de datos

Enseguida vamos a tener un histograma para ver la distribución de los datos.

terra::hist(stder_soc)

Un resumen es muy util:

summary(stder_soc)
## Warning: [summary] used a sample
##  soc_igh_15_30   
##  Min.   : 13.30  
##  1st Qu.: 36.20  
##  Median : 62.40  
##  Mean   : 93.94  
##  3rd Qu.:164.10  
##  Max.   :306.10  
##  NA's   :10946

Vamos a cambiar el nombre del atributo SOC:

(names(stder_soc) <-  "soc")
## [1] "soc"

5 Visualización del mapa

Es momento de plotear

Ponemos los valores de SOC en una variable:

valores <- values(stder_soc, na.rm=TRUE)

Creamos una paleta de color:

orangecyan <- colorNumeric(c("orange","yellow2", "darkseagreen", "cyan" ), valores,
  na.color = "transparent")

Por ultimo ploteamos el mapa

leaflet::leaflet(stder) %>% 
  addTiles() %>% 
  setView(-76.5, 3.8, 8,1) %>% 
   addPolygons(color = "gray", weight = 1.0, smoothFactor = 0.5,
    opacity = 0.5, fillOpacity = 0.10,
    popup = paste("Municipio: ", stder$MPIO_CNMBR)) %>%
  addRasterImage(stder_soc, colors ="Spectral", opacity = 0.8)  %>%
  addLegend(pal = orangecyan, values = valores, title = "Soil Organic Carbon (SOC) [g/kg]")
## Warning: sf layer has inconsistent datum (+proj=longlat +ellps=GRS80 +towgs84=0,0,0,0,0,0,0 +no_defs).
## Need '+proj=longlat +datum=WGS84'

6 Visualización alternativa

Paleta continua azul–verde

pal_soc_cont <- leaflet::colorNumeric(
  palette = c("#08306B","#2171B5","#41B6C4","#A1DAB4","#FFFFCC"),
  domain  = valores,
  na.color = "transparent"
)

leaflet(stder) %>%
  addProviderTiles(providers$Esri.WorldImagery) %>%
  addProviderTiles(providers$CartoDB.PositronOnlyLabels) %>%  
  setView(lng = -76.5, lat = 3.8, zoom = 8) %>%
  addRasterImage(stder_soc, colors = pal_soc_cont, opacity = 0.85) %>%
  addPolygons(color = "white", weight = 1, fill = FALSE,
              label = ~paste0("Municipio: ", MPIO_CNMBR)) %>%
  addLegend(pal = pal_soc_cont, values = valores,
            title = "SOC (g/kg)", opacity = 1)
## Warning: sf layer has inconsistent datum (+proj=longlat +ellps=GRS80 +towgs84=0,0,0,0,0,0,0 +no_defs).
## Need '+proj=longlat +datum=WGS84'

Otra visualización:

Corta el continuo en 7 clases por cuantiles

qs <- quantile(valores, probs = seq(0, 1, length.out = 8), na.rm = TRUE)
pal_soc_cls <- leaflet::colorBin(
  palette = c("#00441B","#1B7837","#5AAE61","#A6DBA0",
              "#D9F0D3","#FEE08B","#F46D43"),
  domain  = valores,
  bins    = qs,
  na.color = "transparent"
)

leaflet(stder) %>%
  addProviderTiles(providers$Esri.WorldTopoMap) %>%
  setView(lng = -76.5, lat = 3.8, zoom = 8) %>%
  addRasterImage(stder_soc, colors = pal_soc_cls, opacity = 0.85) %>%
  addPolygons(color = "gray30", weight = 1, fill = FALSE,
              label = ~paste0("Municipio: ", MPIO_CNMBR)) %>%
  addLegend(pal = pal_soc_cls, values = valores,
            title = "SOC (g/kg) — cuantiles", opacity = 1)
## Warning: sf layer has inconsistent datum (+proj=longlat +ellps=GRS80 +towgs84=0,0,0,0,0,0,0 +no_defs).
## Need '+proj=longlat +datum=WGS84'

Una visualización más

Si no lo tienes:

if (!requireNamespace("exactextractr", quietly = TRUE)) install.packages("exactextractr")
library(exactextractr)
## Warning: package 'exactextractr' was built under R version 4.5.2
stder_wgs <- tryCatch(sf::st_transform(stder, 4326), error = function(e) stder)
soc_wgs   <- tryCatch(terra::project(stder_soc, "EPSG:4326"), error = function(e) stder_soc)
ctr <- sf::st_coordinates(sf::st_centroid(sf::st_union(stder_wgs)))

Media por municipio

stder_wgs$SOC_mean <- exactextractr::exact_extract(soc_wgs, stder_wgs, 'mean')
##   |                                                                              |                                                                      |   0%  |                                                                              |==                                                                    |   2%  |                                                                              |===                                                                   |   5%  |                                                                              |=====                                                                 |   7%  |                                                                              |=======                                                               |  10%  |                                                                              |========                                                              |  12%  |                                                                              |==========                                                            |  14%  |                                                                              |============                                                          |  17%  |                                                                              |=============                                                         |  19%  |                                                                              |===============                                                       |  21%  |                                                                              |=================                                                     |  24%  |                                                                              |==================                                                    |  26%  |                                                                              |====================                                                  |  29%  |                                                                              |======================                                                |  31%  |                                                                              |=======================                                               |  33%  |                                                                              |=========================                                             |  36%  |                                                                              |===========================                                           |  38%  |                                                                              |============================                                          |  40%  |                                                                              |==============================                                        |  43%  |                                                                              |================================                                      |  45%  |                                                                              |=================================                                     |  48%  |                                                                              |===================================                                   |  50%  |                                                                              |=====================================                                 |  52%  |                                                                              |======================================                                |  55%  |                                                                              |========================================                              |  57%  |                                                                              |==========================================                            |  60%  |                                                                              |===========================================                           |  62%  |                                                                              |=============================================                         |  64%  |                                                                              |===============================================                       |  67%  |                                                                              |================================================                      |  69%  |                                                                              |==================================================                    |  71%  |                                                                              |====================================================                  |  74%  |                                                                              |=====================================================                 |  76%  |                                                                              |=======================================================               |  79%  |                                                                              |=========================================================             |  81%  |                                                                              |==========================================================            |  83%  |                                                                              |============================================================          |  86%  |                                                                              |==============================================================        |  88%  |                                                                              |===============================================================       |  90%  |                                                                              |=================================================================     |  93%  |                                                                              |===================================================================   |  95%  |                                                                              |====================================================================  |  98%  |                                                                              |======================================================================| 100%

Paleta por cuantiles (7 clases)

pal_muni <- colorBin(
  palette = c("#00441B","#1B7837","#5AAE61","#A6DBA0","#D9F0D3","#FEE08B","#F46D43"),
  domain  = stder_wgs$SOC_mean,
  bins    = quantile(stder_wgs$SOC_mean, probs = seq(0,1,length.out = 8), na.rm = TRUE),
  na.color = "transparent"
)

leaflet(stder_wgs) %>%
  addProviderTiles(providers$Esri.WorldTopoMap) %>%
  setView(lng = ctr[1], lat = ctr[2], zoom = 8) %>%
  addPolygons(
    fillColor = ~pal_muni(SOC_mean),
    color = "gray30", weight = 1, opacity = .8, fillOpacity = .8,
    label = ~paste0("Municipio: ", MPIO_CNMBR, " , ",
                    "SOC medio: ", round(SOC_mean, 2), " g/kg")
  ) %>%
  addLegend(pal = pal_muni, values = stder_wgs$SOC_mean,
            title = "SOC promedio (g/kg)", opacity = 1)

7 Muestreo de puntos

Debemos hacer lo siguiente si estamos interesados en obtener una muestra de datos del SOC. Usaremos la libreria terra para este proposito.

Cambios que necesitamos:

set.seed(123456)

Conversión del sistema de coordenadas de referencias del SOC

geog ="+proj=longlat +datum=WGS84"
(geog.soc = project(stder_soc, geog))
## class       : SpatRaster 
## size        : 884, 840, 1  (nrow, ncol, nlyr)
## resolution  : 0.002216296, 0.002216296  (x, y)
## extent      : -77.55485, -75.69317, 3.089326, 5.048532  (xmin, xmax, ymin, ymax)
## coord. ref. : +proj=longlat +datum=WGS84 +no_defs 
## source(s)   : memory
## name        :       soc 
## min value   :  13.37023 
## max value   : 309.09845

Obtención de 2000 puntos de muestra al azar:

(samples <- terra::spatSample(geog.soc, 2000, "random", as.points=TRUE))
##  class       : SpatVector 
##  geometry    : points 
##  dimensions  : 2000, 1  (geometries, attributes)
##  extent      : -77.55153, -75.69427, 3.090434, 5.047424  (xmin, xmax, ymin, ymax)
##  coord. ref. : +proj=longlat +datum=WGS84 +no_defs 
##  names       :   soc
##  type        : <num>
##  values      : 191.5
##                   NA
##                207.6

Observa dos cosas:

  1. la clase del objeto que genera la salida, y
  2. el sistema de referencia de coordenadas (CRS) del conjunto de datos de muestra.

Por lo tanto, necesitamos realizar varios procesos de tratamiento de datos. A continuación, se explica cada bloque de código que sigue.

(muestras <- sf::st_as_sf(samples))
## Simple feature collection with 2000 features and 1 field
## Geometry type: POINT
## Dimension:     XY
## Bounding box:  xmin: -77.55153 ymin: 3.090434 xmax: -75.69427 ymax: 5.047424
## Geodetic CRS:  GEOGCRS["unknown",
##     DATUM["World Geodetic System 1984",
##         ELLIPSOID["WGS 84",6378137,298.257223563,
##             LENGTHUNIT["metre",1]],
##         ID["EPSG",6326]],
##     PRIMEM["Greenwich",0,
##         ANGLEUNIT["degree",0.0174532925199433],
##         ID["EPSG",8901]],
##     CS[ellipsoidal,2],
##         AXIS["longitude",east,
##             ORDER[1],
##             ANGLEUNIT["degree",0.0174532925199433,
##                 ID["EPSG",9122]]],
##         AXIS["latitude",north,
##             ORDER[2],
##             ANGLEUNIT["degree",0.0174532925199433,
##                 ID["EPSG",9122]]]]
## First 10 features:
##          soc                   geometry
## 1  191.45763 POINT (-76.77804 4.916662)
## 2         NA POINT (-77.44736 4.956556)
## 3  207.56955 POINT (-77.09054 4.770387)
## 4         NA  POINT (-77.3986 4.524378)
## 5  190.73111 POINT (-76.81794 4.544325)
## 6   70.45535 POINT (-76.32813 4.885634)
## 7   29.53420 POINT (-75.97574 4.198582)
## 8  205.42062 POINT (-76.75588 4.273936)
## 9  135.55244 POINT (-77.21465 3.580236)
## 10        NA POINT (-77.42742 3.367471)

Vamos a omitir los valores NA

nmuestras <- na.omit(muestras)

Ahora veremos las muestras limpias

longit <- st_coordinates(nmuestras)[,1]
latit <- st_coordinates(nmuestras)[,2]
soc <- nmuestras$soc

¿Qué obtenemos?

summary(soc)
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   14.73   36.48   61.50   92.53  161.57  242.38
length(soc)
## [1] 1748

¿Cuántas muestras no contenian unos datos validos?

id <- seq(1,1748,1)
(sitios <- data.frame(id, longit, latit, soc))
##        id    longit    latit       soc
## 1       1 -76.77804 4.916662 191.45763
## 2       2 -77.09054 4.770387 207.56955
## 3       3 -76.81794 4.544325 190.73111
## 4       4 -76.32813 4.885634  70.45535
## 5       5 -75.97574 4.198582  29.53420
## 6       6 -76.75588 4.273936 205.42062
## 7       7 -77.21465 3.580236 135.55244
## 8       8 -76.35473 4.681735  77.91371
## 9       9 -76.32148 3.159140  17.74600
## 10     10 -76.53425 4.641842 182.51727
## 11     11 -77.03070 3.633427 177.21919
## 12     12 -76.92875 3.631211 177.12788
## 13     13 -77.29666 4.734926 106.60297
## 14     14 -75.95358 4.289451  33.99530
## 15     15 -76.35916 3.130328  24.79914
## 16     16 -76.76031 3.192384  44.74848
## 17     17 -76.46111 4.664005  74.42857
## 18     18 -77.04400 4.087768 152.80603
## 19     19 -77.07059 3.660023 147.60312
## 20     20 -76.45003 4.132094  91.73940
## 21     21 -76.76696 4.781468 180.99777
## 22     22 -76.88886 3.289901  33.51029
## 23     23 -76.15748 4.016846  27.27403
## 24     24 -76.50987 4.615246 207.06580
## 25     25 -76.40127 4.041225  42.12121
## 26     26 -77.30995 4.872336 168.15280
## 27     27 -77.02405 3.886085  72.09994
## 28     28 -76.11537 3.999116  41.12426
## 29     29 -76.81794 4.845741 211.05185
## 30     30 -76.33035 4.278369  51.68089
## 31     31 -77.33433 4.265071 177.41652
## 32     32 -76.59631 3.132544  19.66570
## 33     33 -76.02672 4.992016  54.77476
## 34     34 -77.12600 4.816929 207.11887
## 35     35 -76.74480 4.777036 166.35468
## 36     36 -76.46333 4.546541  40.82617
## 37     37 -75.86271 3.988034  49.02892
## 38     38 -76.02007 4.748224  30.24277
## 39     39 -75.96245 4.890067  39.61139
## 40     40 -76.78247 3.378553  50.55745
## 41     41 -76.25278 3.416230  20.03991
## 42     42 -77.23682 3.489368 150.19772
## 43     43 -76.11537 3.730944  87.71574
## 44     44 -75.73860 3.892734  64.25546
## 45     45 -77.20135 3.363039 147.31367
## 46     46 -77.15924 4.070037 170.66676
## 47     47 -76.76696 4.845741 181.43777
## 48     48 -76.07104 3.611264  54.51231
## 49     49 -77.09497 4.874553 191.76550
## 50     50 -76.24391 4.701682  76.66525
## 51     51 -76.97972 4.650707 221.07130
## 52     52 -76.85118 4.187501 175.64182
## 53     53 -76.96643 3.159140  58.78161
## 54     54 -75.76076 4.426861  31.40083
## 55     55 -76.75145 3.134760  37.38686
## 56     56 -76.29711 3.265522  22.33255
## 57     57 -77.33433 4.825794 162.45772
## 58     58 -76.61182 4.980935 191.77859
## 59     59 -76.95313 4.493350 201.80971
## 60     60 -77.12157 3.292117 177.37041
## 61     61 -76.01564 3.500449  85.82365
## 62     62 -76.09764 4.821362  46.66425
## 63     63 -76.17743 4.160905  26.12323
## 64     64 -77.24790 3.467205 142.77840
## 65     65 -76.03337 3.538126  72.74116
## 66     66 -76.76474 4.637409 194.56972
## 67     67 -76.62512 4.593083 210.88057
## 68     68 -76.12645 4.333776  25.75132
## 69     69 -76.79356 3.431744  31.52764
## 70     70 -76.79577 3.314280  65.26068
## 71     71 -77.02405 3.717646 136.18842
## 72     72 -77.09054 3.192384 193.32016
## 73     73 -76.18851 4.240692  22.25481
## 74     74 -76.90659 4.205231 172.00240
## 75     75 -76.85118 5.036342 223.43716
## 76     76 -76.75810 3.688834  35.10537
## 77     77 -76.94648 4.553190 208.83345
## 78     78 -75.91812 4.198582  49.28552
## 79     79 -76.61625 3.821812  32.60811
## 80     80 -76.88221 4.420212 177.96295
## 81     81 -76.10207 3.604615  43.15853
## 82     82 -77.30330 4.373670 164.84354
## 83     83 -76.62068 4.400265 211.49127
## 84     84 -76.18407 4.914446  41.51890
## 85     85 -75.74525 3.706565  49.25158
## 86     86 -76.60295 3.298766  47.31629
## 87     87 -76.97308 4.238476 182.51529
## 88     88 -76.70490 4.382535 199.24524
## 89     89 -76.94426 3.227845  45.14154
## 90     90 -76.59187 4.754873 197.38058
## 91     91 -76.19294 4.983151  93.85791
## 92     92 -76.32592 4.180852  30.55805
## 93     93 -76.58744 4.812496  86.64928
## 94     94 -76.84231 4.435726 184.29063
## 95     95 -76.51874 3.194600  24.76546
## 96     96 -76.22840 3.695483  21.89856
## 97     97 -76.46333 3.979169  33.51997
## 98     98 -76.08213 3.183519  66.34416
## 99     99 -76.20845 3.449474  33.23346
## 100   100 -77.03735 4.039009 150.74690
## 101   101 -76.77139 3.804082  24.75812
## 102   102 -76.25278 4.650707  37.07402
## 103   103 -75.76076 4.449024  27.86949
## 104   104 -76.25500 3.804082  34.97948
## 105   105 -76.08213 4.200799  25.50361
## 106   106 -76.49879 4.400265  32.80711
## 107   107 -76.18407 3.779702  41.53520
## 108   108 -76.39684 3.385202  17.55852
## 109   109 -76.26829 3.108165  34.99915
## 110   110 -75.82060 3.908248  64.53346
## 111   111 -77.07059 4.245125 185.25133
## 112   112 -76.39906 4.852390  25.45021
## 113   113 -76.05996 4.765954  45.88145
## 114   114 -76.07104 3.589101  62.75421
## 115   115 -76.43895 4.670653  65.33585
## 116   116 -75.79401 3.730944  65.38037
## 117   117 -76.86004 3.850624 162.47784
## 118   118 -76.60960 4.537676 196.24530
## 119   119 -76.94426 4.145391 194.56175
## 120   120 -76.33478 3.467205  17.39684
## 121   121 -75.88487 3.684402  59.56935
## 122   122 -76.03337 3.179086  50.97435
## 123   123 -76.17743 3.154707  51.00795
## 124   124 -76.59631 3.963655  77.25108
## 125   125 -76.42343 4.666221  89.36589
## 126   126 -76.01564 4.921095  35.35721
## 127   127 -76.79356 4.203015 196.10236
## 128   128 -76.23062 3.666671  20.18950
## 129   129 -76.95313 3.697700 119.05837
## 130   130 -76.09542 4.659572  51.32587
## 131   131 -76.62512 3.611264  31.22233
## 132   132 -76.89107 4.362588 202.91177
## 133   133 -75.74303 4.056739  63.15395
## 134   134 -76.89551 3.241143  34.93362
## 135   135 -75.88487 5.029693  27.37249
## 136   136 -76.27273 3.318713  18.18635
## 137   137 -76.90437 4.841308 229.26978
## 138   138 -76.75588 3.507098  34.44213
## 139   139 -76.16856 4.870120  43.84436
## 140   140 -75.90925 3.739809  74.42051
## 141   141 -76.63177 3.832894  42.42670
## 142   142 -77.29887 4.531027 158.40570
## 143   143 -76.40570 4.267288  56.57787
## 144   144 -77.30995 4.089984 173.97299
## 145   145 -77.29222 3.509314 135.22549
## 146   146 -76.79799 3.230061  57.64321
## 147   147 -76.55198 3.267738  20.17990
## 148   148 -76.42343 4.406914  88.09972
## 149   149 -75.74968 4.143175  45.53865
## 150   150 -75.82503 4.123228  67.49143
## 151   151 -76.17964 4.876769  50.36227
## 152   152 -77.30552 4.929960 186.97015
## 153   153 -75.94915 4.240692  33.83095
## 154   154 -77.16146 3.527045 149.20126
## 155   155 -76.24391 4.338209  37.97417
## 156   156 -75.91590 4.974286  36.72939
## 157   157 -75.84498 4.245125  50.51443
## 158   158 -76.29932 4.112147  21.80676
## 159   159 -76.36359 4.972070  66.87336
## 160   160 -77.13708 5.034126 155.46780
## 161   161 -76.37911 3.941492  32.30837
## 162   162 -77.22130 3.296550 148.41624
## 163   163 -76.23505 3.285469  26.84944
## 164   164 -76.42343 4.874553  32.15695
## 165   165 -76.57414 3.715430  31.91113
## 166   166 -77.35871 4.198582 144.04053
## 167   167 -75.86493 4.067821  56.51231
## 168   168 -77.14373 3.256657 188.16460
## 169   169 -77.32103 4.194150 154.78142
## 170   170 -76.84453 4.929960 219.93097
## 171   171 -77.13043 4.655139 164.72997
## 172   172 -77.43628 3.225629 145.89543
## 173   173 -77.32768 3.294334 139.16187
## 174   174 -76.02672 4.429077  22.38112
## 175   175 -76.53868 3.759756  24.91774
## 176   176 -76.23505 3.950357  30.74434
## 177   177 -76.50765 3.586885  35.90482
## 178   178 -76.08213 4.278369  39.81799
## 179   179 -76.43230 3.848408  30.33159
## 180   180 -76.06439 3.159140  65.88843
## 181   181 -76.76696 3.928194 175.37810
## 182   182 -76.43008 4.918879 191.90813
## 183   183 -76.29267 4.710547  48.02177
## 184   184 -76.97751 3.613480 178.06143
## 185   185 -75.96688 3.841759  51.42278
## 186   186 -75.76741 3.819596  56.87213
## 187   187 -76.91545 3.243359  42.78721
## 188   188 -76.07326 3.378553  66.32816
## 189   189 -76.90215 5.040775 227.08484
## 190   190 -75.77406 3.653374  61.67916
## 191   191 -76.30819 4.898932  92.55873
## 192   192 -77.14151 3.329794  54.07308
## 193   193 -75.74303 4.307181  42.58144
## 194   194 -76.64285 4.178636 190.57321
## 195   195 -76.09099 4.874553  75.38609
## 196   196 -75.73638 4.774819  26.87509
## 197   197 -76.27938 3.717646  17.82902
## 198   198 -76.00455 4.138742  32.00293
## 199   199 -76.15748 3.824028  64.25618
## 200   200 -77.18141 4.553190 167.99805
## 201   201 -76.47663 5.023044 216.72917
## 202   202 -77.15703 4.415779 175.94901
## 203   203 -77.00189 4.287234 149.44835
## 204   204 -76.57636 3.356390  32.50249
## 205   205 -77.01962 4.604165 200.74232
## 206   206 -76.54533 4.630760 197.50723
## 207   207 -76.37246 4.446808  59.57814
## 208   208 -76.38797 4.375886  61.96046
## 209   209 -76.35030 4.457889  47.88646
## 210   210 -75.96245 3.768621  70.58025
## 211   211 -76.56528 3.152491  28.21573
## 212   212 -75.93363 3.768621  71.39880
## 213   213 -77.28557 4.723845 188.61327
## 214   214 -76.39019 4.014630  34.27431
## 215   215 -76.60074 3.906031  35.28332
## 216   216 -76.04223 3.996899  72.37068
## 217   217 -76.93762 3.538126  26.69033
## 218   218 -76.35251 4.874553  65.67418
## 219   219 -76.76474 4.519945 181.76523
## 220   220 -76.46111 3.480503  18.11605
## 221   221 -76.19072 4.010197  28.42249
## 222   222 -77.08832 3.735377 173.28378
## 223   223 -77.12157 4.464538 150.32214
## 224   224 -76.29489 3.611264  18.57061
## 225   225 -76.51652 4.542108 133.89909
## 226   226 -76.21954 3.797433  48.31941
## 227   227 -76.96643 3.285469  47.01962
## 228   228 -77.01519 4.836876 218.75134
## 229   229 -76.00899 3.757540  59.41545
## 230   230 -76.20624 4.214096  26.57031
## 231   231 -75.96466 4.958772  38.22509
## 232   232 -75.87601 3.642292  53.60666
## 233   233 -77.19027 4.646274 175.01129
## 234   234 -76.41014 3.405148  20.20711
## 235   235 -76.23948 3.347525  19.77310
## 236   236 -75.99126 3.848408  57.83562
## 237   237 -77.05730 3.591317 165.68097
## 238   238 -76.91988 4.234043 150.18048
## 239   239 -76.56084 3.959222  54.21283
## 240   240 -76.96421 4.664005 209.59862
## 241   241 -76.79356 3.134760  52.93314
## 242   242 -76.80242 4.293883 179.52222
## 243   243 -76.58301 4.519945 204.96815
## 244   244 -75.73860 4.524378  30.68380
## 245   245 -76.35251 3.283252  22.50265
## 246   246 -75.86714 4.750440  31.34184
## 247   247 -76.03558 5.023044  77.46461
## 248   248 -76.91102 5.007530 234.63509
## 249   249 -77.27892 3.210114 145.87604
## 250   250 -76.17299 4.994233  75.84579
## 251   251 -76.57636 4.717196 193.80699
## 252   252 -76.09986 3.114814  83.82098
## 253   253 -76.35473 4.878985  63.32645
## 254   254 -76.11094 4.683951  55.86629
## 255   255 -76.47663 4.723845  88.21961
## 256   256 -76.37468 3.480503  19.02821
## 257   257 -77.13265 5.036342 180.91573
## 258   258 -76.95535 4.550973 183.24402
## 259   259 -75.79844 4.041225  64.45171
## 260   260 -76.13532 3.597966  57.50202
## 261   261 -75.87601 4.351507  25.19987
## 262   262 -76.09321 4.992016  84.96331
## 263   263 -75.75855 4.063388  61.28030
## 264   264 -76.75810 3.892734  90.15071
## 265   265 -76.80242 3.848408  96.94993
## 266   266 -75.76963 3.899382  71.58311
## 267   267 -76.21067 3.515963  20.13772
## 268   268 -76.60739 3.781919  35.24987
## 269   269 -75.88487 4.566488  38.02094
## 270   270 -77.08611 4.524378 166.21432
## 271   271 -77.09719 3.555857 147.94766
## 272   272 -76.98194 3.801865 165.25668
## 273   273 -75.76298 4.406914  28.16285
## 274   274 -77.26119 3.300983 159.10265
## 275   275 -77.19692 3.185735 167.79678
## 276   276 -77.31439 3.105949 202.38460
## 277   277 -76.91102 3.999116 159.80972
## 278   278 -76.05775 4.706114  34.26245
## 279   279 -76.62512 4.783685 189.86818
## 280   280 -77.05286 3.496017  59.69006
## 281   281 -75.77849 4.400265  28.90485
## 282   282 -76.44116 3.190168  18.61803
## 283   283 -75.78071 3.254440  50.61172
## 284   284 -76.08213 4.342642  22.98430
## 285   285 -76.16634 4.650707  31.93906
## 286   286 -76.61182 4.790333 184.97122
## 287   287 -77.40747 4.322695 158.74907
## 288   288 -76.98194 4.839092 204.01427
## 289   289 -76.08213 4.276153  40.55028
## 290   290 -76.26829 4.433510  73.48999
## 291   291 -76.13088 3.988034  41.48018
## 292   292 -75.89374 3.544775  59.66250
## 293   293 -76.26164 4.874553  80.23438
## 294   294 -76.31705 3.903815  26.37518
## 295   295 -76.69161 4.395833 177.92192
## 296   296 -75.82947 4.174203  46.50501
## 297   297 -75.92255 4.351507  31.02488
## 298   298 -76.04666 4.910013  44.87622
## 299   299 -75.97131 4.468971  19.61969
## 300   300 -76.89994 3.744242  57.51226
## 301   301 -76.99302 3.664455  93.42565
## 302   302 -77.02627 3.394067  34.76686
## 303   303 -76.10429 4.209664  25.47995
## 304   304 -76.49879 3.156923  32.85402
## 305   305 -76.97529 3.252224  39.30400
## 306   306 -77.17919 4.404698 188.29622
## 307   307 -75.84498 4.644058  27.26011
## 308   308 -76.40349 4.065605  43.49789
## 309   309 -76.64728 3.316497  53.70266
## 310   310 -75.95358 4.136526  50.15042
## 311   311 -76.17743 4.061172  30.36620
## 312   312 -75.96466 3.828461  53.90822
## 313   313 -77.36314 4.307181 141.80064
## 314   314 -76.31705 4.819145  52.63573
## 315   315 -77.27228 4.078902 137.19336
## 316   316 -77.27449 5.023044 168.85107
## 317   317 -77.14373 3.092651 100.55287
## 318   318 -76.19959 4.841308  60.68725
## 319   319 -76.09542 4.785901  34.17878
## 320   320 -76.62290 4.426861 203.36765
## 321   321 -75.72973 4.242908  65.42586
## 322   322 -76.84453 3.473854  36.01229
## 323   323 -75.74968 3.660023  78.53793
## 324   324 -76.41014 3.852840  37.36125
## 325   325 -76.35916 4.978719  58.64522
## 326   326 -76.25056 3.387418  19.13939
## 327   327 -77.07724 3.764188 144.06908
## 328   328 -77.25455 4.502215 157.93716
## 329   329 -75.79179 4.537676  24.05270
## 330   330 -75.88709 4.085551  61.45034
## 331   331 -75.89817 4.125445  49.08180
## 332   332 -76.65171 4.482268 170.29111
## 333   333 -76.21067 4.285018  22.06988
## 334   334 -77.07059 4.398049 198.68353
## 335   335 -76.42565 3.165789  20.45200
## 336   336 -77.05065 4.511080 200.82396
## 337   337 -77.18806 3.979169 163.25111
## 338   338 -76.80685 3.363039  59.40688
## 339   339 -77.06394 4.473403 176.18185
## 340   340 -77.05951 4.788117 222.17917
## 341   341 -76.16413 3.593534  35.40177
## 342   342 -76.59409 3.671104  27.16679
## 343   343 -75.92477 4.482268  31.46277
## 344   344 -76.42565 4.344858  49.41602
## 345   345 -76.68052 3.646725  25.12646
## 346   346 -76.16856 3.875003  40.47633
## 347   347 -75.94250 3.742025  76.46107
## 348   348 -76.37689 3.566938  18.89842
## 349   349 -75.79179 5.005314  36.77161
## 350   350 -76.17078 3.764188  48.83339
## 351   351 -76.31705 3.759756  20.68229
## 352   352 -76.24613 4.544325  37.96110
## 353   353 -76.25500 3.258873  18.77899
## 354   354 -75.80287 3.385202  52.62441
## 355   355 -76.28602 3.125895  24.71824
## 356   356 -76.07769 3.449474  60.85960
## 357   357 -76.29489 4.619679  34.69001
## 358   358 -75.87158 4.369237  23.37161
## 359   359 -76.83788 3.917113 180.76709
## 360   360 -76.76918 4.910013 202.07437
## 361   361 -76.33257 4.293883  47.47718
## 362   362 -76.41900 4.085551  45.86296
## 363   363 -76.64950 3.356390  49.25240
## 364   364 -75.91369 4.402482  24.32126
## 365   365 -76.42343 4.269504  75.81384
## 366   366 -75.92698 3.145842  52.91526
## 367   367 -76.26164 3.564722  20.41256
## 368   368 -75.70757 4.854606  50.80343
## 369   369 -75.84498 3.660023  56.11234
## 370   370 -77.12822 4.296099 157.55196
## 371   371 -76.54755 4.938825 221.72755
## 372   372 -77.19027 4.945474 194.36671
## 373   373 -76.67831 4.486701 194.12309
## 374   374 -75.79622 3.586885  49.04329
## 375   375 -75.96909 4.092200  51.55110
## 376   376 -76.16191 3.179086  47.53609
## 377   377 -76.92432 3.843975 138.47145
## 378   378 -76.22618 4.380319  28.80026
## 379   379 -76.53647 3.852840  28.20803
## 380   380 -75.92920 4.648490  29.21316
## 381   381 -76.81129 3.575803  28.77606
## 382   382 -76.04666 4.544325  18.92701
## 383   383 -76.85783 3.555857  23.64154
## 384   384 -75.75411 4.331560  38.80981
## 385   385 -76.51652 4.575353 167.48936
## 386   386 -76.14640 4.723845  38.91621
## 387   387 -75.91369 4.444591  28.75228
## 388   388 -77.29222 3.161356 157.90793
## 389   389 -76.17964 3.471637  42.01796
## 390   390 -76.94870 3.250008  49.11113
## 391   391 -76.74258 4.907797 205.05173
## 392   392 -76.12202 4.307181  27.03741
## 393   393 -75.84277 3.535910  67.36081
## 394   394 -77.37866 3.143626 157.97235
## 395   395 -76.28824 4.462322  51.42305
## 396   396 -76.05553 3.261089  73.86402
## 397   397 -75.83168 4.502215  23.58825
## 398   398 -75.98239 3.464988  56.62174
## 399   399 -76.05775 4.395833  20.80888
## 400   400 -75.76076 3.828461  59.02536
## 401   401 -76.07326 3.179086  60.07449
## 402   402 -76.67609 4.763738 160.65274
## 403   403 -77.00410 4.125445 156.16119
## 404   404 -76.76474 4.287234 167.54005
## 405   405 -76.35916 3.307631  21.89417
## 406   406 -77.06394 4.276153 187.61909
## 407   407 -76.66279 4.801415 170.16475
## 408   408 -75.84498 3.688834  59.45396
## 409   409 -75.98904 3.695483  55.94397
## 410   410 -77.30552 3.125895 164.75740
## 411   411 -77.30774 3.458340 119.01600
## 412   412 -76.80907 4.635193 190.48573
## 413   413 -76.13088 4.852390  80.24928
## 414   414 -76.14861 5.000882  67.13297
## 415   415 -77.10384 4.034577 148.82817
## 416   416 -76.30154 3.433960  19.87928
## 417   417 -76.05553 4.338209  21.49755
## 418   418 -76.04445 4.039009  59.88047
## 419   419 -75.98904 3.449474  62.15671
## 420   420 -75.75855 3.781919  58.00809
## 421   421 -76.11315 3.746458  62.02818
## 422   422 -76.64063 3.429528  44.90870
## 423   423 -76.63620 4.584218 191.00737
## 424   424 -77.20579 4.734926 186.16786
## 425   425 -76.01342 3.717646  59.15635
## 426   426 -76.60739 3.852840  50.47830
## 427   427 -77.03735 3.460556  45.80746
## 428   428 -76.21510 3.976953  27.08834
## 429   429 -75.97353 4.032360  53.55104
## 430   430 -76.55863 4.941042 224.84886
## 431   431 -77.06173 4.422428 186.82294
## 432   432 -75.88709 3.509314  69.11419
## 433   433 -76.37468 4.573136  49.00517
## 434   434 -75.96688 4.027928  59.61058
## 435   435 -77.13930 4.524378 170.99883
## 436   436 -76.40349 4.714979  73.08846
## 437   437 -76.26608 3.496017  19.99417
## 438   438 -75.94028 3.974737  58.89285
## 439   439 -76.13753 4.743791  46.28606
## 440   440 -77.23682 5.003098 176.50009
## 441   441 -76.51652 4.273936  70.86996
## 442   442 -76.28824 4.240692  31.26030
## 443   443 -76.99746 5.025261 185.56561
## 444   444 -76.07326 4.701682  46.05979
## 445   445 -75.83833 4.471187  26.20089
## 446   446 -75.86271 4.300532  33.08506
## 447   447 -77.37644 4.107714 169.36357
## 448   448 -76.34365 4.242908  54.54338
## 449   449 -75.95801 3.797433  66.48772
## 450   450 -76.45225 3.538126  24.95918
## 451   451 -76.57858 4.830227 107.39957
## 452   452 -76.83123 3.983602 163.86139
## 453   453 -75.80509 4.759305  31.96526
## 454   454 -77.30109 3.139193 173.56012
## 455   455 -76.76253 4.739359 227.69124
## 456   456 -77.35650 3.112597 166.54738
## 457   457 -77.07946 3.247791 169.22438
## 458   458 -77.01519 4.043442 133.66499
## 459   459 -76.30597 4.788117  56.52525
## 460   460 -76.84675 3.974737 171.68636
## 461   461 -76.92875 4.001332 158.84140
## 462   462 -76.04666 3.999116  65.54815
## 463   463 -76.27716 4.808064  64.58224
## 464   464 -76.90215 4.453456 208.30359
## 465   465 -75.81617 4.637409  31.11738
## 466   466 -75.87379 4.597516  35.90866
## 467   467 -76.36138 4.218529  38.62370
## 468   468 -77.26341 4.269504 161.22014
## 469   469 -76.48771 4.466754 117.45206
## 470   470 -75.72752 4.129877  69.53129
## 471   471 -76.59409 4.777036 172.58800
## 472   472 -76.45446 5.045207 193.85059
## 473   473 -77.05730 4.739359 190.83730
## 474   474 -76.99081 3.888301 134.30576
## 475   475 -76.69604 4.546541 191.53676
## 476   476 -77.06394 4.847957 235.04022
## 477   477 -76.14640 3.223412  49.27745
## 478   478 -77.11935 3.418446  69.52270
## 479   479 -76.43895 3.183519  19.51752
## 480   480 -76.84675 3.742025  46.96066
## 481   481 -76.79799 3.688834  36.61405
## 482   482 -77.13265 3.624562 135.94838
## 483   483 -75.72087 4.373670  35.38765
## 484   484 -75.80509 4.770387  35.48148
## 485   485 -77.11049 3.728728 147.79683
## 486   486 -75.76076 4.816929  35.88876
## 487   487 -75.75855 3.626778  47.08537
## 488   488 -76.49436 3.367471  18.17193
## 489   489 -76.09764 4.637409  44.19423
## 490   490 -76.31927 3.930411  17.85865
## 491   491 -76.18407 4.759305  41.26007
## 492   492 -76.77361 3.318713  62.45568
## 493   493 -76.24170 3.941492  23.24098
## 494   494 -75.90704 4.998665  31.55717
## 495   495 -77.00410 4.712763 210.26707
## 496   496 -76.61625 3.753107  29.39767
## 497   497 -77.20800 5.045207 224.38486
## 498   498 -76.59187 5.000882 201.59575
## 499   499 -76.07548 3.531477  58.36242
## 500   500 -77.23017 5.014179 151.54968
## 501   501 -76.88442 3.593534  43.08833
## 502   502 -76.79799 4.023495 200.68346
## 503   503 -75.74525 5.018612  41.70311
## 504   504 -76.26608 4.103282  18.31239
## 505   505 -76.83345 3.092651  54.66270
## 506   506 -76.56749 4.220745 117.63705
## 507   507 -77.03292 4.730493 191.96259
## 508   508 -77.03735 3.578020 165.75899
## 509   509 -77.39860 4.081119 157.07986
## 510   510 -77.22573 3.524828 138.26697
## 511   511 -77.12378 3.203466 157.98018
## 512   512 -76.19737 4.526594  47.92437
## 513   513 -77.08832 4.960988 227.50540
## 514   514 -77.29887 4.761522 150.75179
## 515   515 -76.72485 4.420212 179.01648
## 516   516 -77.23460 3.513747 103.51345
## 517   517 -75.98904 3.199033  53.79940
## 518   518 -76.88664 3.287685  38.67433
## 519   519 -76.58966 4.927744 201.17006
## 520   520 -76.09321 3.775270  54.78724
## 521   521 -76.28824 3.269954  21.34651
## 522   522 -75.89374 3.883868  64.08828
## 523   523 -75.80952 3.679969  72.09141
## 524   524 -76.69604 3.584668  30.45635
## 525   525 -76.83123 3.815163  57.86164
## 526   526 -77.41412 4.282802 168.23878
## 527   527 -76.86448 5.020828 224.71301
## 528   528 -77.25011 4.513296 154.63081
## 529   529 -75.76741 3.713214  60.23727
## 530   530 -76.07991 4.630760  31.15794
## 531   531 -76.15970 3.340876  50.57009
## 532   532 -75.75190 3.624562  47.16145
## 533   533 -76.01342 4.836876  26.15159
## 534   534 -76.36803 4.132094  29.96118
## 535   535 -76.61404 4.378102 205.86761
## 536   536 -75.86936 4.429077  34.24027
## 537   537 -76.40570 4.468971  47.40878
## 538   538 -76.81350 3.999116 202.23418
## 539   539 -76.87556 5.042991 217.08444
## 540   540 -76.99746 4.258422 146.70419
## 541   541 -77.19914 4.980935 169.80003
## 542   542 -77.08167 3.941492 119.60349
## 543   543 -77.11714 4.486701 164.03065
## 544   544 -75.93807 4.240692  37.31525
## 545   545 -75.90482 4.189717  47.00938
## 546   546 -75.88931 4.140959  54.46682
## 547   547 -75.75855 4.019062  84.27265
## 548   548 -76.16413 3.753107  38.93695
## 549   549 -77.08611 3.425095  49.87263
## 550   550 -76.57414 4.156473  53.07517
## 551   551 -76.16413 3.365255  54.55299
## 552   552 -77.16368 3.179086 108.50278
## 553   553 -76.82458 3.196817  48.71874
## 554   554 -77.36536 4.992016 169.24574
## 555   555 -76.25500 4.344858  35.28705
## 556   556 -77.34541 4.034577 173.72800
## 557   557 -76.94205 4.996449 217.39304
## 558   558 -77.22573 3.119246 190.38008
## 559   559 -76.57636 4.107714  46.66533
## 560   560 -76.77804 4.688384 105.26068
## 561   561 -75.95801 3.336443  74.40798
## 562   562 -75.98682 4.081119  55.80661
## 563   563 -76.89107 4.679519 209.76187
## 564   564 -77.19249 4.180852 142.99295
## 565   565 -77.07503 3.724295 126.35647
## 566   566 -77.19914 3.161356 189.16116
## 567   567 -76.67166 3.742025  28.33905
## 568   568 -76.45225 3.385202  14.73071
## 569   569 -77.04843 5.018612 203.09306
## 570   570 -75.74082 3.806298  71.69623
## 571   571 -76.02893 3.748674  57.28828
## 572   572 -75.97131 3.183519  63.28616
## 573   573 -75.88044 4.362588  28.55794
## 574   574 -76.22397 3.422879  22.88551
## 575   575 -75.82060 4.391400  29.96937
## 576   576 -77.32325 4.978719 181.62233
## 577   577 -77.34541 4.969853 223.26915
## 578   578 -76.70047 3.332011  67.39969
## 579   579 -77.27449 4.686168 195.25171
## 580   580 -77.32103 4.934393 209.06618
## 581   581 -77.50499 4.236259 151.69585
## 582   582 -77.17254 3.411797 149.34242
## 583   583 -76.72928 3.174654  45.72010
## 584   584 -76.80242 3.866138  85.27660
## 585   585 -77.29444 3.230061 146.22067
## 586   586 -76.30819 4.668437  51.14008
## 587   587 -75.79401 4.502215  24.78315
## 588   588 -76.91767 3.990251 191.88139
## 589   589 -77.19692 4.819145 171.29594
## 590   590 -77.01519 3.679969  88.89985
## 591   591 -76.21732 3.305415  23.60778
## 592   592 -76.91324 4.854606 215.82976
## 593   593 -75.75411 4.515513  30.66752
## 594   594 -77.41634 3.285469 118.02527
## 595   595 -77.33876 4.340425 140.82872
## 596   596 -75.89152 4.874553  39.29480
## 597   597 -76.13975 4.650707  37.36016
## 598   598 -76.98637 4.978719 202.88036
## 599   599 -77.29666 3.354174 149.88083
## 600   600 -76.51874 4.845741  70.37454
## 601   601 -77.43628 3.210114 152.39087
## 602   602 -76.77361 4.335993 181.83363
## 603   603 -76.15970 4.231827  27.16139
## 604   604 -77.00410 3.708781 160.03755
## 605   605 -75.91812 5.023044  30.72373
## 606   606 -76.13532 3.733160  45.36927
## 607   607 -76.38354 3.965871  40.19160
## 608   608 -76.15970 4.887850  52.96996
## 609   609 -76.65615 3.445042  43.06727
## 610   610 -76.11537 4.074470  33.46743
## 611   611 -76.43673 3.114814  23.52185
## 612   612 -76.41235 3.626778  21.36452
## 613   613 -76.54533 5.034126 221.73334
## 614   614 -76.82015 4.342642 191.49455
## 615   615 -76.98637 3.974737 134.47614
## 616   616 -75.72087 4.927744  36.40700
## 617   617 -76.68274 4.737142 206.83499
## 618   618 -76.44781 3.739809  36.11686
## 619   619 -76.85783 4.531027 211.95770
## 620   620 -76.82902 4.486701 203.84198
## 621   621 -76.20402 4.699465  50.35904
## 622   622 -76.97751 3.276603  48.87486
## 623   623 -76.89551 3.420663  52.38809
## 624   624 -76.69604 3.351957  78.66418
## 625   625 -76.25943 4.163122  21.75512
## 626   626 -76.38354 3.154707  19.78427
## 627   627 -77.24790 4.870120 211.35222
## 628   628 -75.98461 4.621895  20.78131
## 629   629 -76.25500 3.584668  20.96294
## 630   630 -77.21244 3.562505 134.41695
## 631   631 -77.10827 4.958772 207.98354
## 632   632 -76.51430 4.025711  58.12868
## 633   633 -76.42122 4.347074  40.07454
## 634   634 -75.78293 4.972070  27.34776
## 635   635 -76.21510 3.531477  26.98681
## 636   636 -76.16856 3.602399  31.95834
## 637   637 -77.08611 4.045658 129.08492
## 638   638 -76.21954 4.176419  22.96820
## 639   639 -75.95580 3.744242  56.21719
## 640   640 -76.73593 4.666221 179.40694
## 641   641 -76.21067 4.052307  17.53677
## 642   642 -76.41679 4.417996  29.42630
## 643   643 -76.47663 4.996449 190.97815
## 644   644 -76.87999 3.628994  38.25845
## 645   645 -76.09986 4.752656  48.30046
## 646   646 -75.88487 3.391851  61.08208
## 647   647 -76.51430 3.223412  20.11487
## 648   648 -76.47884 5.018612 186.01991
## 649   649 -76.40792 3.323146  20.44373
## 650   650 -76.40127 4.564271  74.55558
## 651   651 -76.80464 3.757540  58.88192
## 652   652 -76.17743 4.652923  31.11798
## 653   653 -76.27051 3.183519  23.63717
## 654   654 -76.71377 3.411797  51.62599
## 655   655 -77.26341 4.247341 174.24432
## 656   656 -76.95091 3.214547  44.13543
## 657   657 -76.90659 3.101516  30.32690
## 658   658 -76.52760 4.096633  56.29656
## 659   659 -76.96199 3.289901  47.52237
## 660   660 -76.25500 4.449024  88.26231
## 661   661 -77.19027 3.615697 101.04842
## 662   662 -76.09764 4.433510  30.63202
## 663   663 -76.50544 3.824028  26.39628
## 664   664 -76.17078 4.367021  29.67937
## 665   665 -76.48106 3.988034  53.33175
## 666   666 -76.54533 4.495566 202.39989
## 667   667 -76.39684 3.697700  19.69911
## 668   668 -77.10162 3.631211 147.38586
## 669   669 -76.09321 4.965421 107.58893
## 670   670 -75.93807 3.531477  66.69685
## 671   671 -76.51430 4.528811 190.68893
## 672   672 -76.56749 3.886085  38.10512
## 673   673 -75.95801 3.742025  58.07437
## 674   674 -77.54710 3.156923 148.98555
## 675   675 -76.45668 4.726061  69.35276
## 676   676 -77.06173 4.194150 174.39293
## 677   677 -76.57636 3.236710  22.25914
## 678   678 -76.68939 4.949907 202.94106
## 679   679 -76.42122 4.005765  34.90297
## 680   680 -76.64950 3.875003  37.15688
## 681   681 -76.31484 3.518180  22.46934
## 682   682 -76.60739 4.697249 211.81462
## 683   683 -76.24391 3.524828  15.78336
## 684   684 -77.10162 3.875003  90.56264
## 685   685 -77.06838 3.604615 151.44279
## 686   686 -76.67388 4.732710 169.14751
## 687   687 -76.04223 3.914897  64.73889
## 688   688 -76.54533 4.362588  87.58407
## 689   689 -76.26608 3.651157  22.78015
## 690   690 -76.08213 4.353723  18.12308
## 691   691 -77.28336 4.087768 160.86172
## 692   692 -76.31484 4.313830  43.50309
## 693   693 -76.59852 3.520396  28.28897
## 694   694 -75.86050 3.225629  64.21719
## 695   695 -77.31882 4.621895 128.37428
## 696   696 -76.19737 3.609048  26.84402
## 697   697 -75.97574 5.038559  45.45625
## 698   698 -76.62733 3.453907  35.49941
## 699   699 -76.02007 4.393616  17.63620
## 700   700 -76.37024 3.194600  23.68067
## 701   701 -76.35030 3.852840  43.19036
## 702   702 -77.18584 3.289901 140.80194
## 703   703 -76.82902 3.287685  49.32222
## 704   704 -77.29001 3.234494 143.06175
## 705   705 -76.83123 4.870120 191.54971
## 706   706 -75.92255 4.737142  23.92476
## 707   707 -76.89994 4.136526 163.35248
## 708   708 -77.10384 3.613480 136.01260
## 709   709 -76.01120 4.262855  26.56594
## 710   710 -76.25500 3.174654  18.63434
## 711   711 -75.86050 5.007530  29.08007
## 712   712 -76.39906 3.846191  37.96339
## 713   713 -75.95358 4.129877  50.72453
## 714   714 -76.46776 4.240692  63.00879
## 715   715 -77.12157 4.398049 190.64915
## 716   716 -77.03292 3.646725 126.82050
## 717   717 -77.30552 4.582002 177.34056
## 718   718 -76.76253 4.599732 181.81200
## 719   719 -75.91369 4.672870  35.94702
## 720   720 -76.73593 3.263306  55.32234
## 721   721 -76.86448 4.847957 237.17586
## 722   722 -75.96688 3.172437  46.07654
## 723   723 -76.85561 4.169771 181.66769
## 724   724 -76.67609 4.958772 200.54417
## 725   725 -76.89772 4.599732 214.02087
## 726   726 -77.31660 4.941042 209.85780
## 727   727 -76.88221 4.734926 118.76677
## 728   728 -76.47663 4.652923 169.61835
## 729   729 -75.79844 4.936609  29.36487
## 730   730 -76.56528 4.763738  93.22455
## 731   731 -77.00410 4.969853 189.33994
## 732   732 -76.80020 4.340425 165.93550
## 733   733 -77.03513 4.466754 137.93185
## 734   734 -76.65615 3.779702  30.36177
## 735   735 -76.72707 4.105498 203.13586
## 736   736 -77.30552 3.467205 106.66588
## 737   737 -77.16146 3.578020 131.60516
## 738   738 -76.98637 4.992016 199.15039
## 739   739 -75.83390 3.230061  58.78352
## 740   740 -75.85163 3.693267  63.32635
## 741   741 -76.94648 4.061172 183.05920
## 742   742 -77.09497 4.522162 166.67088
## 743   743 -76.91545 3.305415  44.41390
## 744   744 -76.99967 3.921545 133.98431
## 745   745 -76.13310 3.937060  46.93446
## 746   746 -75.77184 3.473854  56.44498
## 747   747 -75.80730 5.047424  36.61390
## 748   748 -75.85606 4.772603  29.87039
## 749   749 -77.18362 3.584668 107.15098
## 750   750 -76.35916 3.294334  19.91819
## 751   751 -76.13975 4.344858  42.35347
## 752   752 -76.91102 4.519945 205.60985
## 753   753 -75.97574 3.172437  65.26224
## 754   754 -76.07326 4.615246  34.14523
## 755   755 -76.22618 3.187951  22.53157
## 756   756 -76.13088 3.489368  41.79415
## 757   757 -76.60960 3.159140  26.95997
## 758   758 -75.82060 3.099300  55.25029
## 759   759 -76.18407 4.291667  24.04412
## 760   760 -77.41634 4.010197 196.29156
## 761   761 -75.95580 4.726061  23.55093
## 762   762 -76.42787 4.941042 149.56255
## 763   763 -77.13708 3.549208 163.16298
## 764   764 -77.23460 4.129877 165.75656
## 765   765 -75.80952 3.152491  53.88517
## 766   766 -77.05951 3.374120 118.84629
## 767   767 -76.13310 3.777486  55.84047
## 768   768 -76.55420 4.825794  97.92860
## 769   769 -75.88487 4.524378  35.16823
## 770   770 -76.88442 3.894950 140.61023
## 771   771 -77.34763 4.025711 168.66742
## 772   772 -77.21022 3.883868 127.71507
## 773   773 -76.22175 3.624562  28.65052
## 774   774 -77.14373 4.311614 182.44157
## 775   775 -76.00234 3.436177  87.13017
## 776   776 -77.46066 3.216763 104.63142
## 777   777 -76.27494 4.972070 105.25816
## 778   778 -77.27671 4.340425 164.47321
## 779   779 -76.95091 4.358156 176.11617
## 780   780 -75.76298 4.258422  57.00138
## 781   781 -76.80020 4.985367 215.96164
## 782   782 -75.93807 4.847957  20.15796
## 783   783 -76.01120 4.821362  37.00845
## 784   784 -75.82503 4.025711  65.31625
## 785   785 -76.68274 4.750440 190.22183
## 786   786 -76.50765 4.129877  76.98254
## 787   787 -76.11537 3.728728  77.75719
## 788   788 -77.21022 4.777036 174.37315
## 789   789 -77.10827 3.753107 124.54478
## 790   790 -75.89374 3.411797  63.03568
## 791   791 -76.70712 3.489368  32.93036
## 792   792 -76.72485 3.156923  40.26790
## 793   793 -77.23460 4.402482 163.88049
## 794   794 -77.00632 4.417996 189.30830
## 795   795 -76.86891 4.231827 171.88994
## 796   796 -76.56306 4.856822  72.63888
## 797   797 -76.52095 4.987584 204.23964
## 798   798 -76.00012 3.205682  54.26798
## 799   799 -77.37201 4.107714 176.88408
## 800   800 -76.83123 4.460105 192.83878
## 801   801 -76.08877 3.954790  38.48646
## 802   802 -75.92034 4.265071  36.85329
## 803   803 -77.06838 4.670653 196.49820
## 804   804 -76.97308 4.103282 164.33264
## 805   805 -77.21022 4.630760 171.14456
## 806   806 -77.18806 4.247341 152.66360
## 807   807 -76.75366 3.480503  38.11129
## 808   808 -75.74746 4.043442  65.58820
## 809   809 -76.70712 3.790784  31.39376
## 810   810 -76.60517 4.721628 195.72504
## 811   811 -75.81174 3.682185  68.64558
## 812   812 -76.47441 5.003098 183.96169
## 813   813 -76.91324 4.814713 242.38382
## 814   814 -76.57636 3.148058  27.07156
## 815   815 -75.80509 3.937060  59.22770
## 816   816 -76.55420 4.553190 189.90363
## 817   817 -77.21244 4.535459 176.07320
## 818   818 -76.90215 3.624562  45.71042
## 819   819 -76.41235 3.589101  17.36136
## 820   820 -76.04888 3.861705  72.38399
## 821   821 -76.72928 4.429077 178.28026
## 822   822 -76.39462 3.857273  30.95070
## 823   823 -76.12423 3.354174  58.51859
## 824   824 -77.15038 5.047424 185.64983
## 825   825 -76.35030 4.251774  58.18201
## 826   826 -76.58522 4.138742  63.19795
## 827   827 -75.75190 3.451691  58.85822
## 828   828 -77.25455 3.307631 145.98502
## 829   829 -76.98416 3.179086  42.35112
## 830   830 -76.72042 4.526594 191.24818
## 831   831 -76.46554 3.664455  30.64300
## 832   832 -76.13753 4.608597  39.47217
## 833   833 -76.57193 4.092200  58.87195
## 834   834 -76.74923 4.136526  79.22907
## 835   835 -76.74923 3.950357 182.01765
## 836   836 -76.85783 4.380319 177.74939
## 837   837 -75.90261 4.160905  42.36477
## 838   838 -75.84055 4.238476  43.03549
## 839   839 -76.89551 4.943258 227.49411
## 840   840 -76.50322 4.666221  75.74952
## 841   841 -76.66279 4.925527 224.12520
## 842   842 -76.74701 3.387418  50.45637
## 843   843 -76.56084 3.737593  26.80086
## 844   844 -76.12202 4.967637  82.73714
## 845   845 -76.23948 3.615697  21.09064
## 846   846 -76.50987 4.925527 161.18762
## 847   847 -75.82503 3.750891  68.71880
## 848   848 -77.23903 3.305415 141.63727
## 849   849 -77.13487 4.258422 174.05135
## 850   850 -76.25943 3.272171  20.66496
## 851   851 -76.26386 3.673320  19.58984
## 852   852 -76.26608 4.910013  67.06650
## 853   853 -76.71377 3.832894  56.52465
## 854   854 -76.41457 3.937060  35.45692
## 855   855 -76.44781 4.240692  85.46769
## 856   856 -77.16368 4.287234 195.72702
## 857   857 -76.31484 3.145842  21.00083
## 858   858 -75.92698 4.127661  47.43319
## 859   859 -76.01120 3.655590  59.18201
## 860   860 -76.36581 3.367471  19.38195
## 861   861 -76.17743 4.466754  46.40459
## 862   862 -75.85163 3.657806  44.14805
## 863   863 -76.77804 3.509314  29.46845
## 864   864 -76.24391 3.318713  25.41512
## 865   865 -77.03956 4.347074 183.82381
## 866   866 -75.93807 3.715430  70.12364
## 867   867 -76.97972 4.021279 146.25983
## 868   868 -76.68939 3.753107  33.19421
## 869   869 -76.84010 4.932176 226.20619
## 870   870 -77.15703 3.937060 188.61804
## 871   871 -77.43628 4.273936 127.76015
## 872   872 -76.14196 4.477836  51.88884
## 873   873 -76.36359 4.863471  32.61682
## 874   874 -75.87823 4.717196  27.78446
## 875   875 -76.29932 3.748674  20.96815
## 876   876 -76.93540 4.464538 182.88481
## 877   877 -75.74082 3.693267  53.69862
## 878   878 -75.78293 3.730944  58.99075
## 879   879 -77.13043 4.054523 152.39507
## 880   880 -76.78469 4.087768 128.10616
## 881   881 -77.13930 4.081119 151.69453
## 882   882 -76.39241 3.974737  34.30663
## 883   883 -76.80242 3.400716  34.26619
## 884   884 -76.16413 3.212331  49.45187
## 885   885 -76.94426 4.081119 166.36830
## 886   886 -77.14595 3.502666 143.61176
## 887   887 -76.61847 4.475619 212.27884
## 888   888 -76.85783 4.203015 182.69569
## 889   889 -77.41634 3.216763 149.69452
## 890   890 -76.13532 3.850624  59.53920
## 891   891 -77.14816 3.358606  81.45389
## 892   892 -75.84055 4.245125  45.52176
## 893   893 -76.45890 3.799649  30.99602
## 894   894 -77.10827 4.411347 164.66582
## 895   895 -75.92034 4.595299  28.00668
## 896   896 -76.04002 4.774819  38.94470
## 897   897 -76.47219 3.309848  22.61734
## 898   898 -76.63398 4.050091  75.39086
## 899   899 -76.17521 3.859489  46.45251
## 900   900 -76.64506 3.168005  27.95307
## 901   901 -75.80952 3.112597  60.48175
## 902   902 -77.23903 4.409131 175.30634
## 903   903 -75.74303 4.774819  31.90362
## 904   904 -76.64506 4.717196 185.77631
## 905   905 -76.88664 4.905581 222.16718
## 906   906 -75.95801 3.269954  63.63010
## 907   907 -76.85561 4.417996 177.69354
## 908   908 -76.60074 4.067821  52.69486
## 909   909 -75.88044 4.732710  25.09189
## 910   910 -76.77139 4.054523 176.06444
## 911   911 -76.97972 4.402482 210.66206
## 912   912 -76.48771 3.976953  46.99942
## 913   913 -76.29267 4.067821  21.19676
## 914   914 -76.91102 4.823578 229.65524
## 915   915 -75.95358 4.499999  23.08739
## 916   916 -76.36359 4.604165  78.52150
## 917   917 -75.86271 4.681735  27.96127
## 918   918 -77.15038 4.298316 182.18983
## 919   919 -77.19027 3.593534 112.14040
## 920   920 -76.31040 4.644058  43.14389
## 921   921 -76.79577 3.797433  52.34900
## 922   922 -76.69382 3.289901  76.50442
## 923   923 -77.01962 4.772603 204.69313
## 924   924 -75.98239 3.941492  61.47963
## 925   925 -76.52760 4.214096  51.58466
## 926   926 -76.05331 4.921095  43.91668
## 927   927 -76.64285 4.524378 186.76244
## 928   928 -76.14861 4.914446  56.10828
## 929   929 -75.74746 3.994683  73.73946
## 930   930 -75.87601 3.165789  56.67101
## 931   931 -75.77849 3.952574  62.76696
## 932   932 -77.11935 4.628544 190.71872
## 933   933 -77.00632 3.332011  38.15084
## 934   934 -76.52760 4.063388  94.34996
## 935   935 -76.39019 4.723845  95.89396
## 936   936 -76.22397 3.216763  23.07729
## 937   937 -76.61404 4.109931  50.53913
## 938   938 -76.58966 5.023044 229.67467
## 939   939 -76.04223 3.894950  56.37081
## 940   940 -76.63398 4.043442  70.52096
## 941   941 -76.69161 4.497782 165.12883
## 942   942 -76.45668 4.118796  62.99043
## 943   943 -76.77583 4.632976 190.58990
## 944   944 -76.19737 3.746458  38.47778
## 945   945 -75.79622 4.584218  23.87990
## 946   946 -76.48327 3.216763  29.99386
## 947   947 -76.36803 3.442826  17.48351
## 948   948 -76.10207 4.464538  24.11856
## 949   949 -76.02672 3.784135  75.65672
## 950   950 -76.53647 3.983602  50.95091
## 951   951 -76.50765 4.495566  62.42426
## 952   952 -77.12822 4.285018 179.19264
## 953   953 -76.94870 4.358156 191.41557
## 954   954 -76.06883 4.701682  40.42658
## 955   955 -76.34365 3.793000  23.40408
## 956   956 -75.99569 4.034577  56.30268
## 957   957 -76.82902 3.394067  34.77643
## 958   958 -77.08611 3.835110 138.72461
## 959   959 -76.55863 4.251774  85.09911
## 960   960 -75.82282 4.721628  20.54504
## 961   961 -76.91545 3.185735  42.54154
## 962   962 -76.13975 3.622345  45.47478
## 963   963 -77.18584 3.934843 141.43477
## 964   964 -77.19027 4.850173 174.28296
## 965   965 -75.84498 3.247791  58.80474
## 966   966 -76.08213 3.533694  55.87187
## 967   967 -76.66279 4.728277 194.49214
## 968   968 -76.79799 3.757540  92.47520
## 969   969 -75.74525 5.042991  50.20569
## 970   970 -76.19294 3.504882  39.47014
## 971   971 -76.20402 4.036793  21.91187
## 972   972 -77.15038 3.496017 151.82826
## 973   973 -77.09719 4.522162 163.88014
## 974   974 -76.42122 4.985367  72.23486
## 975   975 -75.78071 3.101516  62.96891
## 976   976 -76.18186 3.369688  34.03838
## 977   977 -76.81572 3.380769  58.43588
## 978   978 -76.00899 4.542108  24.42191
## 979   979 -76.99967 3.832894 134.37935
## 980   980 -76.97972 4.546541 190.28786
## 981   981 -76.30375 3.957006  20.62739
## 982   982 -76.77804 4.517729 192.98500
## 983   983 -76.10207 3.092651  86.16557
## 984   984 -76.04002 3.881652  59.87176
## 985   985 -76.79577 3.101516  52.18586
## 986   986 -76.28602 4.171987  22.67177
## 987   987 -75.87379 3.473854  55.56315
## 988   988 -76.83345 3.897166 171.66379
## 989   989 -77.35650 4.021279 144.87375
## 990   990 -76.67609 4.544325 168.84512
## 991   991 -75.81617 4.546541  26.49754
## 992   992 -76.29932 3.409581  19.13623
## 993   993 -75.90482 4.537676  41.80297
## 994   994 -76.58744 3.917113  33.45612
## 995   995 -75.73195 3.843975  67.06799
## 996   996 -77.19471 4.488917 169.86844
## 997   997 -77.05286 4.750440 191.69911
## 998   998 -76.86669 4.661788 220.69136
## 999   999 -77.20135 4.103282 176.68814
## 1000 1000 -75.74303 4.287234  38.99258
## 1001 1001 -76.91767 4.043442 163.65404
## 1002 1002 -76.73593 4.641842 190.46083
## 1003 1003 -75.87823 3.533694  65.39639
## 1004 1004 -77.23460 3.305415 139.95673
## 1005 1005 -76.41235 3.819596  43.02121
## 1006 1006 -77.14151 3.363039  77.13309
## 1007 1007 -77.20579 3.919329 161.66568
## 1008 1008 -76.60295 3.892734  37.01601
## 1009 1009 -76.38354 4.573136  57.57359
## 1010 1010 -75.84277 4.460105  28.34731
## 1011 1011 -75.89152 4.952123  35.05818
## 1012 1012 -75.97574 3.640076  60.98776
## 1013 1013 -75.90261 3.187951  51.50850
## 1014 1014 -76.49657 3.168005  30.99903
## 1015 1015 -76.79356 4.974286 155.69499
## 1016 1016 -76.73593 4.482268 183.81671
## 1017 1017 -76.27494 4.916662  54.29585
## 1018 1018 -77.48504 3.223412 104.37109
## 1019 1019 -76.60295 4.426861 187.94539
## 1020 1020 -76.13753 4.349291  43.21474
## 1021 1021 -76.15083 3.640076  44.39165
## 1022 1022 -75.79844 4.557622  27.24135
## 1023 1023 -76.25721 3.919329  25.12054
## 1024 1024 -77.06838 4.874553 196.81804
## 1025 1025 -76.54533 4.963205 180.76393
## 1026 1026 -75.88709 4.646274  39.28791
## 1027 1027 -76.34365 3.411797  18.51127
## 1028 1028 -77.24790 4.843525 178.10698
## 1029 1029 -77.26563 3.250008 151.37920
## 1030 1030 -76.04223 4.898932  47.14351
## 1031 1031 -76.15526 3.110381  51.42384
## 1032 1032 -76.75366 4.289451 177.55940
## 1033 1033 -76.39241 3.622345  20.78507
## 1034 1034 -76.78026 3.201249  49.28410
## 1035 1035 -76.07326 4.932176  86.71581
## 1036 1036 -76.43230 3.872787  40.71330
## 1037 1037 -76.80020 3.846191  90.88989
## 1038 1038 -76.23283 4.608597  38.08915
## 1039 1039 -76.17078 3.925978  55.79535
## 1040 1040 -75.86936 3.972520  65.06240
## 1041 1041 -75.80509 4.415779  28.15877
## 1042 1042 -76.64950 3.945925  33.55584
## 1043 1043 -76.59187 4.677302 226.64713
## 1044 1044 -76.26386 3.861705  35.72496
## 1045 1045 -76.88442 3.378553  53.08199
## 1046 1046 -76.93318 4.415779 192.89299
## 1047 1047 -76.82015 4.065605 199.26527
## 1048 1048 -76.46776 5.016396 195.40999
## 1049 1049 -75.95580 4.772603  40.61293
## 1050 1050 -76.06661 4.810280  49.37732
## 1051 1051 -76.43230 4.734926 190.77225
## 1052 1052 -76.45225 3.134760  23.81989
## 1053 1053 -76.53647 4.340425  77.78336
## 1054 1054 -76.45668 3.804082  24.37038
## 1055 1055 -76.39462 3.159140  23.42724
## 1056 1056 -75.83168 4.196366  42.65870
## 1057 1057 -76.68052 3.642292  28.83820
## 1058 1058 -76.01785 3.957006  54.53980
## 1059 1059 -76.65615 3.498233  37.17800
## 1060 1060 -76.93983 3.810731 160.96161
## 1061 1061 -77.01740 3.560289 106.24591
## 1062 1062 -76.10872 3.804082  64.09809
## 1063 1063 -77.15703 4.958772 204.15158
## 1064 1064 -75.93142 3.132544  61.52530
## 1065 1065 -76.44116 4.801415  57.10860
## 1066 1066 -75.86936 3.305415  51.11992
## 1067 1067 -76.36803 3.369688  18.18738
## 1068 1068 -76.30375 3.824028  21.72899
## 1069 1069 -76.97308 4.163122 139.86052
## 1070 1070 -76.59852 4.675086 209.56766
## 1071 1071 -76.57636 4.914446 197.26549
## 1072 1072 -76.07769 4.340425  19.96403
## 1073 1073 -75.80066 3.292117  34.59095
## 1074 1074 -76.33922 4.941042 174.80782
## 1075 1075 -75.89596 3.105949  59.02617
## 1076 1076 -76.04445 4.987584  53.50146
## 1077 1077 -75.78514 4.391400  28.15177
## 1078 1078 -76.36359 4.422428  48.55284
## 1079 1079 -76.79134 3.906031 159.55983
## 1080 1080 -76.80242 4.367021 197.23711
## 1081 1081 -76.39462 4.695033  97.47343
## 1082 1082 -76.94870 4.382535 192.14572
## 1083 1083 -75.92477 3.165789  61.88306
## 1084 1084 -76.67166 4.449024 192.15182
## 1085 1085 -77.18362 3.451691 128.52019
## 1086 1086 -76.57636 4.464538 190.61148
## 1087 1087 -76.85118 4.987584 208.19144
## 1088 1088 -76.75588 3.400716  45.97694
## 1089 1089 -77.17698 4.763738 200.37502
## 1090 1090 -77.29001 4.836876 214.31688
## 1091 1091 -77.04400 3.181303 162.70221
## 1092 1092 -77.29001 3.225629 145.50092
## 1093 1093 -76.10429 4.790333  45.70738
## 1094 1094 -76.35030 4.404698  50.39275
## 1095 1095 -75.83168 4.912230  29.18367
## 1096 1096 -76.37246 4.158689  39.95785
## 1097 1097 -76.84675 4.163122 169.76727
## 1098 1098 -75.83833 4.081119  61.73335
## 1099 1099 -77.27671 4.597516 135.67078
## 1100 1100 -75.93142 3.764188  75.87709
## 1101 1101 -75.81839 3.163572  56.04260
## 1102 1102 -75.86271 3.172437  54.33210
## 1103 1103 -76.75366 3.600183  37.04279
## 1104 1104 -76.71155 3.385202  61.38246
## 1105 1105 -76.11315 3.730944  87.00273
## 1106 1106 -75.75411 3.152491  55.51636
## 1107 1107 -75.86050 4.812496  23.08051
## 1108 1108 -76.99967 4.819145 222.81006
## 1109 1109 -76.82458 4.205231 195.64786
## 1110 1110 -76.58522 4.227394 201.76816
## 1111 1111 -75.89374 3.959222  72.00139
## 1112 1112 -77.22130 4.832443 190.24033
## 1113 1113 -76.06439 3.292117  71.51599
## 1114 1114 -76.58079 3.420663  34.65446
## 1115 1115 -76.10650 4.340425  25.09004
## 1116 1116 -76.64506 3.582452  26.31425
## 1117 1117 -77.28336 3.161356 138.77446
## 1118 1118 -76.02007 3.502666  77.95392
## 1119 1119 -76.89329 4.916662 215.41348
## 1120 1120 -76.89772 4.417996 201.80077
## 1121 1121 -77.22352 5.040775 183.58533
## 1122 1122 -76.14196 4.732710  45.04676
## 1123 1123 -76.60295 3.908248  31.82361
## 1124 1124 -76.93318 4.169771 165.13763
## 1125 1125 -76.74036 4.007981 213.41739
## 1126 1126 -76.35473 4.872336  69.43579
## 1127 1127 -76.61847 4.502215 204.02286
## 1128 1128 -76.53425 4.803631  78.62790
## 1129 1129 -76.77583 4.794766 209.23933
## 1130 1130 -77.11935 5.016396 176.65996
## 1131 1131 -77.30995 3.216763 145.95789
## 1132 1132 -76.26164 3.921545  22.79194
## 1133 1133 -76.34365 3.214547  18.26742
## 1134 1134 -76.92432 3.449474  46.92191
## 1135 1135 -77.21244 3.518180 135.37067
## 1136 1136 -77.13930 4.426861 177.82452
## 1137 1137 -77.08832 3.673320 118.89805
## 1138 1138 -76.13088 4.777036  57.71829
## 1139 1139 -76.87778 3.090434  41.03513
## 1140 1140 -76.86448 3.161356  44.28620
## 1141 1141 -76.76031 3.099300  43.85008
## 1142 1142 -75.87158 3.411797  57.00348
## 1143 1143 -76.45003 3.622345  19.63950
## 1144 1144 -76.13753 4.768170  52.29483
## 1145 1145 -76.83123 3.212331  46.85202
## 1146 1146 -77.07281 4.451240 175.70863
## 1147 1147 -76.21510 4.134310  22.58021
## 1148 1148 -76.61182 3.868354  49.82751
## 1149 1149 -76.00012 3.394067  67.92110
## 1150 1150 -76.74258 3.274387  69.33772
## 1151 1151 -76.92875 3.221196  45.91851
## 1152 1152 -77.39417 3.312064 119.18986
## 1153 1153 -76.03115 3.901599  66.56503
## 1154 1154 -77.20800 4.276153 186.08803
## 1155 1155 -77.25011 4.258422 166.39125
## 1156 1156 -77.01297 3.385202  65.27734
## 1157 1157 -75.84277 3.801865  71.32051
## 1158 1158 -77.12822 3.294334 156.57053
## 1159 1159 -77.03956 3.345309  48.71790
## 1160 1160 -75.91369 4.570920  30.40044
## 1161 1161 -76.23283 3.185735  19.49940
## 1162 1162 -75.95136 4.969853  38.28213
## 1163 1163 -76.51874 3.597966  36.32127
## 1164 1164 -75.75411 4.728277  26.49774
## 1165 1165 -76.79577 4.171987 193.77481
## 1166 1166 -76.98416 3.451691  27.90106
## 1167 1167 -76.99967 3.460556 167.08714
## 1168 1168 -77.46066 4.251774 124.44624
## 1169 1169 -76.20624 4.754873  50.27273
## 1170 1170 -76.00012 4.298316  21.11626
## 1171 1171 -75.97574 3.119246  72.30196
## 1172 1172 -77.07059 3.666671 154.72191
## 1173 1173 -77.05730 4.947690 200.29523
## 1174 1174 -76.02007 3.307631  61.98272
## 1175 1175 -75.75190 3.298766  32.19315
## 1176 1176 -76.61182 4.484485 188.20076
## 1177 1177 -77.09054 4.972070 155.33298
## 1178 1178 -76.25500 3.739809  21.51424
## 1179 1179 -76.93097 4.050091 158.87796
## 1180 1180 -75.74968 3.471637  41.62827
## 1181 1181 -77.03292 5.018612 226.32619
## 1182 1182 -76.48771 4.938825 102.89458
## 1183 1183 -77.17033 3.775270 103.18786
## 1184 1184 -77.05951 3.389634 163.99474
## 1185 1185 -76.04002 3.347525  79.86542
## 1186 1186 -77.21908 4.985367 159.22638
## 1187 1187 -76.72928 4.218529 198.76443
## 1188 1188 -75.96909 4.821362  30.74409
## 1189 1189 -75.87601 3.812947  88.39406
## 1190 1190 -75.75411 4.635193  23.48100
## 1191 1191 -76.82237 4.457889 210.68277
## 1192 1192 -76.40792 3.675537  18.28138
## 1193 1193 -76.07769 4.590867  27.90362
## 1194 1194 -77.05730 3.507098  62.62321
## 1195 1195 -76.17521 4.624111  42.35302
## 1196 1196 -76.39019 3.675537  18.66223
## 1197 1197 -75.97796 3.212331  55.10935
## 1198 1198 -76.25056 4.123228  21.86150
## 1199 1199 -76.57193 3.688834  30.34919
## 1200 1200 -76.18851 3.746458  38.77561
## 1201 1201 -76.80242 3.161356  54.57310
## 1202 1202 -76.62290 3.374120  40.09403
## 1203 1203 -76.51209 5.023044 222.46980
## 1204 1204 -75.78957 3.287685  43.66979
## 1205 1205 -76.54755 3.981385  66.31299
## 1206 1206 -76.61847 4.934393 200.13972
## 1207 1207 -76.95313 4.566488 195.63614
## 1208 1208 -76.98416 4.466754 218.04549
## 1209 1209 -76.30819 4.087768  20.68803
## 1210 1210 -76.59631 4.072254  53.50779
## 1211 1211 -76.02893 4.994233  47.80617
## 1212 1212 -76.71377 3.134760  34.79008
## 1213 1213 -76.90437 4.918879 217.45641
## 1214 1214 -76.18851 4.214096  24.50884
## 1215 1215 -76.28159 4.253990  34.38387
## 1216 1216 -76.58744 3.817380  34.45886
## 1217 1217 -76.35030 3.214547  22.04325
## 1218 1218 -76.40570 3.620129  19.18069
## 1219 1219 -76.68939 3.241143  49.55317
## 1220 1220 -77.43628 3.221196 136.27231
## 1221 1221 -76.27051 3.748674  19.35079
## 1222 1222 -76.32370 3.442826  19.49164
## 1223 1223 -76.45668 4.825794  65.89890
## 1224 1224 -76.67609 4.216313 196.98195
## 1225 1225 -77.30552 4.063388 168.64348
## 1226 1226 -75.91147 3.996899  57.49451
## 1227 1227 -76.29932 4.584218  37.48487
## 1228 1228 -76.66279 3.679969  31.24653
## 1229 1229 -76.78469 4.695033 151.59088
## 1230 1230 -76.38576 4.854606  22.36273
## 1231 1231 -76.19737 4.329344  37.53487
## 1232 1232 -76.27938 4.147608  18.73013
## 1233 1233 -76.91767 4.300532 179.89438
## 1234 1234 -76.91545 4.349291 174.68854
## 1235 1235 -76.30597 3.196817  23.68848
## 1236 1236 -77.07281 4.278369 188.57341
## 1237 1237 -77.29887 4.661788 184.62376
## 1238 1238 -76.91988 4.885634 220.62897
## 1239 1239 -76.58301 4.972070 178.75456
## 1240 1240 -76.20845 4.621895  41.32000
## 1241 1241 -76.97529 3.230061  45.54390
## 1242 1242 -76.36803 4.107714  41.27479
## 1243 1243 -76.01785 3.462772  59.55828
## 1244 1244 -76.43230 4.114363  40.83821
## 1245 1245 -76.20402 4.974286  80.22611
## 1246 1246 -75.85606 3.719863  61.77678
## 1247 1247 -76.01342 3.662239  72.83108
## 1248 1248 -76.14418 4.253990  22.35301
## 1249 1249 -77.08611 3.230061 188.64111
## 1250 1250 -76.61847 4.544325 195.32578
## 1251 1251 -76.78026 4.657356 200.06369
## 1252 1252 -76.59631 3.839542  36.48299
## 1253 1253 -75.74968 4.433510  26.30223
## 1254 1254 -76.94426 3.148058  38.56966
## 1255 1255 -76.46111 3.759756  28.65639
## 1256 1256 -76.99967 4.302748 169.90028
## 1257 1257 -76.92653 5.016396 239.78157
## 1258 1258 -76.05996 3.405148  47.20631
## 1259 1259 -76.67609 3.263306  54.54920
## 1260 1260 -77.26341 3.546991 128.44702
## 1261 1261 -76.91545 3.673320  53.99923
## 1262 1262 -76.25056 4.579785  61.71199
## 1263 1263 -75.89596 4.803631  27.60587
## 1264 1264 -75.91590 4.765954  23.40177
## 1265 1265 -76.54090 4.856822 110.60666
## 1266 1266 -76.50544 4.901148 111.54482
## 1267 1267 -76.95978 4.047874 171.90773
## 1268 1268 -75.85385 4.167554  60.33579
## 1269 1269 -76.42343 4.604165  60.84105
## 1270 1270 -76.11537 4.621895  43.07875
## 1271 1271 -76.72707 4.344858 199.12216
## 1272 1272 -76.05110 4.349291  20.95553
## 1273 1273 -77.45844 4.205231 180.08661
## 1274 1274 -76.91102 3.892734 131.38470
## 1275 1275 -76.32592 4.395833  34.67044
## 1276 1276 -76.04223 3.702132  72.14738
## 1277 1277 -76.56749 4.843525  80.34294
## 1278 1278 -76.56084 4.167554  72.31104
## 1279 1279 -76.76696 4.783685 183.09410
## 1280 1280 -76.82458 3.593534  22.30227
## 1281 1281 -76.66723 3.320929  61.88396
## 1282 1282 -76.97308 4.748224 184.25020
## 1283 1283 -77.29222 4.338209 158.70892
## 1284 1284 -76.98416 3.580236 141.25380
## 1285 1285 -76.49879 3.210114  21.17199
## 1286 1286 -76.45890 5.003098 195.95160
## 1287 1287 -76.35695 3.912680  22.03138
## 1288 1288 -75.89374 3.553640  62.70741
## 1289 1289 -76.28824 3.655590  22.66366
## 1290 1290 -76.13753 3.626778  51.56388
## 1291 1291 -76.19294 3.773054  48.60798
## 1292 1292 -76.43895 4.841308  25.52040
## 1293 1293 -77.15703 3.420663  86.63546
## 1294 1294 -76.11980 4.608597  38.98667
## 1295 1295 -76.15526 4.007981  32.58981
## 1296 1296 -76.01342 3.850624  73.57230
## 1297 1297 -76.39684 4.894499  68.59007
## 1298 1298 -76.99967 4.843525 196.50923
## 1299 1299 -75.94693 3.513747  63.16513
## 1300 1300 -77.07503 4.542108 167.10938
## 1301 1301 -77.10384 3.449474  47.76582
## 1302 1302 -76.34365 4.096633  33.07373
## 1303 1303 -75.84498 4.799199  32.87791
## 1304 1304 -76.84675 3.156923  40.72119
## 1305 1305 -77.26563 4.475619 175.54292
## 1306 1306 -75.91812 4.847957  25.25528
## 1307 1307 -75.92698 4.677302  28.28791
## 1308 1308 -76.27716 3.203466  23.00799
## 1309 1309 -76.48549 4.998665 199.12195
## 1310 1310 -75.98018 3.746458  61.74648
## 1311 1311 -75.95580 3.812947  58.52708
## 1312 1312 -76.86448 3.957006 168.79216
## 1313 1313 -76.34143 3.655590  17.37762
## 1314 1314 -77.31882 3.438393 106.81321
## 1315 1315 -76.13532 4.116579  26.32303
## 1316 1316 -75.91147 4.382535  25.16238
## 1317 1317 -76.72042 3.243359  58.81072
## 1318 1318 -77.01075 3.852840 102.90450
## 1319 1319 -76.46776 3.573587  19.76447
## 1320 1320 -76.87556 4.003548 173.16190
## 1321 1321 -76.15083 4.253990  20.60390
## 1322 1322 -76.02893 4.635193  16.95353
## 1323 1323 -77.34320 4.125445 130.68742
## 1324 1324 -77.27892 4.462322 155.69910
## 1325 1325 -76.40349 4.754873 103.57730
## 1326 1326 -76.16634 3.999116  27.72122
## 1327 1327 -75.79844 4.200799  41.04760
## 1328 1328 -76.69604 4.701682 204.77296
## 1329 1329 -76.40792 3.617913  18.79422
## 1330 1330 -76.21067 3.626778  22.80961
## 1331 1331 -77.19027 3.387418 156.62981
## 1332 1332 -76.73815 3.637860  37.94324
## 1333 1333 -75.94471 3.906031  64.14788
## 1334 1334 -76.48771 3.753107  29.64447
## 1335 1335 -76.01564 3.549208  57.90070
## 1336 1336 -76.03780 4.555406  26.23106
## 1337 1337 -75.90925 3.846191  66.44664
## 1338 1338 -76.29711 3.551424  22.10792
## 1339 1339 -77.05951 4.480052 174.80692
## 1340 1340 -76.37246 4.499999  30.02519
## 1341 1341 -76.08434 3.863922  49.43439
## 1342 1342 -75.88044 4.413563  29.98243
## 1343 1343 -76.42343 4.225178  57.68863
## 1344 1344 -76.26164 4.974286  83.92479
## 1345 1345 -75.93585 3.287685  54.61699
## 1346 1346 -75.72309 4.395833  31.85647
## 1347 1347 -76.39906 4.859039  27.72733
## 1348 1348 -76.96643 4.655139 217.88545
## 1349 1349 -75.90039 4.039009  58.00390
## 1350 1350 -76.86226 3.152491  44.62848
## 1351 1351 -76.44116 3.307631  21.07810
## 1352 1352 -76.19294 4.267288  25.11055
## 1353 1353 -76.13753 4.546541  57.55828
## 1354 1354 -75.98461 4.703898  28.61934
## 1355 1355 -77.38309 4.043442 105.93793
## 1356 1356 -77.19914 3.269954 178.75732
## 1357 1357 -75.74968 4.814713  33.35081
## 1358 1358 -77.24125 4.808064 161.54396
## 1359 1359 -77.23238 4.661788 168.60576
## 1360 1360 -77.01519 5.011963 195.74428
## 1361 1361 -75.92034 3.518180  71.81613
## 1362 1362 -75.93142 4.171987  48.06628
## 1363 1363 -76.63620 4.595299 181.63373
## 1364 1364 -76.43452 4.289451  64.31976
## 1365 1365 -77.12378 4.878985 176.35785
## 1366 1366 -76.87556 3.500449  33.02301
## 1367 1367 -75.74082 4.030144  74.53889
## 1368 1368 -76.44116 4.688384  57.13387
## 1369 1369 -76.85118 3.693267  45.09361
## 1370 1370 -75.74968 3.207898  65.40110
## 1371 1371 -76.68052 3.203466  40.39384
## 1372 1372 -75.94471 4.309397  31.10392
## 1373 1373 -76.43230 3.529261  15.13088
## 1374 1374 -76.37024 4.203015  39.19946
## 1375 1375 -77.03956 4.154257 186.33971
## 1376 1376 -77.11492 4.296099 140.88867
## 1377 1377 -76.70934 4.032360 197.05626
## 1378 1378 -76.16191 4.519945  54.77823
## 1379 1379 -76.97751 4.734926 230.00410
## 1380 1380 -76.77139 3.999116 181.50101
## 1381 1381 -75.81617 3.549208  59.83074
## 1382 1382 -77.21908 4.375886 166.92737
## 1383 1383 -76.21732 5.005314  72.56750
## 1384 1384 -76.25278 4.726061  71.48629
## 1385 1385 -77.20800 3.595750  86.28785
## 1386 1386 -76.67609 4.577569 182.50964
## 1387 1387 -76.62290 3.589101  28.02766
## 1388 1388 -76.50765 3.309848  22.32494
## 1389 1389 -76.69604 4.391400 198.23842
## 1390 1390 -76.71820 4.203015 204.48589
## 1391 1391 -76.82902 3.174654  50.74962
## 1392 1392 -76.43895 4.267288  77.52151
## 1393 1393 -76.23062 3.830677  31.69164
## 1394 1394 -76.82237 4.021279 186.51169
## 1395 1395 -76.87113 3.327578  49.93665
## 1396 1396 -77.27449 3.223412 165.09781
## 1397 1397 -76.97308 4.980935 211.06677
## 1398 1398 -76.60739 4.821362 217.62454
## 1399 1399 -75.90925 4.655139  23.08732
## 1400 1400 -77.24790 3.130328 197.70885
## 1401 1401 -76.11315 3.230061  59.28955
## 1402 1402 -77.39417 3.347525 126.80534
## 1403 1403 -77.19249 4.599732 185.15500
## 1404 1404 -75.76519 3.218980  70.17084
## 1405 1405 -76.54755 3.584668  43.05400
## 1406 1406 -76.33700 5.003098  75.40246
## 1407 1407 -76.27716 4.741575  51.96560
## 1408 1408 -75.99347 3.699916  71.68795
## 1409 1409 -76.66944 3.243359  39.82531
## 1410 1410 -77.25011 4.460105 164.61021
## 1411 1411 -76.32148 3.181303  20.05318
## 1412 1412 -76.59409 3.768621  30.31105
## 1413 1413 -75.77849 3.748674  50.98845
## 1414 1414 -77.37644 3.278820 148.25067
## 1415 1415 -77.28779 4.692816 195.59697
## 1416 1416 -75.99126 4.457889  23.22446
## 1417 1417 -76.11759 4.522162  29.58361
## 1418 1418 -75.86050 4.380319  27.31285
## 1419 1419 -75.97131 4.644058  20.98346
## 1420 1420 -76.37689 4.921095  93.28304
## 1421 1421 -76.60739 4.690600 208.23573
## 1422 1422 -75.80509 3.925978  52.74604
## 1423 1423 -77.23238 4.746008 148.59587
## 1424 1424 -77.07724 3.440609  48.19263
## 1425 1425 -76.51874 5.027477 217.13608
## 1426 1426 -76.65171 3.846191  65.11930
## 1427 1427 -76.63177 3.970304  50.87437
## 1428 1428 -76.77139 3.422879  34.07169
## 1429 1429 -76.19072 4.136526  27.01420
## 1430 1430 -76.12423 3.267738  59.33893
## 1431 1431 -76.19737 4.349291  29.35242
## 1432 1432 -76.19072 3.491584  32.86789
## 1433 1433 -76.98637 4.302748 168.55278
## 1434 1434 -77.44958 3.238926 103.98506
## 1435 1435 -76.23283 3.469421  22.61671
## 1436 1436 -76.60960 4.311614 191.92218
## 1437 1437 -75.76963 4.087768  80.41204
## 1438 1438 -77.24346 3.903815 152.42755
## 1439 1439 -75.88487 3.496017  64.35846
## 1440 1440 -77.34541 3.296550 150.53879
## 1441 1441 -75.86050 4.007981  47.88081
## 1442 1442 -77.10384 4.101065 165.74489
## 1443 1443 -76.52095 4.677302  84.26266
## 1444 1444 -76.54090 3.152491  25.94873
## 1445 1445 -76.83567 3.972520 176.99759
## 1446 1446 -76.60517 3.759756  24.95078
## 1447 1447 -76.61404 3.493800  34.03888
## 1448 1448 -77.15260 4.615246 164.75569
## 1449 1449 -77.15260 3.507098 168.77275
## 1450 1450 -76.96421 3.560289  82.51413
## 1451 1451 -77.04400 4.799199 205.90065
## 1452 1452 -77.36979 4.061172 141.84959
## 1453 1453 -76.05775 4.409131  18.45739
## 1454 1454 -76.01120 3.473854  77.58095
## 1455 1455 -77.06173 3.932627 130.72813
## 1456 1456 -75.98904 4.087768  42.30409
## 1457 1457 -76.43673 4.003548  35.29539
## 1458 1458 -75.92034 3.230061  59.61453
## 1459 1459 -76.11094 3.154707  48.00295
## 1460 1460 -76.78912 3.553640  28.09448
## 1461 1461 -76.15305 3.097083  52.88100
## 1462 1462 -77.02405 4.781468 204.65018
## 1463 1463 -77.32325 3.243359 139.53879
## 1464 1464 -76.98859 4.967637 190.76273
## 1465 1465 -76.91324 3.269954  34.83152
## 1466 1466 -76.03337 4.333776  25.27912
## 1467 1467 -77.03956 3.531477 107.07806
## 1468 1468 -76.73372 4.415779 171.05795
## 1469 1469 -76.97529 4.801415 210.72536
## 1470 1470 -76.91545 4.196366 160.93129
## 1471 1471 -76.76696 4.965421 210.22772
## 1472 1472 -76.82458 4.584218 203.17715
## 1473 1473 -75.96466 4.819145  25.99167
## 1474 1474 -77.33433 4.978719 204.14644
## 1475 1475 -76.87999 3.141409  44.79200
## 1476 1476 -76.84010 3.267738  41.47965
## 1477 1477 -77.00854 3.241143  84.91908
## 1478 1478 -76.41457 3.515963  16.55029
## 1479 1479 -75.86050 3.976953  52.25997
## 1480 1480 -77.11935 3.256657  59.47843
## 1481 1481 -76.45225 3.232277  26.26767
## 1482 1482 -76.22397 3.553640  19.52790
## 1483 1483 -76.62290 3.553640  30.62351
## 1484 1484 -76.83567 3.336443  61.95407
## 1485 1485 -76.93318 4.203015 170.46960
## 1486 1486 -76.45668 4.546541  64.10278
## 1487 1487 -76.04888 3.950357  38.74433
## 1488 1488 -75.80287 4.010197  52.47979
## 1489 1489 -76.02007 4.759305  27.93525
## 1490 1490 -76.70490 4.945474 192.56589
## 1491 1491 -76.00899 4.606381  32.73178
## 1492 1492 -77.04400 4.076686 145.32152
## 1493 1493 -75.74746 4.863471  34.56350
## 1494 1494 -76.13532 4.688384  37.08624
## 1495 1495 -76.03780 4.754873  35.93631
## 1496 1496 -77.23238 3.185735 168.94362
## 1497 1497 -76.16856 3.356390  45.61197
## 1498 1498 -76.73815 4.874553 179.77615
## 1499 1499 -76.56971 3.555857  43.01748
## 1500 1500 -75.94693 4.222962  34.76273
## 1501 1501 -75.72752 4.187501  49.26937
## 1502 1502 -75.75633 4.003548  70.49745
## 1503 1503 -76.41457 3.329794  22.71875
## 1504 1504 -77.24790 4.752656 145.12427
## 1505 1505 -76.11315 3.892734  53.11564
## 1506 1506 -77.23903 5.031910 202.33566
## 1507 1507 -76.32592 4.546541  31.84894
## 1508 1508 -77.18584 4.783685 193.45825
## 1509 1509 -76.14861 5.029693  93.40835
## 1510 1510 -76.87556 3.283252  45.45449
## 1511 1511 -76.03337 4.065605  53.78588
## 1512 1512 -75.82282 4.477836  26.95209
## 1513 1513 -75.79622 3.996899  51.64433
## 1514 1514 -77.02405 4.067821 164.50641
## 1515 1515 -76.51430 3.272171  21.40075
## 1516 1516 -76.84010 3.919329 177.66562
## 1517 1517 -76.95756 4.777036 222.17554
## 1518 1518 -75.85163 3.859489  65.80766
## 1519 1519 -76.43008 4.045658  41.30980
## 1520 1520 -76.20402 3.194600  31.28476
## 1521 1521 -76.93097 4.147608 204.61937
## 1522 1522 -76.85783 4.754873 102.90000
## 1523 1523 -75.83390 4.763738  27.25376
## 1524 1524 -76.02007 3.314280  67.59564
## 1525 1525 -76.96864 4.845741 234.62822
## 1526 1526 -76.15970 3.369688  53.66520
## 1527 1527 -77.24568 4.739359 156.41846
## 1528 1528 -76.11759 4.267288  22.42252
## 1529 1529 -76.13310 4.189717  23.48024
## 1530 1530 -77.02848 4.475619 161.10374
## 1531 1531 -76.07104 4.938825  82.20901
## 1532 1532 -76.58966 3.963655  79.44055
## 1533 1533 -76.23283 4.402482  52.33321
## 1534 1534 -76.36581 3.693267  19.68710
## 1535 1535 -76.81794 3.850624  62.55151
## 1536 1536 -76.15970 5.003098  69.30100
## 1537 1537 -76.87334 3.143626  39.40308
## 1538 1538 -75.96688 3.653374  59.97458
## 1539 1539 -77.31660 4.890067 196.80002
## 1540 1540 -75.77628 4.114363  63.13062
## 1541 1541 -76.36138 4.539892  46.61900
## 1542 1542 -76.47219 4.129877  49.38313
## 1543 1543 -76.40349 3.648941  16.57396
## 1544 1544 -76.24170 4.885634  53.76058
## 1545 1545 -75.84498 4.123228  58.17385
## 1546 1546 -76.64728 4.121012 180.91684
## 1547 1547 -75.75190 3.199033  78.22055
## 1548 1548 -77.13265 3.972520 153.06519
## 1549 1549 -76.90880 3.735377  46.12214
## 1550 1550 -76.53425 4.537676  72.54921
## 1551 1551 -76.51430 3.910464  36.68642
## 1552 1552 -76.04666 3.850624  66.35525
## 1553 1553 -76.41679 3.906031  28.15901
## 1554 1554 -77.19471 3.303199 155.24179
## 1555 1555 -76.13088 3.704348  70.89468
## 1556 1556 -76.78026 4.843525 162.54608
## 1557 1557 -76.56306 4.573136 213.06963
## 1558 1558 -77.02183 3.626778 129.73381
## 1559 1559 -76.75366 4.440159 207.62122
## 1560 1560 -76.25500 4.163122  21.26369
## 1561 1561 -76.46333 4.344858  35.33222
## 1562 1562 -76.24170 3.445042  20.39161
## 1563 1563 -76.52095 3.214547  19.60646
## 1564 1564 -75.80952 4.655139  25.04122
## 1565 1565 -75.85385 4.351507  27.10251
## 1566 1566 -76.00234 4.754873  29.34813
## 1567 1567 -75.85828 3.218980  71.85995
## 1568 1568 -76.27273 4.280585  33.94470
## 1569 1569 -76.60517 4.679519 194.18248
## 1570 1570 -76.92210 4.271720 169.91577
## 1571 1571 -77.00632 3.527045  42.12113
## 1572 1572 -77.10162 3.515963 182.27466
## 1573 1573 -76.14418 3.287685  56.64009
## 1574 1574 -77.34985 4.298316 124.57542
## 1575 1575 -75.88487 3.954790  61.64587
## 1576 1576 -76.79356 3.688834  36.76326
## 1577 1577 -77.26563 4.912230 173.76326
## 1578 1578 -76.77139 4.661788 202.51906
## 1579 1579 -76.54533 3.190168  25.14629
## 1580 1580 -77.38974 4.005765 125.71940
## 1581 1581 -76.01564 3.276603  63.32016
## 1582 1582 -76.58301 4.010197  48.55687
## 1583 1583 -76.19959 3.988034  22.39956
## 1584 1584 -76.17299 3.473854  48.42622
## 1585 1585 -75.72973 4.548757  24.56484
## 1586 1586 -76.82680 4.956556 228.94135
## 1587 1587 -77.14151 3.334227  68.32051
## 1588 1588 -75.95801 4.342642  30.78073
## 1589 1589 -75.90261 4.070037  62.19358
## 1590 1590 -76.22618 3.267738  19.78212
## 1591 1591 -76.67831 4.065605 208.98021
## 1592 1592 -76.40792 4.278369  69.36736
## 1593 1593 -77.05286 3.819596 123.59300
## 1594 1594 -76.18629 4.287234  24.11238
## 1595 1595 -77.42742 3.258873  96.68759
## 1596 1596 -77.45180 4.132094 165.31531
## 1597 1597 -76.02672 4.584218  30.63236
## 1598 1598 -75.84498 4.757089  41.42761
## 1599 1599 -77.18362 4.996449 187.72302
## 1600 1600 -76.09321 3.165789  58.14753
## 1601 1601 -77.52272 4.138742  96.84297
## 1602 1602 -77.04621 3.128112  70.73117
## 1603 1603 -76.12423 4.163122  25.73600
## 1604 1604 -76.99524 3.566938 146.92738
## 1605 1605 -76.26164 4.666221  52.96614
## 1606 1606 -77.13487 4.726061 205.13492
## 1607 1607 -76.07548 3.447258  61.22968
## 1608 1608 -76.47663 4.836876 225.53200
## 1609 1609 -77.45844 3.247791 113.65842
## 1610 1610 -76.78247 3.407365  36.76254
## 1611 1611 -77.06838 3.487151  52.24067
## 1612 1612 -76.40570 4.741575  83.44025
## 1613 1613 -76.18407 4.278369  25.24920
## 1614 1614 -75.90482 3.192384  50.28202
## 1615 1615 -76.25500 3.287685  17.49773
## 1616 1616 -77.17919 4.562055 159.42708
## 1617 1617 -77.15703 3.119246 213.60333
## 1618 1618 -76.23948 4.737142  36.81647
## 1619 1619 -76.18186 4.630760  48.59246
## 1620 1620 -75.75411 3.941492  55.39495
## 1621 1621 -77.22573 4.074470  72.61803
## 1622 1622 -76.08434 4.803631  40.80395
## 1623 1623 -76.72928 3.487151  52.40709
## 1624 1624 -75.85385 3.482719  44.53431
## 1625 1625 -76.98637 4.728277 204.14529
## 1626 1626 -76.68496 3.303199  66.95326
## 1627 1627 -75.84498 3.558073  70.94228
## 1628 1628 -77.00854 4.471187 136.67799
## 1629 1629 -75.93142 4.160905  52.76233
## 1630 1630 -76.50322 5.023044 222.96460
## 1631 1631 -75.91812 3.112597  60.66090
## 1632 1632 -76.44781 4.167554  75.69273
## 1633 1633 -76.39906 3.779702  23.35841
## 1634 1634 -77.17476 4.384751 159.92970
## 1635 1635 -76.37246 4.360372  41.25663
## 1636 1636 -76.87556 3.161356  35.89322
## 1637 1637 -77.25676 4.597516 121.94578
## 1638 1638 -76.72707 3.232277  51.67800
## 1639 1639 -76.23062 3.877220  36.46235
## 1640 1640 -76.05996 4.462322  18.87939
## 1641 1641 -76.05553 3.374120  64.07526
## 1642 1642 -76.95978 3.376337  62.19299
## 1643 1643 -77.06394 3.695483 118.89298
## 1644 1644 -76.62512 3.445042  48.01538
## 1645 1645 -75.98018 3.892734  59.00153
## 1646 1646 -76.90659 3.256657  41.42551
## 1647 1647 -76.90659 3.110381  28.05548
## 1648 1648 -76.62955 3.637860  29.79593
## 1649 1649 -76.78026 4.801415 194.92262
## 1650 1650 -76.39684 4.630760 105.50174
## 1651 1651 -75.93807 4.353723  27.65042
## 1652 1652 -76.80242 4.710547 172.94336
## 1653 1653 -75.80066 4.457889  26.16889
## 1654 1654 -76.20402 4.056739  20.64127
## 1655 1655 -76.97086 3.294334  42.39005
## 1656 1656 -76.74923 4.712763 191.96114
## 1657 1657 -76.46998 3.983602  37.83456
## 1658 1658 -76.52760 5.005314 180.32910
## 1659 1659 -75.78957 3.739809  64.77818
## 1660 1660 -77.05065 3.668888 150.77299
## 1661 1661 -76.86669 4.748224 205.09778
## 1662 1662 -76.82680 4.938825 224.65997
## 1663 1663 -77.35871 5.011963 186.55991
## 1664 1664 -77.46731 3.103732 143.26465
## 1665 1665 -76.21289 3.218980  26.83351
## 1666 1666 -77.02848 4.752656 232.96480
## 1667 1667 -76.95756 4.045658 170.44273
## 1668 1668 -75.81174 3.941492  60.65985
## 1669 1669 -77.13930 3.227845 198.58286
## 1670 1670 -76.44560 3.236710  24.50496
## 1671 1671 -77.31660 3.132544 164.16528
## 1672 1672 -76.15748 3.092651  50.32657
## 1673 1673 -76.87999 4.976502 223.29901
## 1674 1674 -77.13708 3.092651  68.05831
## 1675 1675 -76.90659 4.544325 202.57526
## 1676 1676 -76.26386 3.351957  19.04411
## 1677 1677 -77.05951 4.050091 116.58587
## 1678 1678 -76.20845 4.402482  49.76635
## 1679 1679 -76.59409 4.606381 197.12260
## 1680 1680 -76.70269 4.657356 180.96986
## 1681 1681 -76.08877 4.125445  28.92029
## 1682 1682 -76.06661 3.394067  59.23813
## 1683 1683 -75.98461 3.644508  64.05120
## 1684 1684 -76.76918 3.693267  54.45438
## 1685 1685 -76.52095 3.562505  33.27818
## 1686 1686 -76.64063 4.994233 196.36789
## 1687 1687 -75.90039 5.040775  39.98794
## 1688 1688 -76.11759 4.901148  67.35924
## 1689 1689 -76.49879 3.365255  19.42959
## 1690 1690 -77.00410 3.387418  30.71922
## 1691 1691 -76.32592 4.610813  61.38544
## 1692 1692 -76.12423 4.590867  48.26079
## 1693 1693 -76.36581 4.785901  75.51566
## 1694 1694 -76.98637 3.928194 156.87357
## 1695 1695 -77.07503 4.763738 197.89328
## 1696 1696 -77.45180 3.125895 145.66885
## 1697 1697 -77.20135 4.169771  92.59660
## 1698 1698 -77.45180 4.191934 180.04161
## 1699 1699 -76.80464 3.702132  44.86449
## 1700 1700 -75.96466 4.145391  43.44236
## 1701 1701 -76.52760 3.218980  21.00341
## 1702 1702 -77.35428 3.305415 145.82671
## 1703 1703 -76.94426 4.276153 175.35638
## 1704 1704 -77.16368 4.706114 172.73512
## 1705 1705 -76.39684 3.491584  22.24933
## 1706 1706 -76.91324 3.533694  48.91808
## 1707 1707 -76.73593 3.657806  36.03261
## 1708 1708 -76.11094 4.515513  30.28234
## 1709 1709 -76.59409 4.300532 190.99368
## 1710 1710 -76.43895 4.134310  54.01231
## 1711 1711 -76.04445 3.777486  83.01643
## 1712 1712 -76.87113 3.850624 104.59799
## 1713 1713 -77.19914 3.571371 139.58018
## 1714 1714 -77.25898 4.531027 135.79312
## 1715 1715 -76.92653 3.595750  67.19160
## 1716 1716 -75.83833 3.267738  52.41676
## 1717 1717 -76.24613 4.209664  28.01715
## 1718 1718 -77.51607 3.094867 134.11867
## 1719 1719 -76.32148 4.473403  36.31524
## 1720 1720 -76.00899 4.586434  27.22951
## 1721 1721 -76.93983 4.943258 208.46503
## 1722 1722 -76.50322 4.655139 118.49464
## 1723 1723 -76.32148 3.693267  23.81113
## 1724 1724 -76.79577 5.042991 203.87561
## 1725 1725 -77.32768 4.081119 151.12668
## 1726 1726 -77.09940 4.701682 189.95255
## 1727 1727 -76.75145 3.110381  53.92775
## 1728 1728 -75.82503 3.183519  57.68266
## 1729 1729 -77.39417 4.258422 137.59312
## 1730 1730 -76.29932 4.442375  57.99891
## 1731 1731 -76.54090 4.601948 222.36685
## 1732 1732 -77.26119 3.533694 140.17128
## 1733 1733 -76.92875 3.972520 131.85774
## 1734 1734 -76.90437 4.533243 203.07596
## 1735 1735 -76.50100 4.788117  70.06249
## 1736 1736 -76.90437 5.007530 204.15898
## 1737 1737 -76.72042 3.622345  31.54759
## 1738 1738 -76.42787 3.473854  16.07617
## 1739 1739 -76.54090 3.917113  49.69585
## 1740 1740 -77.08389 4.511080 172.03865
## 1741 1741 -75.73417 5.025261  45.46551
## 1742 1742 -76.35695 4.513296  30.21714
## 1743 1743 -76.83567 4.796982 227.89445
## 1744 1744 -76.91324 3.883868 125.53410
## 1745 1745 -76.46998 4.960988 212.85262
## 1746 1746 -77.22130 4.901148 226.45757
## 1747 1747 -76.64063 4.094417  63.89802
## 1748 1748 -76.39684 4.406914  47.48383

Ahora generemos las muestras

m <- leaflet() %>%
  addTiles() %>%  
  addMarkers(lng=sitios$longit,lat=sitios$latit, popup=sitios$soc, clusterOptions = markerClusterOptions())
m  

8 Guardar las muestras

La función sf::st_write() permite exportar un objeto espacial de R (como un conjunto de puntos, polígonos o líneas) a un archivo geoespacial estándar. En este caso, se utiliza para guardar las muestras de suelo generadas en formato GeoPackage (.gpkg), que es un tipo de archivo moderno, compacto y compatible con la mayoría de los programas SIG (como QGIS o ArcGIS).

Cambiamos la ruta y nombre para que se enlace a tus directorios, tambien el nombre de tu departamento

sf::st_write(nmuestras, "ValleDelCaucaDANE.gpkg", driver = "GPKG",
             append=FALSE)
## Deleting layer `ValleDelCaucaDANE' using driver `GPKG'
## Writing layer `ValleDelCaucaDANE' to data source 
##   `ValleDelCaucaDANE.gpkg' using driver `GPKG'
## Writing 1748 features with 1 fields and geometry type Point.

9 Referencia

Lizarazo, I. (2025). Cómo descargar datos de suelos desde SoilGrids. Disponible en: https://rpubs.com/ials2un/downloadSoilGrids

sessionInfo()
## R version 4.5.1 (2025-06-13 ucrt)
## Platform: x86_64-w64-mingw32/x64
## Running under: Windows 11 x64 (build 26200)
## 
## Matrix products: default
##   LAPACK version 3.12.1
## 
## locale:
## [1] LC_COLLATE=Spanish_Colombia.utf8  LC_CTYPE=Spanish_Colombia.utf8   
## [3] LC_MONETARY=Spanish_Colombia.utf8 LC_NUMERIC=C                     
## [5] LC_TIME=Spanish_Colombia.utf8    
## 
## time zone: America/Bogota
## tzcode source: internal
## 
## attached base packages:
## [1] stats     graphics  grDevices utils     datasets  methods   base     
## 
## other attached packages:
##  [1] exactextractr_0.10.0 dplyr_1.1.4          XML_3.99-0.19       
##  [4] gdalUtilities_1.2.5  RColorBrewer_1.1-3   leaflet_2.2.3       
##  [7] sf_1.0-21            tidyterra_0.7.2      ggplot2_4.0.0       
## [10] terra_1.8-80        
## 
## loaded via a namespace (and not attached):
##  [1] s2_1.1.9                sass_0.4.10             generics_0.1.4         
##  [4] tidyr_1.3.1             class_7.3-23            KernSmooth_2.23-26     
##  [7] lattice_0.22-7          digest_0.6.37           magrittr_2.0.4         
## [10] evaluate_1.0.5          grid_4.5.1              fastmap_1.2.0          
## [13] jsonlite_2.0.0          e1071_1.7-16            DBI_1.2.3              
## [16] purrr_1.1.0             crosstalk_1.2.2         scales_1.4.0           
## [19] codetools_0.2-20        jquerylib_0.1.4         cli_3.6.5              
## [22] rlang_1.1.6             units_1.0-0             withr_3.0.2            
## [25] cachem_1.1.0            yaml_2.3.10             raster_3.6-32          
## [28] tools_4.5.1             vctrs_0.6.5             R6_2.6.1               
## [31] png_0.1-8               proxy_0.4-27            lifecycle_1.0.4        
## [34] classInt_0.4-11         leaflet.providers_2.0.0 htmlwidgets_1.6.4      
## [37] pkgconfig_2.0.3         pillar_1.11.1           bslib_0.9.0            
## [40] gtable_0.3.6            glue_1.8.0              Rcpp_1.1.0             
## [43] xfun_0.53               tibble_3.3.0            tidyselect_1.2.1       
## [46] rstudioapi_0.17.1       knitr_1.50              farver_2.1.2           
## [49] htmltools_0.5.8.1       rmarkdown_2.30          wk_0.9.4               
## [52] compiler_4.5.1          S7_0.2.0                sp_2.2-0