Laporan Praktikum 1
Tugas STA553 - Analisis Statistika Spasial
Klik disini untuk ke halaman rpubs.
setwd(“D:\Kuliah S2 IPB\Bahan Kuliah\Semester 2 SSD 2020\STA533 Spasial\PRAKTIKUM\R”)
Pengenalan Struktur R untuk Data Spasial (Responsi Pertemuan 1)
Jenis Data Spasial
Data spasial terdiri dari data vector dan data raster. Contoh data vektor adalah data peta administrasi. Data vektor terdiri dari point, line, polygon. Contoh data raster adalah data pada google eart. Data raster terdiri dari Rasterlayer dan Rasterstack.
Packages
Packages yang digunakan adalah sp,gstat rgdal, spData, readxl, raster, spdep
library(sp)
library(gstat)
library(rgdal) # membaca shapefile
library(spData) #data columbus
library(readxl) # membaca file excel
library(raster) # untuk menambahkan text pada peta
library(spdep) # pembobot data spasialData
Data dalam package R
Dengan memanfaatkan datasets yang ada di R pada package yang sesuai tema. Sebagai contoh untuk data spasial ini dapat menggunakan data yang berada pada package sp. Disini digunakan meuse datasets
ls() # melihat data set yang sedang dijalankan pada R kota## character(0)
data(meuse) # menggunakan data meuse
ls() # panggil list lagi untuk melihat berhasil atau tiDak## [1] "meuse"
Untuk melihat struktur data dapat menggunakan fungsi str diikuti oleh nama datasets nya.
str(meuse)## 'data.frame': 155 obs. of 14 variables:
## $ x : num 181072 181025 181165 181298 181307 ...
## $ y : num 333611 333558 333537 333484 333330 ...
## $ cadmium: num 11.7 8.6 6.5 2.6 2.8 3 3.2 2.8 2.4 1.6 ...
## $ copper : num 85 81 68 81 48 61 31 29 37 24 ...
## $ lead : num 299 277 199 116 117 137 132 150 133 80 ...
## $ zinc : num 1022 1141 640 257 269 ...
## $ elev : num 7.91 6.98 7.8 7.66 7.48 ...
## $ dist : num 0.00136 0.01222 0.10303 0.19009 0.27709 ...
## $ om : num 13.6 14 13 8 8.7 7.8 9.2 9.5 10.6 6.3 ...
## $ ffreq : Factor w/ 3 levels "1","2","3": 1 1 1 1 1 1 1 1 1 1 ...
## $ soil : Factor w/ 3 levels "1","2","3": 1 1 1 2 2 2 2 1 1 2 ...
## $ lime : Factor w/ 2 levels "0","1": 2 2 2 1 1 1 1 1 1 1 ...
## $ landuse: Factor w/ 15 levels "Aa","Ab","Ag",..: 4 4 4 11 4 11 4 2 2 15 ...
## $ dist.m : num 50 30 150 270 380 470 240 120 240 420 ...
Dapat terlihat bahwa data tersebut berbentuk data.frame terdiri dari 155 observasi dengan 14 peubah. Masing- masing variabel pun diberikan penjelasan jenis/tipe datanya. Untuk angka yang muncul adalah cuplikan data dari masing-masing peubah.
Untuk melihat deskripsi dari data dapat menggunakan fungsi help
help("meuse")This data set gives locations and topsoil heavy metal concentrations, along with a number of soil and landscape variables at the observation locations, collected in a flood plain of the river Meuse, near the village of Stein (NL). Heavy metal concentrations are from composite samples of an area of approximately 15 m x 15 m.
Jika akan dilakukan analisis dapat dilihat dari deksripsi setiap peubah ini.
Plot The Data
Points
coordinates(meuse) <- c("x","y")
plot(meuse)
title("points") Polygons
Kita menggunakan meuse.riv yang ada dalam package sp.
?meuse.riv## starting httpd help server ... done
The meuse.riv data consists of an outline of the Meuse river in the area a few kilometers around the meuse data set.The meuse.area polygon has an outline of meuse.grid.two-column data.frame containing 176 coordinates.x and y are in RDM, the Dutch topographical map coordinate system
data(meuse.riv)
meuse.1st <- list(Polygons(list(Polygon(meuse.riv)),"meuse.riv"))
meuse.sr <- SpatialPolygons(meuse.1st)
plot(meuse.sr, col = "blue")
title("polygons")Grid
Kita menggunakan meuse.grid yang ada dalam package sp.
?meuse.gridThe meuse.grid data frame has 3103 rows and 7 columns; a grid with 40 m x 40 m spacing that covers the Meuse study area. x and y are in RD New, the Dutch topographical map coordinate system. Roger Bivand projected this to UTM in the R-Grass interface package.
data(meuse.grid)
coordinates(meuse.grid) <- c("x", "y")
meuse.grid <- as(meuse.grid, "SpatialPixels")
image(meuse.grid, col = "blue")
title("grid")image(meuse.grid, col = "lightblue")
plot(meuse.sr, col = "blue", add = TRUE)
plot(meuse,add = TRUE) data raster
f <- system.file("external/test.grd", package="raster")
library(raster)
r <- raster(f)
plot(r)?rasterimage(meuse.grid, col = "lightblue")
plot(r, add=TRUE)
plot(meuse.sr, col = "blue", add = TRUE)
plot(meuse,add = TRUE)External Data Input
Selain menggunakan data yang berada di dalam package R, kita juga dapat memasukkan data dari luar package. Sebagai contoh, akan digunakan data pertumbuhan penduduk.
datapop <- read.csv('http://bit.ly/Popgrowth2000', header=T, sep=',')Untuk melihat dimensi dari data dapat menggunakan fungsi dim. Terlihat bahwa dimensi dari data tersebut adalah 293 observasi dan 5 variabel/peubah.
dim(datapop)## [1] 293 5
Untuk melihat struktur data dapat menggunakan fungsi str. Terlihat bahwa data pertumbuhan penduduk ini berbentuk data.frame terdiri dari 293 observasi dengan 5 peubah.
str(datapop)## 'data.frame': 293 obs. of 5 variables:
## $ City : chr "Abidjan" "Adana" "Addis Ababa" "Adelaide" ...
## $ Country : chr "Cote d'Ivoire" "Turkey" "Ethiopia" "Australia" ...
## $ Latitude : num 5.31 37 9.02 -34.93 23.04 ...
## $ Longitude : num -4.01 35.33 38.75 138.6 72.57 ...
## $ PopGrowth_2000: int 1929000 1041000 2424000 1092000 2954000 1582000 3339000 2562000 1135000 1147000 ...
Untuk melihat data pertumbuhan penduduk tersebut dalam bentuk tabel dapat menggunakan fungsi view. Akan memunculkan sebuah menu berisi tabel data tersebut.
View(datapop)Plot
Ada beberapa alternatif dalam R untuk membuat peta. Dapat menggunakan base plot atau menggunakan levelplot yang dapat diakses dengan fungsi spplot. Untuk membuat peta diperlukan shape file. File ini adalah digital vector dari peta tersebut, berisi beberapa file yaitu .shp, .shx, dan .dbf. Untuk membaca peta pada R menggunakan fungsi readOGR yang berada di library rgdal.
coordinates(datapop) <- c("Longitude", "Latitude")
plot(datapop)size<-datapop$PopGrowth_2000/sum(datapop$PopGrowth_2000)
plot(datapop,pch=20, col="steelblue", cex=size*100)Menambahkan Peta Dunia
Install package
library(rworldmap)## ### Welcome to rworldmap ###
## For a short introduction type : vignette('rworldmap')
data(package="rworldmap")
data(countriesCoarse,envir=environment(),package="rworldmap")Melihat struktur Data
str(countriesCoarse)## Formal class 'SpatialPolygonsDataFrame' [package "sp"] with 5 slots
## ..@ data :'data.frame': 243 obs. of 49 variables:
## .. ..$ ScaleRank : int [1:243] 1 1 1 1 1 1 1 3 1 1 ...
## .. ..$ LabelRank : int [1:243] 1 1 1 1 1 1 1 3 1 1 ...
## .. ..$ FeatureCla : Factor w/ 2 levels "Adm-0 country",..: 2 2 2 2 2 2 2 2 2 2 ...
## .. ..$ SOVEREIGNT : Factor w/ 202 levels "Afghanistan",..: 1 5 2 189 8 9 6 60 10 11 ...
## .. ..$ SOV_A3 : Factor w/ 202 levels "AFG","AGO","ALB",..: 1 2 3 5 6 7 8 61 10 11 ...
## .. ..$ ADM0_DIF : num [1:243] 0 0 0 0 0 0 0 1 0 0 ...
## .. ..$ LEVEL : num [1:243] 2 2 2 2 2 2 2 2 2 2 ...
## .. ..$ TYPE : Factor w/ 6 levels "Country","County",..: 6 6 6 6 6 6 5 3 1 6 ...
## .. ..$ ADMIN : Factor w/ 244 levels "Afghanistan",..: 1 7 3 228 11 12 9 76 15 16 ...
## .. ..$ ADM0_A3 : Factor w/ 244 levels "ABW","AFG","AGO",..: 2 3 5 8 9 10 12 14 16 17 ...
## .. ..$ GEOU_DIF : num [1:243] 0 0 0 0 0 0 0 0 0 0 ...
## .. ..$ GEOUNIT : Factor w/ 244 levels "Afghanistan",..: 1 7 3 229 11 12 9 76 15 16 ...
## .. ..$ GU_A3 : Factor w/ 244 levels "ABW","AFG","AGO",..: 2 3 5 8 9 10 12 14 16 17 ...
## .. ..$ SU_DIF : num [1:243] 0 0 0 0 0 0 0 0 0 0 ...
## .. ..$ SUBUNIT : Factor w/ 244 levels "Afghanistan",..: 1 7 3 229 11 12 9 76 15 16 ...
## .. ..$ SU_A3 : Factor w/ 244 levels "ABW","AFG","AGO",..: 2 3 5 8 9 10 12 14 16 17 ...
## .. ..$ NAME : Factor w/ 243 levels "Afghanistan",..: 1 7 3 229 11 12 9 75 15 16 ...
## .. ..$ ABBREV : Factor w/ 240 levels "A.C.Is.","Afg.",..: 2 8 4 222 11 12 9 74 15 14 ...
## .. ..$ POSTAL : Factor w/ 234 levels "A","AE","AF",..: 3 8 6 2 10 11 9 203 13 1 ...
## .. ..$ NAME_FORMA : Factor w/ 194 levels "Arab Republic of Egypt",..: 44 75 74 NA 2 76 NA 185 7 77 ...
## .. ..$ TERR_ : Factor w/ 13 levels "Assoc. with N.Z.",..: NA NA NA NA NA NA 10 9 NA NA ...
## .. ..$ NAME_SORT : Factor w/ 244 levels "Afghanistan",..: 1 7 3 229 11 12 9 78 15 16 ...
## .. ..$ MAP_COLOR : num [1:243] 7 1 6 3 13 10 0 11 7 4 ...
## .. ..$ POP_EST : num [1:243] 28400000 12799293 3639453 4798491 40913584 ...
## .. ..$ GDP_MD_EST : num [1:243] 22270 110300 21810 184300 573900 ...
## .. ..$ FIPS_10_ : Factor w/ 3 levels "-99","0","FG": 2 2 2 2 2 2 2 2 2 2 ...
## .. ..$ ISO_A2 : Factor w/ 236 levels "-99","AD","AE",..: 4 9 7 3 11 8 10 206 14 13 ...
## .. ..$ ISO_A3 : Factor w/ 244 levels "ABW","AFG","AGO",..: 2 3 6 8 9 10 13 14 16 17 ...
## .. ..$ ISO_N3 : num [1:243] 4 24 8 784 32 51 10 260 36 40 ...
## .. ..$ ISO3 : Factor w/ 244 levels "ABW","AFG","AGO",..: 2 3 6 8 9 10 13 14 16 17 ...
## .. ..$ LON : num [1:243] 66.1 17.5 20 54.2 -65.1 ...
## .. ..$ LAT : num [1:243] 33.9 -12.3 41.1 23.9 -35.2 ...
## .. ..$ ISO3.1 : Factor w/ 243 levels "ABW","AFG","AGO",..: 2 3 6 8 9 10 13 14 16 17 ...
## .. ..$ ADMIN.1 : Factor w/ 243 levels "Afghanistan",..: 1 7 3 227 11 12 9 75 15 16 ...
## .. ..$ REGION : Factor w/ 7 levels "Africa","Antarctica",..: 3 1 5 3 7 5 2 NA 4 5 ...
## .. ..$ continent : Factor w/ 6 levels "Africa","Antarctica",..: 4 1 4 4 6 4 2 NA 3 4 ...
## .. ..$ GEO3major : Factor w/ 7 levels "Africa","Asia and the Pacific",..: 2 1 3 7 4 3 6 NA 2 3 ...
## .. ..$ GEO3 : Factor w/ 24 levels "Antarctic","Arabian Peninsula",..: 17 20 8 2 16 10 1 NA 3 23 ...
## .. ..$ IMAGE24 : Factor w/ 26 levels "Antarctica","Asia-Stan",..: 9 21 5 14 18 19 1 NA 16 26 ...
## .. ..$ GLOCAF : Factor w/ 19 levels "Brazil","Canada",..: 14 17 4 9 13 5 NA NA 11 4 ...
## .. ..$ Stern : Factor w/ 13 levels "Australasia",..: 4 11 6 13 9 6 NA NA 1 6 ...
## .. ..$ SRESmajor : Factor w/ 4 levels "ALM","ASIA","OECD90",..: 2 1 4 1 1 4 NA NA 3 3 ...
## .. ..$ SRES : Factor w/ 11 levels "Central and Eastern Europe (EEU)",..: 9 10 1 4 3 5 NA NA 8 11 ...
## .. ..$ GBD : Factor w/ 21 levels "Asia Pacific, High Income",..: 4 18 8 15 13 2 NA NA 6 10 ...
## .. ..$ AVOIDnumeric: int [1:243] 21 24 25 30 26 25 NA NA 10 25 ...
## .. ..$ AVOIDname : Factor w/ 30 levels "Australia","Brazil",..: 19 27 7 15 25 7 NA NA 1 7 ...
## .. ..$ LDC : Factor w/ 2 levels "LDC","other": 1 1 2 2 2 2 2 NA 2 2 ...
## .. ..$ SID : Factor w/ 2 levels "other","SID": 1 1 1 1 1 1 1 NA 1 1 ...
## .. ..$ LLDC : Factor w/ 2 levels "LLDC","other": 1 2 2 2 2 1 2 NA 2 2 ...
## ..@ polygons :List of 243
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 66.1 33.9
## .. .. .. .. .. .. ..@ area : num 63.6
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:69, 1:2] 61.2 62.2 63 63.2 64 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 66.1 33.9
## .. .. .. ..@ ID : chr "Afghanistan"
## .. .. .. ..@ area : num 63.6
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 2
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 17.5 -12.3
## .. .. .. .. .. .. ..@ area : num 103
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:66, 1:2] 16.3 16.6 16.9 17.1 17.5 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 12.38 -5.05
## .. .. .. .. .. .. ..@ area : num 0.653
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:9, 1:2] 12.4 12.2 11.9 12.3 12.6 ...
## .. .. .. ..@ plotOrder: int [1:2] 1 2
## .. .. .. ..@ labpt : num [1:2] 17.5 -12.3
## .. .. .. ..@ ID : chr "Angola"
## .. .. .. ..@ area : num 104
## .. .. .. ..$ comment: chr "0 0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 20 41.1
## .. .. .. .. .. .. ..@ area : num 3.19
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:22, 1:2] 20.6 20.5 20.6 21 21 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 20 41.1
## .. .. .. ..@ ID : chr "Albania"
## .. .. .. ..@ area : num 3.19
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 54.2 23.9
## .. .. .. .. .. .. ..@ area : num 7.1
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:22, 1:2] 51.6 51.8 51.8 52.6 53.4 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 54.2 23.9
## .. .. .. ..@ ID : chr "United Arab Emirates"
## .. .. .. ..@ area : num 7.1
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 2
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -65.1 -35.2
## .. .. .. .. .. .. ..@ area : num 276
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:110, 1:2] -65 -64.4 -64 -62.8 -62.7 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -67.3 -54.4
## .. .. .. .. .. .. ..@ area : num 3.3
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:11, 1:2] -65.5 -66.5 -67 -67.6 -68.6 ...
## .. .. .. ..@ plotOrder: int [1:2] 1 2
## .. .. .. ..@ labpt : num [1:2] -65.1 -35.2
## .. .. .. ..@ ID : chr "Argentina"
## .. .. .. ..@ area : num 279
## .. .. .. ..$ comment: chr "0 0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 45 40.2
## .. .. .. .. .. .. ..@ area : num 3.03
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:20, 1:2] 43.6 45 45.2 45.6 45.4 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 45 40.2
## .. .. .. ..@ ID : chr "Armenia"
## .. .. .. ..@ area : num 3.03
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 8
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 21.3 -80.5
## .. .. .. .. .. .. ..@ area : num 5983
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:556, 1:2] -58.6 -59 -59.8 -60.6 -61.3 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -48 -79.6
## .. .. .. .. .. .. ..@ area : num 20.4
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:22, 1:2] -45.2 -43.9 -43.5 -43.4 -43.3 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -71 -71.1
## .. .. .. .. .. .. ..@ area : num 12.7
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:26, 1:2] -68.5 -68.3 -68.5 -68.8 -70 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -62.3 -80.5
## .. .. .. .. .. .. ..@ area : num 4.2
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:13, 1:2] -59.6 -59.9 -60.2 -62.3 -64.5 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -161.4 -78.9
## .. .. .. .. .. .. ..@ area : num 3.72
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:12, 1:2] -159 -161 -162 -163 -163 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -99.5 -72.2
## .. .. .. .. .. .. ..@ area : num 3
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:14, 1:2] -99 -97.9 -96.8 -96.2 -97 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -120.9 -73.7
## .. .. .. .. .. .. ..@ area : num 1.54
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:10, 1:2] -121 -120 -119 -119 -120 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -125.9 -73.6
## .. .. .. .. .. .. ..@ area : num 0.683
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:8, 1:2] -126 -124 -125 -126 -127 ...
## .. .. .. ..@ plotOrder: int [1:8] 1 2 3 4 5 6 7 8
## .. .. .. ..@ labpt : num [1:2] 21.3 -80.5
## .. .. .. ..@ ID : chr "Antarctica"
## .. .. .. ..@ area : num 6029
## .. .. .. ..$ comment: chr "0 0 0 0 0 0 0 0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 69.5 -49.3
## .. .. .. .. .. .. ..@ area : num 1.43
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:9, 1:2] 68.9 69.6 70.5 70.6 70.3 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 69.5 -49.3
## .. .. .. ..@ ID : chr "French Southern and Antarctic Lands"
## .. .. .. ..@ area : num 1.43
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 2
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 134.4 -25.6
## .. .. .. .. .. .. ..@ area : num 688
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:224, 1:2] 144 144 145 145 145 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 147 -42
## .. .. .. .. .. .. ..@ area : num 7.18
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:17, 1:2] 145 146 147 148 148 ...
## .. .. .. ..@ plotOrder: int [1:2] 1 2
## .. .. .. ..@ labpt : num [1:2] 134.4 -25.6
## .. .. .. ..@ ID : chr "Australia"
## .. .. .. ..@ area : num 696
## .. .. .. ..$ comment: chr "0 0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 14.1 47.6
## .. .. .. .. .. .. ..@ area : num 10.2
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:37, 1:2] 17 16.9 16.3 16.5 16.2 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 14.1 47.6
## .. .. .. ..@ ID : chr "Austria"
## .. .. .. ..@ area : num 10.2
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 2
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 47.7 40.3
## .. .. .. .. .. .. ..@ area : num 9.1
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:35, 1:2] 47.4 47.8 48 48.6 49.1 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 45.4 39.2
## .. .. .. .. .. .. ..@ area : num 0.546
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:9, 1:2] 45 45.3 45.7 45.7 46.1 ...
## .. .. .. ..@ plotOrder: int [1:2] 1 2
## .. .. .. ..@ labpt : num [1:2] 47.7 40.3
## .. .. .. ..@ ID : chr "Azerbaijan"
## .. .. .. ..@ area : num 9.64
## .. .. .. ..$ comment: chr "0 0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 29.91 -3.38
## .. .. .. .. .. .. ..@ area : num 2.14
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:13, 1:2] 29.3 29.3 29 29.6 29.9 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 29.91 -3.38
## .. .. .. ..@ ID : chr "Burundi"
## .. .. .. ..@ area : num 2.14
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 4.58 50.65
## .. .. .. .. .. .. ..@ area : num 3.83
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:15, 1:2] 3.31 4.05 4.97 5.61 6.16 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 4.58 50.65
## .. .. .. ..@ ID : chr "Belgium"
## .. .. .. ..@ area : num 3.83
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 2.34 9.65
## .. .. .. .. .. .. ..@ area : num 9.64
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:25, 1:2] 2.69 1.87 1.62 1.66 1.46 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 2.34 9.65
## .. .. .. ..@ ID : chr "Benin"
## .. .. .. ..@ area : num 9.64
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -1.78 12.31
## .. .. .. .. .. .. ..@ area : num 22.6
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:39, 1:2] -2.83 -3.51 -3.98 -4.33 -4.78 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] -1.78 12.31
## .. .. .. ..@ ID : chr "Burkina Faso"
## .. .. .. ..@ area : num 22.6
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 90.3 23.8
## .. .. .. .. .. .. ..@ area : num 11.9
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:36, 1:2] 92.7 92.7 92.3 92.4 92.1 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 90.3 23.8
## .. .. .. ..@ ID : chr "Bangladesh"
## .. .. .. ..@ area : num 11.9
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 25.2 42.8
## .. .. .. .. .. .. ..@ area : num 12.1
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:28, 1:2] 22.7 22.9 23.3 24.1 25.6 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 25.2 42.8
## .. .. .. ..@ ID : chr "Bulgaria"
## .. .. .. ..@ area : num 12.1
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 3
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -77.9 24.5
## .. .. .. .. .. .. ..@ area : num 0.721
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:8, 1:2] -77.5 -77.8 -78 -78.4 -78.2 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -78.4 26.7
## .. .. .. .. .. .. ..@ area : num 0.388
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:6, 1:2] -77.8 -78.9 -79 -78.5 -77.9 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -77.3 26.5
## .. .. .. .. .. .. ..@ area : num 0.29
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:7, 1:2] -77 -77.2 -77.4 -77.3 -77.8 ...
## .. .. .. ..@ plotOrder: int [1:3] 1 2 3
## .. .. .. ..@ labpt : num [1:2] -77.9 24.5
## .. .. .. ..@ ID : chr "The Bahamas"
## .. .. .. ..@ area : num 1.4
## .. .. .. ..$ comment: chr "0 0 0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 17.8 44.2
## .. .. .. .. .. .. ..@ area : num 5.7
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:22, 1:2] 19 19.4 19.1 19.6 19.5 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 17.8 44.2
## .. .. .. ..@ ID : chr "Bosnia and Herzegovina"
## .. .. .. ..@ area : num 5.7
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 28 53.5
## .. .. .. .. .. .. ..@ area : num 28.3
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:44, 1:2] 23.5 24.5 25.5 25.8 26.6 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 28 53.5
## .. .. .. ..@ ID : chr "Belarus"
## .. .. .. ..@ area : num 28.3
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -88.7 17.2
## .. .. .. .. .. .. ..@ area : num 1.87
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:20, 1:2] -89.1 -89.2 -89 -88.8 -88.5 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] -88.7 17.2
## .. .. .. ..@ ID : chr "Belize"
## .. .. .. ..@ area : num 1.87
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -64.6 -16.7
## .. .. .. .. .. .. ..@ area : num 92.1
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:60, 1:2] -62.8 -64 -64.4 -65 -66.3 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] -64.6 -16.7
## .. .. .. ..@ ID : chr "Bolivia"
## .. .. .. ..@ area : num 92.1
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -53.1 -10.8
## .. .. .. .. .. .. ..@ area : num 710
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:203, 1:2] -57.6 -56.3 -55.2 -54.5 -53.6 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] -53.1 -10.8
## .. .. .. ..@ ID : chr "Brazil"
## .. .. .. ..@ area : num 710
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 114.92 4.69
## .. .. .. .. .. .. ..@ area : num 0.872
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:8, 1:2] 114 115 115 115 115 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 114.92 4.69
## .. .. .. ..@ ID : chr "Brunei"
## .. .. .. ..@ area : num 0.872
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 90.5 27.4
## .. .. .. .. .. .. ..@ area : num 3.59
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:13, 1:2] 91.7 92.1 92 91.2 90.4 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 90.5 27.4
## .. .. .. ..@ ID : chr "Bhutan"
## .. .. .. ..@ area : num 3.59
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 23.8 -22.1
## .. .. .. .. .. .. ..@ area : num 51.8
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:40, 1:2] 25.6 25.9 26.2 27.3 27.7 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 23.8 -22.1
## .. .. .. ..@ ID : chr "Botswana"
## .. .. .. ..@ area : num 51.8
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 20.37 6.54
## .. .. .. .. .. .. ..@ area : num 50.9
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:62, 1:2] 15.3 16.1 16.3 16.5 16.7 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 20.37 6.54
## .. .. .. ..@ ID : chr "Central African Republic"
## .. .. .. ..@ area : num 50.9
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 30
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -101.6 57.7
## .. .. .. .. .. .. ..@ area : num 1281
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:272, 1:2] -90.5 -90.6 -89.2 -88 -88.3 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -74.9 68.6
## .. .. .. .. .. .. ..@ area : num 118
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:73, 1:2] -86.6 -85.8 -84.9 -82.3 -80.6 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -78.6 80.4
## .. .. .. .. .. .. ..@ area : num 105
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:65, 1:2] -68.5 -65.8 -63.7 -61.8 -61.9 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -110.5 70.8
## .. .. .. .. .. .. ..@ area : num 54.4
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:45, 1:2] -114 -115 -112 -111 -110 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -121.5 72.9
## .. .. .. .. .. .. ..@ area : num 20.1
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:17, 1:2] -120 -123 -124 -126 -125 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -91.6 79.7
## .. .. .. .. .. .. ..@ area : num 19.4
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:21, 1:2] -87 -85.8 -87.2 -89 -90.8 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -88.1 75.4
## .. .. .. .. .. .. ..@ area : num 19.2
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:28, 1:2] -94.7 -93.6 -91.6 -90.7 -91 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -56 48.7
## .. .. .. .. .. .. ..@ area : num 15.2
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:33, 1:2] -56.1 -56.8 -56.1 -55.5 -55.8 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -111.6 75.5
## .. .. .. .. .. .. ..@ area : num 14.3
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:22, 1:2] -108 -108 -107 -106 -106 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -99.2 72.6
## .. .. .. .. .. .. ..@ area : num 9.4
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:15, 1:2] -100.4 -99.2 -97.4 -97.1 -98.1 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -84.1 64.3
## .. .. .. .. .. .. ..@ area : num 7.97
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:20, 1:2] -85.2 -85 -84.5 -83.9 -82.8 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -93.8 73.3
## .. .. .. .. .. .. ..@ area : num 7.12
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:11, 1:2] -93.2 -94.3 -95.4 -96 -96 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -99.8 75.8
## .. .. .. .. .. .. ..@ area : num 6.11
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:13, 1:2] -98.5 -97.7 -97.7 -98.2 -99.8 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -119.2 76.8
## .. .. .. .. .. .. ..@ area : num 6.08
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:12, 1:2] -116 -116 -117 -118 -120 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -126 49.6
## .. .. .. .. .. .. ..@ area : num 4.06
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:16, 1:2] -124 -124 -126 -126 -127 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -102.6 78.6
## .. .. .. .. .. .. ..@ area : num 3.98
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:11, 1:2] -100.1 -99.7 -101.3 -102.9 -105.2 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -78.8 73.2
## .. .. .. .. .. .. ..@ area : num 3.15
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:11, 1:2] -76.3 -76.3 -77.3 -78.4 -79.5 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -97.6 69.4
## .. .. .. .. .. .. ..@ area : num 2.94
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:11, 1:2] -95.6 -96.3 -97.6 -98.4 -99.8 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -95.1 75.1
## .. .. .. .. .. .. ..@ area : num 2.18
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:8, 1:2] -93.6 -94.2 -95.6 -96.8 -96.3 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -97.2 78.4
## .. .. .. .. .. .. ..@ area : num 2.14
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:9, 1:2] -95.8 -97.3 -98.1 -98.6 -98.6 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -76.2 67.7
## .. .. .. .. .. .. ..@ area : num 1.92
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:9, 1:2] -75.9 -77 -77.2 -76.8 -75.9 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -111.7 77.8
## .. .. .. .. .. .. ..@ area : num 1.69
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:7, 1:2] -110 -112 -114 -113 -111 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -132.3 53.4
## .. .. .. .. .. .. ..@ area : num 1.57
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:14, 1:2] -133 -133 -133 -133 -132 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -105.6 73.3
## .. .. .. .. .. .. ..@ area : num 1.16
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:6, 1:2] -104 -105 -107 -107 -105 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -83 62.6
## .. .. .. .. .. .. ..@ area : num 1.04
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:7, 1:2] -81.9 -83.1 -83.8 -84 -83.3 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -63.1 49.5
## .. .. .. .. .. .. ..@ area : num 0.97
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:8, 1:2] -61.8 -62.3 -63.6 -64.5 -64.2 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -63.3 46.4
## .. .. .. .. .. .. ..@ area : num 0.873
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:9, 1:2] -63.7 -62.9 -62 -62.5 -62.9 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -111.3 78.6
## .. .. .. .. .. .. ..@ area : num 0.793
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:7, 1:2] -110 -111 -113 -113 -112 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -95.1 77.7
## .. .. .. .. .. .. ..@ area : num 0.711
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:7, 1:2] -93.8 -94.3 -96.2 -96.4 -94.4 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -79.8 62
## .. .. .. .. .. .. ..@ area : num 0.532
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:8, 1:2] -79.3 -79.7 -80.1 -80.4 -80.3 ...
## .. .. .. ..@ plotOrder: int [1:30] 1 2 3 4 5 6 7 8 9 10 ...
## .. .. .. ..@ labpt : num [1:2] -101.6 57.7
## .. .. .. ..@ ID : chr "Canada"
## .. .. .. ..@ area : num 1713
## .. .. .. ..$ comment: chr "0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 8.12 46.79
## .. .. .. .. .. .. ..@ area : num 5.44
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:24, 1:2] 9.59 9.63 9.48 9.93 10.44 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 8.12 46.79
## .. .. .. ..@ ID : chr "Switzerland"
## .. .. .. ..@ area : num 5.44
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 2
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -71.7 -37.3
## .. .. .. .. .. .. ..@ area : num 77.7
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:94, 1:2] -68.2 -67.8 -67.1 -67 -67.3 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -70.2 -54.2
## .. .. .. .. .. .. ..@ area : num 8.76
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:20, 1:2] -68.6 -68.6 -67.6 -67 -67.3 ...
## .. .. .. ..@ plotOrder: int [1:2] 1 2
## .. .. .. ..@ labpt : num [1:2] -71.7 -37.3
## .. .. .. ..@ ID : chr "Chile"
## .. .. .. ..@ area : num 86.5
## .. .. .. ..$ comment: chr "0 0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 2
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 103.9 36.6
## .. .. .. .. .. .. ..@ area : num 952
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:230, 1:2] 128 129 131 131 133 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 109.7 19.2
## .. .. .. .. .. .. ..@ area : num 2.98
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:10, 1:2] 110 109 109 109 109 ...
## .. .. .. ..@ plotOrder: int [1:2] 1 2
## .. .. .. ..@ labpt : num [1:2] 103.9 36.6
## .. .. .. ..@ ID : chr "China"
## .. .. .. ..@ area : num 955
## .. .. .. ..$ comment: chr "0 0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -5.61 7.55
## .. .. .. .. .. .. ..@ area : num 27
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:46, 1:2] -2.86 -3.31 -4.01 -4.65 -5.83 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] -5.61 7.55
## .. .. .. ..@ ID : chr "Ivory Coast"
## .. .. .. ..@ area : num 27
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 12.61 5.66
## .. .. .. .. .. .. ..@ area : num 37.6
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:61, 1:2] 13.1 13 12.4 11.8 11.3 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 12.61 5.66
## .. .. .. ..@ ID : chr "Cameroon"
## .. .. .. ..@ area : num 37.6
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 23.58 -2.85
## .. .. .. .. .. .. ..@ area : num 190
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:122, 1:2] 30.8 30.8 31.2 30.9 30.5 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 23.58 -2.85
## .. .. .. ..@ ID : chr "Democratic Republic of the Congo"
## .. .. .. ..@ area : num 190
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 15.134 -0.838
## .. .. .. .. .. .. ..@ area : num 27.6
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:49, 1:2] 13 12.6 12.3 11.9 11.1 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 15.134 -0.838
## .. .. .. ..@ ID : chr "Republic of the Congo"
## .. .. .. ..@ area : num 27.6
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -73.08 3.93
## .. .. .. .. .. .. ..@ area : num 93.9
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:100, 1:2] -75.4 -75.8 -76.3 -76.6 -77.4 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] -73.08 3.93
## .. .. .. ..@ ID : chr "Colombia"
## .. .. .. ..@ area : num 93.9
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -84.18 9.97
## .. .. .. .. .. .. ..@ area : num 4.44
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:36, 1:2] -83 -83.5 -83.7 -83.6 -83.6 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] -84.18 9.97
## .. .. .. ..@ ID : chr "Costa Rica"
## .. .. .. ..@ area : num 4.44
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -79 21.6
## .. .. .. .. .. .. ..@ area : num 10
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:42, 1:2] -82.3 -81.4 -80.6 -79.7 -79.3 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] -79 21.6
## .. .. .. ..@ ID : chr "Cuba"
## .. .. .. ..@ area : num 10
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 33.6 35.3
## .. .. .. .. .. .. ..@ area : num 0.375
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:16, 1:2] 32.7 32.8 32.9 33.7 34.6 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 33.6 35.3
## .. .. .. ..@ ID : chr "Northern Cyprus"
## .. .. .. ..@ area : num 0.375
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 33 34.9
## .. .. .. .. .. .. ..@ area : num 0.613
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:15, 1:2] 34 34 33 32.5 32.3 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 33 34.9
## .. .. .. ..@ ID : chr "Cyprus"
## .. .. .. ..@ area : num 0.613
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 15.3 49.8
## .. .. .. .. .. .. ..@ area : num 10.1
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:35, 1:2] 17 16.5 16 15.3 14.9 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 15.3 49.8
## .. .. .. ..@ ID : chr "Czech Republic"
## .. .. .. ..@ area : num 10.1
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 10.3 51.1
## .. .. .. .. .. .. ..@ area : num 45.9
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:58, 1:2] 9.92 9.94 10.95 10.94 11.96 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 10.3 51.1
## .. .. .. ..@ ID : chr "Germany"
## .. .. .. ..@ area : num 45.9
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 42.5 11.8
## .. .. .. .. .. .. ..@ area : num 1.81
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:15, 1:2] 43.1 43.3 43.3 42.7 43.1 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 42.5 11.8
## .. .. .. ..@ ID : chr "Djibouti"
## .. .. .. ..@ area : num 1.81
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 2
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 9.31 56.22
## .. .. .. .. .. .. ..@ area : num 4.8
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:18, 1:2] 10.91 10.67 10.37 9.65 9.92 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 11.9 55.5
## .. .. .. .. .. .. ..@ area : num 1.37
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:6, 1:2] 12.7 12.1 11 10.9 12.4 ...
## .. .. .. ..@ plotOrder: int [1:2] 1 2
## .. .. .. ..@ labpt : num [1:2] 9.31 56.22
## .. .. .. ..@ ID : chr "Denmark"
## .. .. .. ..@ area : num 6.17
## .. .. .. ..$ comment: chr "0 0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -70.5 18.9
## .. .. .. .. .. .. ..@ area : num 4.13
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:26, 1:2] -71.7 -71.6 -70.8 -70.2 -70 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] -70.5 18.9
## .. .. .. ..@ ID : chr "Dominican Republic"
## .. .. .. ..@ area : num 4.13
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 2.6 28.2
## .. .. .. .. .. .. ..@ area : num 214
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:62, 1:2] 12 8.57 5.68 4.27 3.16 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 2.6 28.2
## .. .. .. ..@ ID : chr "Algeria"
## .. .. .. ..@ area : num 214
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -78.38 -1.45
## .. .. .. .. .. .. ..@ area : num 20.4
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:33, 1:2] -80.3 -79.8 -80 -80.4 -81 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] -78.38 -1.45
## .. .. .. ..@ ID : chr "Ecuador"
## .. .. .. ..@ area : num 20.4
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 29.8 26.5
## .. .. .. .. .. .. ..@ area : num 90.4
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:42, 1:2] 34.9 34.6 34.4 34.2 33.9 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 29.8 26.5
## .. .. .. ..@ ID : chr "Egypt"
## .. .. .. ..@ area : num 90.4
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 38.7 15.4
## .. .. .. .. .. .. ..@ area : num 10
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:28, 1:2] 42.4 42 41.6 41.2 40.9 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 38.7 15.4
## .. .. .. ..@ ID : chr "Eritrea"
## .. .. .. ..@ area : num 10
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -3.62 40.35
## .. .. .. .. .. .. ..@ area : num 53.3
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:51, 1:2] -9.03 -8.98 -9.39 -7.98 -6.75 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] -3.62 40.35
## .. .. .. ..@ ID : chr "Spain"
## .. .. .. ..@ area : num 53.3
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 25.8 58.6
## .. .. .. .. .. .. ..@ area : num 6.91
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:17, 1:2] 24.3 24.4 24.1 23.4 23.3 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 25.8 58.6
## .. .. .. ..@ ID : chr "Estonia"
## .. .. .. ..@ area : num 6.91
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 39.55 8.65
## .. .. .. .. .. .. ..@ area : num 93.1
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:59, 1:2] 37.9 38.5 39.1 39.3 40 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 39.55 8.65
## .. .. .. ..@ ID : chr "Ethiopia"
## .. .. .. ..@ area : num 93.1
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 26.2 64.5
## .. .. .. .. .. .. ..@ area : num 63.8
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:38, 1:2] 28.6 28.4 30 29.1 30.2 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 26.2 64.5
## .. .. .. ..@ ID : chr "Finland"
## .. .. .. ..@ area : num 63.8
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 3
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 178 -17.8
## .. .. .. .. .. .. ..@ area : num 0.984
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:9, 1:2] 178 179 179 178 177 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 179.3 -16.6
## .. .. .. .. .. .. ..@ area : num 0.589
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:8, 1:2] 179 179 179 179 179 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -179.9 -16.3
## .. .. .. .. .. .. ..@ area : num 0.067
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:5, 1:2] -180 -180 -180 -180 -180 ...
## .. .. .. ..@ plotOrder: int [1:3] 1 2 3
## .. .. .. ..@ labpt : num [1:2] 178 -17.8
## .. .. .. ..@ ID : chr "Fiji"
## .. .. .. ..@ area : num 1.64
## .. .. .. ..$ comment: chr "0 0 0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -59.4 -51.7
## .. .. .. .. .. .. ..@ area : num 2.13
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:10, 1:2] -61.2 -60 -59.1 -58.6 -57.8 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] -59.4 -51.7
## .. .. .. ..@ ID : chr "Falkland Islands"
## .. .. .. ..@ area : num 2.13
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 2
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 2.34 46.61
## .. .. .. .. .. .. ..@ area : num 64.6
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:48, 1:2] 3.59 4.29 4.8 5.67 5.9 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 9.08 42.18
## .. .. .. .. .. .. ..@ area : num 1.05
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:7, 1:2] 9.56 9.23 8.78 8.54 8.75 ...
## .. .. .. ..@ plotOrder: int [1:2] 1 2
## .. .. .. ..@ labpt : num [1:2] 2.34 46.61
## .. .. .. ..@ ID : chr "France"
## .. .. .. ..@ area : num 65.7
## .. .. .. ..$ comment: chr "0 0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 11.688 -0.647
## .. .. .. .. .. .. ..@ area : num 21.9
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:31, 1:2] 11.09 10.07 9.41 8.8 8.83 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 11.688 -0.647
## .. .. .. ..@ ID : chr "Gabon"
## .. .. .. ..@ area : num 21.9
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 2
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -2.66 53.88
## .. .. .. .. .. .. ..@ area : num 32.6
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:48, 1:2] -3.01 -4.07 -3.06 -1.96 -2.22 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -6.71 54.53
## .. .. .. .. .. .. ..@ area : num 1.65
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:8, 1:2] -5.66 -6.2 -6.95 -7.57 -7.37 ...
## .. .. .. ..@ plotOrder: int [1:2] 1 2
## .. .. .. ..@ labpt : num [1:2] -2.66 53.88
## .. .. .. ..@ ID : chr "United Kingdom"
## .. .. .. ..@ area : num 34.2
## .. .. .. ..$ comment: chr "0 0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 43.5 42.2
## .. .. .. .. .. .. ..@ area : num 7.52
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:24, 1:2] 41.6 41.7 41.5 40.9 40.3 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 43.5 42.2
## .. .. .. ..@ ID : chr "Georgia"
## .. .. .. ..@ area : num 7.52
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -1.24 7.93
## .. .. .. .. .. .. ..@ area : num 20
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:25, 1:2] 1.06 -0.508 -1.064 -1.965 -2.856 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] -1.24 7.93
## .. .. .. ..@ ID : chr "Ghana"
## .. .. .. ..@ area : num 20
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -11.1 10.4
## .. .. .. .. .. .. ..@ area : num 19.8
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:70, 1:2] -8.44 -8.72 -8.93 -9.21 -9.4 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] -11.1 10.4
## .. .. .. ..@ ID : chr "Guinea"
## .. .. .. ..@ area : num 19.8
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -15.4 13.5
## .. .. .. .. .. .. ..@ area : num 1.17
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:16, 1:2] -16.8 -16.7 -15.6 -15.4 -15.1 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] -15.4 13.5
## .. .. .. ..@ ID : chr "Gambia"
## .. .. .. ..@ area : num 1.17
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -15.1 12
## .. .. .. .. .. .. ..@ area : num 3
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:19, 1:2] -15.1 -15.7 -16.1 -16.3 -16.3 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] -15.1 12
## .. .. .. ..@ ID : chr "Guinea Bissau"
## .. .. .. ..@ area : num 3
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 10.37 1.65
## .. .. .. .. .. .. ..@ area : num 2.2
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:7, 1:2] 9.49 9.31 9.65 11.28 11.29 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 10.37 1.65
## .. .. .. ..@ ID : chr "Equatorial Guinea"
## .. .. .. ..@ area : num 2.2
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 2
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 22.6 39.3
## .. .. .. .. .. .. ..@ area : num 12.8
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:43, 1:2] 26.6 26.3 26.1 25.4 24.9 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 24.9 35.2
## .. .. .. .. .. .. ..@ area : num 0.92
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:11, 1:2] 23.7 24.2 25 25.8 25.7 ...
## .. .. .. ..@ plotOrder: int [1:2] 1 2
## .. .. .. ..@ labpt : num [1:2] 22.6 39.3
## .. .. .. ..@ ID : chr "Greece"
## .. .. .. ..@ area : num 13.7
## .. .. .. ..$ comment: chr "0 0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -41.5 74.8
## .. .. .. .. .. .. ..@ area : num 678
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:132, 1:2] -46.8 -43.4 -39.9 -38.6 -35.1 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] -41.5 74.8
## .. .. .. ..@ ID : chr "Greenland"
## .. .. .. ..@ area : num 678
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -90.4 15.7
## .. .. .. .. .. .. ..@ area : num 9.23
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:35, 1:2] -90.1 -90.6 -91.2 -91.7 -92.2 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] -90.4 15.7
## .. .. .. ..@ ID : chr "Guatemala"
## .. .. .. ..@ area : num 9.23
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -58.97 4.79
## .. .. .. .. .. .. ..@ area : num 17.1
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:40, 1:2] -59.8 -59.1 -58.5 -58.5 -58.1 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] -58.97 4.79
## .. .. .. ..@ ID : chr "Guyana"
## .. .. .. ..@ area : num 17.1
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -86.6 14.8
## .. .. .. .. .. .. ..@ area : num 9.55
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:57, 1:2] -87.3 -87.5 -87.8 -87.7 -87.9 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] -86.6 14.8
## .. .. .. ..@ ID : chr "Honduras"
## .. .. .. ..@ area : num 9.55
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 16.6 45
## .. .. .. .. .. .. ..@ area : num 6.57
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:42, 1:2] 18.8 19.1 19.4 19 18.6 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 16.6 45
## .. .. .. ..@ ID : chr "Croatia"
## .. .. .. ..@ area : num 6.57
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -72.7 18.9
## .. .. .. .. .. .. ..@ area : num 2.45
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:21, 1:2] -73.2 -72.6 -71.7 -71.6 -71.7 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] -72.7 18.9
## .. .. .. ..@ ID : chr "Haiti"
## .. .. .. ..@ area : num 2.45
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 19.4 47.2
## .. .. .. .. .. .. ..@ area : num 11
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:31, 1:2] 16.2 16.5 16.3 16.9 17 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 19.4 47.2
## .. .. .. ..@ ID : chr "Hungary"
## .. .. .. ..@ area : num 11
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 13
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 114.023 -0.254
## .. .. .. .. .. .. ..@ area : num 43.1
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:39, 1:2] 118 119 118 117 118 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 101.554 -0.413
## .. .. .. .. .. .. ..@ area : num 35.8
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:35, 1:2] 106 105 104 103 102 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 137.41 -4.13
## .. .. .. .. .. .. ..@ area : num 33.4
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:38, 1:2] 134 134 135 136 137 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 121.2 -2.11
## .. .. .. .. .. .. ..@ area : num 15.3
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:45, 1:2] 125 124 124 123 121 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 110.18 -7.34
## .. .. .. .. .. .. ..@ area : num 11.3
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:23, 1:2] 109 111 111 113 113 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 128.016 0.779
## .. .. .. .. .. .. ..@ area : num 2.09
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:13, 1:2] 129 129 128 128 128 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 129.32 -3.19
## .. .. .. .. .. .. ..@ area : num 1.47
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:9, 1:2] 130 131 130 129 129 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 121.31 -8.59
## .. .. .. .. .. .. ..@ area : num 1.31
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:9, 1:2] 123 123 121 120 120 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 124.3 -9.65
## .. .. .. .. .. .. ..@ area : num 1.28
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:9, 1:2] 124 124 123 124 124 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 117.91 -8.64
## .. .. .. .. .. .. ..@ area : num 1.18
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:10, 1:2] 118 118 119 119 118 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 120 -9.8
## .. .. .. .. .. .. ..@ area : num 0.813
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:7, 1:2] 121 120 119 120 120 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 126.64 -3.42
## .. .. .. .. .. .. ..@ area : num 0.565
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:6, 1:2] 127 127 126 126 127 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 134.42 -6.13
## .. .. .. .. .. .. ..@ area : num 0.516
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:7, 1:2] 135 134 134 134 134 ...
## .. .. .. ..@ plotOrder: int [1:13] 1 2 3 4 5 6 7 8 9 10 ...
## .. .. .. ..@ labpt : num [1:2] 114.023 -0.254
## .. .. .. ..@ ID : chr "Indonesia"
## .. .. .. ..@ area : num 148
## .. .. .. ..$ comment: chr "0 0 0 0 0 0 0 0 0 0 0 0 0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 79.6 22.9
## .. .. .. .. .. .. ..@ area : num 278
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:136, 1:2] 77.8 78.9 78.8 79.2 79.2 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 79.6 22.9
## .. .. .. ..@ ID : chr "India"
## .. .. .. ..@ area : num 278
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -8.01 53.18
## .. .. .. .. .. .. ..@ area : num 7.86
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:13, 1:2] -6.2 -6.03 -6.79 -8.56 -9.98 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] -8.01 53.18
## .. .. .. ..@ ID : chr "Ireland"
## .. .. .. ..@ area : num 7.86
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 54.3 32.5
## .. .. .. .. .. .. ..@ area : num 156
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:75, 1:2] 53.9 54.8 55.5 56.2 56.6 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 54.3 32.5
## .. .. .. ..@ ID : chr "Iran"
## .. .. .. ..@ area : num 156
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 43.8 33
## .. .. .. .. .. .. ..@ area : num 42.2
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:30, 1:2] 45.4 46.1 46.2 45.6 45.4 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 43.8 33
## .. .. .. ..@ ID : chr "Iraq"
## .. .. .. ..@ area : num 42.2
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -18.8 65.1
## .. .. .. .. .. .. ..@ area : num 20.6
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:20, 1:2] -14.5 -14.7 -13.6 -14.9 -17.8 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] -18.8 65.1
## .. .. .. ..@ ID : chr "Iceland"
## .. .. .. ..@ area : num 20.6
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 35 31.5
## .. .. .. .. .. .. ..@ area : num 2.19
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:23, 1:2] 35.7 35.5 35.2 35 35.2 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 35 31.5
## .. .. .. ..@ ID : chr "Israel"
## .. .. .. ..@ area : num 2.19
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 3
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 12.2 43.5
## .. .. .. .. .. .. ..@ area : num 29.4
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:66, 1:2] 12.4 13.8 13.7 13.9 13.1 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 14.1 37.6
## .. .. .. .. .. .. ..@ area : num 2.79
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:11, 1:2] 15.5 15.2 15.3 15.1 14.3 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 9.03 40.07
## .. .. .. .. .. .. ..@ area : num 2.53
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:10, 1:2] 9.21 9.81 9.67 9.21 8.81 ...
## .. .. .. ..@ plotOrder: int [1:3] 1 2 3
## .. .. .. ..@ labpt : num [1:2] 12.2 43.5
## .. .. .. ..@ ID : chr "Italy"
## .. .. .. ..@ area : num 34.7
## .. .. .. ..$ comment: chr "0 0 0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -77.3 18.1
## .. .. .. .. .. .. ..@ area : num 1.06
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:11, 1:2] -77.6 -76.9 -76.4 -76.2 -76.9 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] -77.3 18.1
## .. .. .. ..@ ID : chr "Jamaica"
## .. .. .. ..@ area : num 1.06
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 36.8 31.2
## .. .. .. .. .. .. ..@ area : num 8.44
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:19, 1:2] 35.5 35.7 36.8 38.8 39.2 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 36.8 31.2
## .. .. .. ..@ ID : chr "Jordan"
## .. .. .. ..@ area : num 8.44
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 3
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 137 36
## .. .. .. .. .. .. ..@ area : num 29.4
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:37, 1:2] 141 141 141 140 139 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 142.5 43.3
## .. .. .. .. .. .. ..@ area : num 9.98
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:16, 1:2] 144 145 145 146 144 ...
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 133.5 33.6
## .. .. .. .. .. .. ..@ area : num 1.98
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:12, 1:2] 135 135 134 134 133 ...
## .. .. .. ..@ plotOrder: int [1:3] 1 2 3
## .. .. .. ..@ labpt : num [1:2] 137 36
## .. .. .. ..@ ID : chr "Japan"
## .. .. .. ..@ area : num 41.4
## .. .. .. ..$ comment: chr "0 0 0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 67.3 48.2
## .. .. .. .. .. .. ..@ area : num 331
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:112, 1:2] 71 70.4 69.1 68.6 68.3 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 67.3 48.2
## .. .. .. ..@ ID : chr "Kazakhstan"
## .. .. .. ..@ area : num 331
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 37.792 0.596
## .. .. .. .. .. .. ..@ area : num 48
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:37, 1:2] 41 41.6 40.9 40.6 40.3 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 37.792 0.596
## .. .. .. ..@ ID : chr "Kenya"
## .. .. .. ..@ area : num 48
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 74.6 41.5
## .. .. .. .. .. .. ..@ area : num 21.1
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:35, 1:2] 71 71.2 71.8 73.5 73.6 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 74.6 41.5
## .. .. .. ..@ ID : chr "Kyrgyzstan"
## .. .. .. ..@ area : num 21.1
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 104.9 12.7
## .. .. .. .. .. .. ..@ area : num 15.2
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:17, 1:2] 103 103 103 102 103 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 104.9 12.7
## .. .. .. ..@ ID : chr "Cambodia"
## .. .. .. ..@ area : num 15.2
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 127.8 36.4
## .. .. .. .. .. .. ..@ area : num 9.95
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:19, 1:2] 128 129 129 129 129 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 127.8 36.4
## .. .. .. ..@ ID : chr "South Korea"
## .. .. .. ..@ area : num 9.95
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 20.9 42.6
## .. .. .. .. .. .. ..@ area : num 1.23
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:21, 1:2] 20.8 20.7 20.6 20.5 20.3 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 20.9 42.6
## .. .. .. ..@ ID : chr "Kosovo"
## .. .. .. ..@ area : num 1.23
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 47.6 29.3
## .. .. .. .. .. .. ..@ area : num 1.55
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:9, 1:2] 48 48.2 48.1 48.4 47.7 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 47.6 29.3
## .. .. .. ..@ ID : chr "Kuwait"
## .. .. .. ..@ area : num 1.55
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 103.8 18.4
## .. .. .. .. .. .. ..@ area : num 19.6
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:37, 1:2] 105 106 106 105 105 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 103.8 18.4
## .. .. .. ..@ ID : chr "Laos"
## .. .. .. ..@ area : num 19.6
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 35.9 33.9
## .. .. .. .. .. .. ..@ area : num 0.984
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:11, 1:2] 35.8 35.6 35.5 35.1 35.5 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 35.9 33.9
## .. .. .. ..@ ID : chr "Lebanon"
## .. .. .. ..@ area : num 0.984
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] -9.41 6.43
## .. .. .. .. .. .. ..@ area : num 8.03
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:27, 1:2] -7.71 -7.97 -9 -9.91 -10.77 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] -9.41 6.43
## .. .. .. ..@ ID : chr "Liberia"
## .. .. .. ..@ area : num 8.03
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 18 27
## .. .. .. .. .. .. ..@ area : num 149
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:56, 1:2] 14.9 14.1 13.6 12 11.6 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 18 27
## .. .. .. ..@ ID : chr "Libya"
## .. .. .. ..@ area : num 149
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 80.7 7.7
## .. .. .. .. .. .. ..@ area : num 5.36
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:10, 1:2] 81.8 81.6 81.2 80.3 79.9 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 80.7 7.7
## .. .. .. ..@ ID : chr "Sri Lanka"
## .. .. .. ..@ area : num 5.36
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 28.2 -29.6
## .. .. .. .. .. .. ..@ area : num 2.56
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:12, 1:2] 29 29.3 29 28.8 28.3 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 28.2 -29.6
## .. .. .. ..@ ID : chr "Lesotho"
## .. .. .. ..@ area : num 2.56
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 23.9 55.3
## .. .. .. .. .. .. ..@ area : num 9.02
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:19, 1:2] 22.7 22.7 22.8 22.3 21.3 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 23.9 55.3
## .. .. .. ..@ ID : chr "Lithuania"
## .. .. .. ..@ area : num 9.02
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 5.97 49.77
## .. .. .. .. .. .. ..@ area : num 0.302
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:7, 1:2] 6.04 6.24 6.19 5.9 5.67 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 5.97 49.77
## .. .. .. ..@ ID : chr "Luxembourg"
## .. .. .. ..@ area : num 0.302
## .. .. .. ..$ comment: chr "0"
## .. ..$ :Formal class 'Polygons' [package "sp"] with 5 slots
## .. .. .. ..@ Polygons :List of 1
## .. .. .. .. ..$ :Formal class 'Polygon' [package "sp"] with 5 slots
## .. .. .. .. .. .. ..@ labpt : num [1:2] 24.8 56.8
## .. .. .. .. .. .. ..@ area : num 9.4
## .. .. .. .. .. .. ..@ hole : logi FALSE
## .. .. .. .. .. .. ..@ ringDir: int 1
## .. .. .. .. .. .. ..@ coords : num [1:22, 1:2] 21.1 21.1 21.6 22.5 23.3 ...
## .. .. .. ..@ plotOrder: int 1
## .. .. .. ..@ labpt : num [1:2] 24.8 56.8
## .. .. .. ..@ ID : chr "Latvia"
## .. .. .. ..@ area : num 9.4
## .. .. .. ..$ comment: chr "0"
## .. .. [list output truncated]
## ..@ plotOrder : int [1:243] 7 135 28 167 31 23 9 66 84 5 ...
## ..@ bbox : num [1:2, 1:2] -180 -90 180 83.6
## .. ..- attr(*, "dimnames")=List of 2
## .. .. ..$ : chr [1:2] "x" "y"
## .. .. ..$ : chr [1:2] "min" "max"
## ..@ proj4string:Formal class 'CRS' [package "sp"] with 1 slot
## .. .. ..@ projargs: chr "+proj=longlat +ellps=WGS84 +datum=WGS84 +no_defs"
Menampilkan peta dunia dalam bentuk dasar berupa garis-garis wilayah.
plot(countriesCoarse) ## Warning in wkt(obj): CRS object has no comment
Menggabungkan peta dunia dengan data pertumbuhan penduduk:
plot(countriesCoarse) ## Warning in wkt(obj): CRS object has no comment
plot(datapop,add=TRUE, pch=20)Coba tampilkan data pertumbuhan penduduk dengan ukuran titik sesuai dengan besarnya pertumbuhan, pada peta dunia.!
plot(countriesCoarse) ## Warning in wkt(obj): CRS object has no comment
plot(datapop,add=TRUE, pch=20, col="red", cex=size*150)Rasterize
library(raster)
r <- raster(datapop)
res(r)<-c(5,5)
nc <- rasterize(coordinates(datapop), r, fun=mean, background=NA)
plot(nc)
plot(countriesCoarse, add=TRUE)Cara Lain menampilkan peta Tidak dijalankan di sini karena Error: Google now requires an API key. See ?register_google for details.):
#library(ggmap)
#map <- get_map(location = 'Indonesia', zoom = 4)
#plot(map)
#datapop<-read.csv('http://bit.ly/Popgrowth2000', header=T,sep=',')
#ggmap(map)+geom_point(aes(x = Longitude, y = Latitude),
#data = pop_ina,col="red")Tugas Mandiri : Peta Pulau Jawa
- Impor Data Polygon (SHP File)
library(rgdal)- Import Data dari Direktori
Menggunakan fungsi readOGR: >>readOGR(dsn=‘folder (direktori) tempat shape file disimpan’, layer=‘nama shape file (tanpa .shp extension)’)
jawa <- readOGR(dsn='D:\\Kuliah S2 IPB\\Bahan Kuliah\\Semester 2 SSD 2020\\STA533 Spasial\\PRAKTIKUM\\R\\Map of Jawa (original)', layer='jawa')## Warning in OGRSpatialRef(dsn, layer, morphFromESRI = morphFromESRI, dumpSRS
## = dumpSRS, : Discarded datum D_unknown in Proj4 definition: +proj=longlat
## +ellps=GRS80 +no_defs
## OGR data source with driver: ESRI Shapefile
## Source: "D:\Kuliah S2 IPB\Bahan Kuliah\Semester 2 SSD 2020\STA533 Spasial\PRAKTIKUM\R\Map of Jawa (original)", layer: "jawa"
## with 116 features
## It has 5 fields
Melihat data:
head(jawa@data)## MISKIN KODE_KAB NAMA_KAB KODE_PROP NAMA_PROP
## 0 0 3501 Pacitan 35 Jawa Timur
## 1 0 3502 Ponorogo 35 Jawa Timur
## 2 0 3503 Trenggalek 35 Jawa Timur
## 3 0 3504 Tulungagung 35 Jawa Timur
## 4 0 3508 Lumajang 35 Jawa Timur
## 5 0 3511 Bondowoso 35 Jawa Timur
- Menampilkan Peta Pulau Jawa:
plot(jawa)- Menampilkan nama kota/kabupaten
plot(jawa)
text(jawa,'NAMA_KAB',cex=0.5)- Memberi warna yang berbeda utk setiap Propinsi
plot(jawa,col=jawa$KODE_PROP-30)Mengganti referensi warna:
Untuk memberikan warna peta menggunakan pallete untuk membatasi warna apa yang akan dipakai.
palette(rainbow(6))
plot(jawa, col=jawa$KODE_PROP-30)#setiap warna sesuai dengan ID-nya
# karena dibatasi hanya 6 warna sehingga ada beberapa warna yang sama pada suatu daerahpalette(terrain.colors(6))
plot(jawa, col=jawa$KODE_PROP-30)Konfigurasi Titik Ruang dalam Ruang (Responsi Pertemuan 2)
Review
Titik adalah objek dalam dimensi nol dan menggambarkan sifat dari titik menduduki ruang. Pola keseluruhan titik dalam ruang mencerminkan sifat keseluruhan titik tersebut. Pembahasan bukan membicarakan sebuah titik tapi keseluruhan titik dalam ruang.
Ada tiga pola titik:
Acak (Poisson) : setiap titik mempunyai peluang yang sama untuk menduduki suatu ruang dan tidak dipengaruhi oleh titik yang lain.
Uniform : setiap titik adalah sejauh mungkin dari titik-titik tetangganya.
Cluster : Banyak titik terkonsentrasi menduduki pada ruang yang sama, dan ruang yang lain sangat sedikit ditempati oleh titik.
First Approach: Quadrant Method
Metode Kuadran
Bagilah Daerah Studi menjadi beberapa sel yang berukuran sama. Ukuran Sel Ditentukan oleh skala yang diinginkan.
Tentukan Rata-rata Banyaknya Titik per sel.
Tentukan Variance banyaknya titik per sel.
Hitung perbandingan Ragam dengan Rata-rata (VMR).
Aplikasi pada R
library(spatstat)data(swedishpines)
help(swedishpines)Swedish Pines Point Pattern
Description
The data give the locations of pine saplings in a Swedish forest.
Usage
data(swedishpines)
Format
An object of class “ppp” representing the point pattern of tree locations in a rectangular plot 9.6 by 10 metres.
Cartesian coordinates are given in decimetres (multiples of 0.1 metre) rounded to the nearest decimetre. Type rescale(swedishpines) to get an equivalent dataset where the coordinates are expressed in metres.
See ppp.object for details of the format of a point pattern object.
X <- swedishpines
plot(X)sepintas terlihat acak
summary(X)## Planar point pattern: 71 points
## Average intensity 0.007395833 points per square unit (one unit = 0.1 metres)
##
## Coordinates are integers
## i.e. rounded to the nearest unit (one unit = 0.1 metres)
##
## Window: rectangle = [0, 96] x [0, 100] units
## Window area = 9600 square units
## Unit of length: 0.1 metres
Plot Contour seperti memprediksi ketinggian kepekatan menjadi dua dimensi. Jika pakai contour:
contour(density(X,10),axes = F)nx dan ny default nya 5 x 5 dibaginya.
q <- quadratcount(X, nx = 4, ny = 3)
q## x
## y [0,24) [24,48) [48,72) [72,96]
## [66.7,100] 7 3 6 5
## [33.3,66.7) 5 9 7 7
## [0,33.3) 4 3 6 9
plot(q)mu <- mean(q)
sigma <- sd(q)^2
VMR <- sigma/mu
VMR## [1] 0.6901408
quadrat.test(q) #H1 tidak sama dengan##
## Chi-squared test of CSR using quadrat counts
##
## data:
## X2 = 7.5915, df = 11, p-value = 0.5013
## alternative hypothesis: two.sided
##
## Quadrats: 4 by 3 grid of tiles
p-value = 0.5013 > alpha = 0.05 sehingga tidak tolak Ho berarti pada taraf alpha 5%, tidak ada bukti untuk menyatakan bahwa titik tidak menyebar acak.
quadrat.test(q, alt = "regular")##
## Chi-squared test of CSR using quadrat counts
##
## data:
## X2 = 7.5915, df = 11, p-value = 0.2506
## alternative hypothesis: regular
##
## Quadrats: 4 by 3 grid of tiles
p-value = 0.2506 > alpha = 0.05 sehingga tidak tolak Ho berarti pada taraf alpha 5%, tidak ada bukti untuk menyatakan bahwa titik tidak menyebar acak atau regular.
quadrat.test(q, alt = "cluster")##
## Chi-squared test of CSR using quadrat counts
##
## data:
## X2 = 7.5915, df = 11, p-value = 0.7494
## alternative hypothesis: clustered
##
## Quadrats: 4 by 3 grid of tiles
p-value = 0.7494 > alpha = 0.05 sehingga tidak tolak Ho berarti pada taraf alpha 5%, tidak ada bukti untuk menyatakan bahwa titik tidak menyebar acak atau cluster.
Second Approach: Empirical K-Function
nn <- nndist(swedishpines)
hist(nn)The Empirical K-Function
Application on R
K<- Kest(swedishpines, correction="Ripley")
plot(K)E<-envelope(swedishpines,Kest, nsim=99)## Generating 99 simulations of CSR ...
## 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27, 28, 29, 30, 31, 32, 33, 34, 35, 36, 37, 38, 39, 40,
## 41, 42, 43, 44, 45, 46, 47, 48, 49, 50, 51, 52, 53, 54, 55, 56, 57, 58, 59, 60, 61, 62, 63, 64, 65, 66, 67, 68, 69, 70, 71, 72, 73, 74, 75, 76, 77, 78, 79, 80,
## 81, 82, 83, 84, 85, 86, 87, 88, 89, 90, 91, 92, 93, 94, 95, 96, 97, 98, 99.
##
## Done.
plot(E) Non-graphical test
mad.test(swedishpines, Kest, nsim=99, alternative="two.sided")## Generating 99 simulations of CSR ...
## 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27, 28, 29, 30, 31, 32, 33, 34, 35, 36, 37, 38, 39, 40,
## 41, 42, 43, 44, 45, 46, 47, 48, 49, 50, 51, 52, 53, 54, 55, 56, 57, 58, 59, 60, 61, 62, 63, 64, 65, 66, 67, 68, 69, 70, 71, 72, 73, 74, 75, 76, 77, 78, 79, 80,
## 81, 82, 83, 84, 85, 86, 87, 88, 89, 90, 91, 92, 93, 94, 95, 96, 97, 98, 99.
##
## Done.
##
## Maximum absolute deviation test of CSR
## Monte Carlo test based on 99 simulations
## Summary function: K(r)
## Reference function: theoretical
## Alternative: two.sided
## Interval of distance values: [0, 24] units (one unit = 0.1 metres)
## Test statistic: Maximum absolute deviation
## Deviation = observed minus theoretical
##
## data: swedishpines
## mad = 150.69, rank = 22, p-value = 0.22
Menggunakan data external
Jenis data yang diperlukan
Import Data
Data dapat diunduh di: city.rds crime.rds
library(raster)
library(spatstat)city <- readRDS('city.rds')
crime <- readRDS('crime.rds')Konversi data menjadi titik point pattern
border<-city
coord.city<-city@polygons[[1]]@Polygons[[1]]@coords
window<-owin(poly=data.frame(x=rev(coord.city[,1]),
y=rev(coord.city[,2])))
plot(window)Menghitung titik di dalam kuadran
crime2 <- remove.duplicates(crime)## Warning in wkt(obj): CRS object has no comment
## Warning in wkt(obj): CRS object has no comment
crime2 <- crime2[crime,]## Warning in wkt(obj): CRS object has no comment
## Warning in wkt(obj): CRS object has no comment
crime2.ppp<-ppp(x=crime2@coords[,1],y=crime2@coords[,2],
window=window)## Warning: 5 points were rejected as lying outside the specified window
quad<-quadratcount(crime2.ppp)
plot(quad, col="red")
plot(crime2.ppp, add=T, pch=20, cex = 0.5)## Warning in plot.ppp(crime2.ppp, add = T, pch = 20, cex = 0.5): 5 illegal points
## also plotted
quadrat.test(crime2.ppp,alt="cluster")## Warning: Some expected counts are small; chi^2 approximation may be inaccurate
##
## Chi-squared test of CSR using quadrat counts
##
## data: crime2.ppp
## X2 = 480.83, df = 22, p-value < 2.2e-16
## alternative hypothesis: clustered
##
## Quadrats: 23 tiles (irregular windows)
Using K-function
K<- Kest(crime2.ppp,
correction="Ripley")
plot(K)mad.test(crime2.ppp, Kest, nsim = 20, alternative = "greater")## Generating 20 simulations of CSR ...
## 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20.
##
## Done.
##
## Maximum signed deviation test of CSR
## Monte Carlo test based on 20 simulations
## Summary function: K(r)
## Reference function: theoretical
## Alternative: greater
## Interval of distance values: [0, 3697.26712973043]
## Test statistic: Maximum signed deviation
## Deviation = observed minus theoretical
##
## data: crime2.ppp
## mad = 16518845, rank = 1, p-value = 0.04762
Simulasi Data
Poisson process
To create a Poisson process with uniform intensity of 50 over [0; 1] [0; 1]
set.seed(3108)
pp0 <- rpoispp(50)
plot(pp0)Matern Clustering
set.seed(3108)
pp3 <- rMatClust(12, 0.1, 4)
plot(pp3)Apakah data yang dibangkitkan selalu sesuai dengan yg diinginkan? belum tentu
Other generator function
rThomas
rCauchy
rVarGamma
rNeymanScott
rGaussPoisson
Other point pattern data
amacrine (rabbit amacrine cells, locations and 2 types)
anemones (sea anemones data, locations and sizes)
ants (ant nests data, location and 2 types)
bei (tropical rainforest trees, locations)
betacells (cat retinal ganglia data, locations, 2 types and sizes)
bramblecanes (Bramble Canes data, locations and 3 types)
cells (biological cells data, locations) chorley (cancer data, locations and 2 types) finpines (Finnish Pines data, locations and 2 size measures)
hamster (hamster tumour data, locations and 2 types)
japanesepines (Japanese Pines data, locations)
lansing (Lansing Woods data, locations and 6 types)
longleaf (Longleaf Pines data, locations and sizes)
nztrees (trees data, locations)
ponderosa (ponderosa pine trees data, locations)
redwood (redwood samplings data, locations)
spruces (Spruce trees in Saxonia, locations and sizes)
TERIMA KASIH
Referensi
Anisa, R. 2021.Pengenalan Struktur R untuk Data Spasial.Retrieved from newlms.ipb.ac.id
Anisa, R. 2021. Konfigurasi Titik Ruang. Retrieved from newlms.ipb.ac.id
Mahasiswa Pascasarjana Statistika dan Sains Data, IPB University, reniamelia@apps.ipb.ac.id↩︎