Closed spharsh closed 8 years ago
Can you provide a reproducible code sample that produces the error, please? Thanks!
The ui. R is
library(shiny) library(raster) library(leaflet) library(ggplot2)
shinyUI(navbarPage("Township Score", id="nav",
tabPanel("Township",div(class="outer",
tags$head(
# Include our custom CSS
includeCSS("C:/Users/Sprih/Desktop/R programming/abc/styles.css"),
includeScript("C:/Users/Sprih/Desktop/R programming/abc/gomap.js")
),
leafletOutput("mymap", width="100%", height="100%"),
absolutePanel(id = "controls", class = "panel panel-default", fixed = TRUE,draggable = TRUE, top = 60, left = "auto", right = 20, bottom = "auto",
width = 330, height = 600,h2("Parameters"),
sliderInput("bins","Range:",min = 10,max = 100,value = 30),
selectInput("radio", label = h3("Variables"),
choices = list("None"=1, "Aurora" = 2, "Beadle" = 3, "Brookings" = 4,"Codington"=5,"Clark"=6,"Brown"=7,"Clay"=8,"Campbell"=9,"Day"=10),
selected = 1),
selectInput("dataset", "Choose a dataset:",
choices = c("None","undulating", "flat", "riverine","rugged"),selected="None")
)
)), tabPanel("Data Explorer", sidebarLayout( sidebarPanel( sliderInput("n","Number of observations:", value = 500, min = 1, max = 1000) ), mainPanel( tabsetPanel(type = "tabs", tabPanel("Plot", plotOutput("plot")), tabPanel("Summary", verbatimTextOutput("summary")), tabPanel("Table", tableOutput("table")) ) )
)
)))
server.R is
library(shiny) library(leaflet) library(RColorBrewer) library(scales) library(lattice) library(dplyr) library(raster) library(leaflet) library(rgdal) library(rgeos)
set.seed(10) shinyServer(function(input, output, session) { output$mymap <- renderLeaflet({ broodr<-shapefile("C:/Users/Sprih/Desktop/files_research/Brood_Routes/Brood_Routes_used_for_maps.shp") gpa<-shapefile("C:/Users/Sprih/Desktop/files_research/GPA/GPA.shp") leaflet() %>% addTiles() %>% addPolygons(data=gpa1,fill = TRUE, stroke = TRUE, color = "#03F", group = "Study area") %>% addPolylines(data=bd1,fill=TRUE,fillColor="black") }) })
global.R is library(dplyr) library(raster) library(leaflet) library(rgdal)
brood <- shapefile("C:/Users/Sprih/Desktop/files_research/Brood_Routes/Brood_Routes_used_for_maps.shp") bd1<-readOGR("C:/Users/Sprih/Desktop/files_research/Brood_Routes","Brood_Routes_used_for_maps") bd1 = spTransform(bd1, CRS("+proj=longlat +datum=WGS84 +no_defs"))
gpa<-shapefile("C:/Users/Sprih/Desktop/files_research/GPA/GPA.shp") gpa1<-readOGR("C:/Users/Sprih/Desktop/files_research/GPA","GPA",stringsAsFactors = FALSE) print(proj4string(gpa1)) gpa1 = spTransform(gpa1, CRS("+proj=longlat +datum=WGS84 +no_defs"))
The above code works properly if I don't include " %>% addPolylines(data=bd1,fill=TRUE,fillColor="black")" in server.R and it throws error on using this line.
Please tell me where I am going wrong.
Thanks
So gpa1 does not cause a problem? Just bd1? Or do you need to remove both the addPolygons/gpa1 and addPolylines/bd1?
Can you call debug(addPolylines)
from the R console, then run the app, and when it breaks into the debugger, run str(data)
and tell me what it says?
Yeah so gpa1 is working fine and when I am trying to add another shapefile through addPolylines, its giving me that error.
So I called debug(addPolylines) as you suggested and then str(data) and I got the below result.
debugging in: addPolylines(., fill = FALSE) debug: { options = c(options, list(stroke = stroke, color = color, weight = weight, opacity = opacity, fill = fill, fillColor = fillColor, fillOpacity = fillOpacity, dashArray = dashArray, smoothFactor = smoothFactor, noClip = noClip)) pgons = derivePolygons(data, lng, lat, missing(lng), missing(lat), "addPolylines") invokeMethod(map, data, "addPolylines", pgons, layerId, group, options, popup) %>% expandLimitsBbox(pgons) } Browse[2]> str(data) Formal class 'SpatialLinesDataFrame' [package "sp"] with 4 slots ..@ data :'data.frame': 110 obs. of 9 variables: .. ..$ LENGTH : num [1:110] 30.1 30.1 30.2 30.3 30 ... .. ..$ COUNTY : Factor w/ 58 levels "Aurora","Beadle",..: 2 2 2 2 42 42 35 35 7 1 ... .. ..$ NAME : Factor w/ 108 levels "Aurora-Brule",..: 6 5 3 4 78 77 65 66 16 2 ... .. ..$ ID : Factor w/ 108 levels "01N","01W","03M",..: 9 8 6 7 82 81 69 70 25 20 ... .. ..$ CITY_AREA : Factor w/ 13 levels "Aberdeen","Brookings",..: 4 4 4 4 4 4 8 8 3 3 ... .. ..$ REGION : int [1:110] 3 3 3 3 3 3 3 3 2 3 ... .. ..$ CITY_AREA2: Factor w/ 9 levels "Brookings","Chamberlain",..: NA NA NA NA 3 3 1 NA NA 3 ... .. ..$ CITY_AREA3: Factor w/ 1 level "Pierre": NA NA NA NA NA NA NA NA NA NA ... .. ..$ notes : Factor w/ 3 levels "Route has been run this way for last 4 years",..: NA NA NA NA NA NA NA NA NA NA ... ..@ lines :List of 110 .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:8, 1:2] -98.4 -98.5 -98.5 -98.6 -98.6 ... .. .. .. ..@ ID : chr "0" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:6, 1:2] -98 -98.1 -98.1 -98.3 -98.3 ... .. .. .. ..@ ID : chr "1" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:15, 1:2] -97.9 -97.9 -97.9 -98.1 -98.1 ... .. .. .. ..@ ID : chr "2" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:6, 1:2] -98 -98.3 -98.3 -98.3 -98.3 ... .. .. .. ..@ ID : chr "3" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:4, 1:2] -97.4 -97.5 -97.5 -98 43.9 ... .. .. .. ..@ ID : chr "4" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:4, 1:2] -97.3 -97.7 -97.7 -97.9 44.1 ... .. .. .. ..@ ID : chr "5" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:12, 1:2] -96.9 -97 -97 -97.1 -97.1 ... .. .. .. ..@ ID : chr "6" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:15, 1:2] -96.9 -96.9 -97 -97 -97 ... .. .. .. ..@ ID : chr "7" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:8, 1:2] -98.8 -98.8 -98.8 -98.8 -99.1 ... .. .. .. ..@ ID : chr "8" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:13, 1:2] -98.3 -98.3 -98.5 -98.5 -98.6 ... .. .. .. ..@ ID : chr "9" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:8, 1:2] -98.4 -98.8 -98.8 -98.8 -98.9 ... .. .. .. ..@ ID : chr "10" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:10, 1:2] -98.9 -98.8 -98.8 -98.8 -98.8 ... .. .. .. ..@ ID : chr "11" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:22, 1:2] -99 -99 -99 -99.1 -99.1 ... .. .. .. ..@ ID : chr "12" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:15, 1:2] -98.4 -98.4 -98.4 -98.5 -98.5 ... .. .. .. ..@ ID : chr "13" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:15, 1:2] -98.4 -98.6 -98.6 -98.6 -98.6 ... .. .. .. ..@ ID : chr "14" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:13, 1:2] -97.8 -97.8 -97.8 -97.9 -97.9 ... .. .. .. ..@ ID : chr "15" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:10, 1:2] -97.9 -98 -98 -98 -98 ... .. .. .. ..@ ID : chr "16" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:19, 1:2] -97.2 -97.4 -97.4 -97.6 -97.6 ... .. .. .. ..@ ID : chr "17" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:15, 1:2] -97.1 -97.1 -97.2 -97.2 -97.2 ... .. .. .. ..@ ID : chr "18" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:12, 1:2] -96.5 -96.5 -96.5 -96.5 -96.6 ... .. .. .. ..@ ID : chr "19" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:6, 1:2] -96.5 -96.5 -96.5 -96.7 -96.7 ... .. .. .. ..@ ID : chr "20" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:14, 1:2] -96.9 -96.9 -96.9 -96.9 -97.1 ... .. .. .. ..@ ID : chr "21" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:11, 1:2] -97.3 -97.4 -97.4 -97.5 -97.5 ... .. .. .. ..@ ID : chr "22" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:10, 1:2] -97.1 -97.1 -97.1 -97.2 -97.2 ... .. .. .. ..@ ID : chr "23" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:8, 1:2] -96.9 -97.1 -97.1 -97.2 -97.2 ... .. .. .. ..@ ID : chr "24" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:27, 1:2] -96.6 -96.6 -96.6 -96.6 -96.6 ... .. .. .. ..@ ID : chr "25" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:2, 1:2] -96.5 -97.1 44.4 44.4 .. .. .. ..@ ID : chr "26" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:35, 1:2] -96.7 -96.7 -96.7 -96.7 -96.6 ... .. .. .. ..@ ID : chr "27" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:19, 1:2] -96.6 -96.6 -96.6 -96.6 -96.6 ... .. .. .. ..@ ID : chr "28" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:10, 1:2] -96.7 -97 -97 -97 -97 ... .. .. .. ..@ ID : chr "29" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:8, 1:2] -96.6 -96.6 -96.8 -96.8 -97 ... .. .. .. ..@ ID : chr "30" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:17, 1:2] -97.1 -97.3 -97.5 -97.5 -97.5 ... .. .. .. ..@ ID : chr "31" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:16, 1:2] -97.1 -97.2 -97.4 -97.4 -97.4 ... .. .. .. ..@ ID : chr "32" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:20, 1:2] -97.7 -97.8 -97.8 -97.9 -97.9 ... .. .. .. ..@ ID : chr "33" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 2 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:5, 1:2] -97.2 -97.3 -97.3 -97.3 -97.3 ... .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:7, 1:2] -97.4 -97.4 -97.5 -97.5 -97.6 ... .. .. .. ..@ ID : chr "34" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 2 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:5, 1:2] -97.5 -97.5 -97.5 -97.5 -97.6 ... .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:14, 1:2] -97.2 -97.2 -97.2 -97.3 -97.4 ... .. .. .. ..@ ID : chr "35" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:11, 1:2] -97.6 -97.6 -97.7 -97.7 -97.7 ... .. .. .. ..@ ID : chr "36" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:32, 1:2] -99.3 -99.3 -99.3 -99.3 -99.3 ... .. .. .. ..@ ID : chr "37" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:3, 1:2] -99.2 -99.5 -99.5 43.1 43.1 ... .. .. .. ..@ ID : chr "38" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:15, 1:2] -99.6 -99.7 -99.7 -99.7 -99.7 ... .. .. .. ..@ ID : chr "39" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:14, 1:2] -99.9 -99.9 -99.9 -99.9 -99.9 ... .. .. .. ..@ ID : chr "40" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:35, 1:2] -100 -100 -100 -100 -100 ... .. .. .. ..@ ID : chr "41" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:62, 1:2] -100 -100 -100 -100 -100 ... .. .. .. ..@ ID : chr "42" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:28, 1:2] -101 -101 -101 -101 -101 ... .. .. .. ..@ ID : chr "43" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:106, 1:2] -103 -103 -103 -103 -103 ... .. .. .. ..@ ID : chr "44" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:16, 1:2] -99.9 -99.9 -99.9 -99.9 -99.9 ... .. .. .. ..@ ID : chr "45" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:36, 1:2] -101 -101 -101 -101 -101 ... .. .. .. ..@ ID : chr "46" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:60, 1:2] -101 -101 -101 -101 -101 ... .. .. .. ..@ ID : chr "47" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:33, 1:2] -101 -101 -101 -101 -101 ... .. .. .. ..@ ID : chr "48" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 2 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:8, 1:2] -99.7 -99.7 -99.8 -99.8 -99.8 ... .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:24, 1:2] -100 -100 -100 -100 -100 ... .. .. .. ..@ ID : chr "49" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:91, 1:2] -99.8 -99.8 -99.8 -99.8 -99.8 ... .. .. .. ..@ ID : chr "50" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:16, 1:2] -98.7 -98.7 -98.7 -98.7 -98.7 ... .. .. .. ..@ ID : chr "51" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:21, 1:2] -98.8 -98.8 -98.8 -98.8 -98.9 ... .. .. .. ..@ ID : chr "52" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:62, 1:2] -99.1 -99.1 -99.1 -99.1 -99.1 ... .. .. .. ..@ ID : chr "53" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:39, 1:2] -100 -100 -100 -100 -100 ... .. .. .. ..@ ID : chr "54" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:8, 1:2] -99.6 -99.9 -99.9 -100.1 -100.1 ... .. .. .. ..@ ID : chr "55" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:17, 1:2] -99.8 -100 -100.1 -100.1 -100.1 ... .. .. .. ..@ ID : chr "56" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:9, 1:2] -99.7 -99.7 -99.7 -99.7 -99.9 ... .. .. .. ..@ ID : chr "57" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:31, 1:2] -101 -101 -101 -101 -101 ... .. .. .. ..@ ID : chr "58" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 2 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:14, 1:2] -99.8 -99.8 -99.8 -99.8 -99.8 ... .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:2, 1:2] -100.1 -100.2 45.5 45.5 .. .. .. ..@ ID : chr "59" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:22, 1:2] -99.1 -99.1 -99.1 -99.1 -99.1 ... .. .. .. ..@ ID : chr "60" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:11, 1:2] -98.8 -99 -99 -99.1 -99.1 ... .. .. .. ..@ ID : chr "61" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:11, 1:2] -98.7 -98.7 -98.8 -98.9 -99 ... .. .. .. ..@ ID : chr "62" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:6, 1:2] -98.7 -98.8 -98.8 -99 -99 ... .. .. .. ..@ ID : chr "63" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:12, 1:2] -98.7 -98.7 -98.7 -98.7 -98.8 ... .. .. .. ..@ ID : chr "64" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:9, 1:2] -98.9 -98.9 -98.9 -99 -99 ... .. .. .. ..@ ID : chr "65" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:16, 1:2] -98.1 -98.1 -98.2 -98.2 -98.2 ... .. .. .. ..@ ID : chr "66" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:8, 1:2] -98.3 -98.3 -98.3 -98.4 -98.6 ... .. .. .. ..@ ID : chr "67" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:17, 1:2] -98.3 -98.4 -98.4 -98.4 -98.4 ... .. .. .. ..@ ID : chr "68" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:7, 1:2] -98 -98 -98 -98 -98.1 ... .. .. .. ..@ ID : chr "69" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:15, 1:2] -98.2 -98.2 -98.2 -98.2 -98.2 ... .. .. .. ..@ ID : chr "70" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 2 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:13, 1:2] -98.1 -98.2 -98.2 -98.3 -98.3 ... .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:3, 1:2] -98 -98 -98.1 45.1 45.1 ... .. .. .. ..@ ID : chr "71" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:11, 1:2] -98 -98 -98.4 -98.4 -98.4 ... .. .. .. ..@ ID : chr "72" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:37, 1:2] -97.8 -97.8 -97.8 -97.8 -97.8 ... .. .. .. ..@ ID : chr "73" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:12, 1:2] -97.7 -97.7 -97.7 -97.9 -97.9 ... .. .. .. ..@ ID : chr "74" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:9, 1:2] -96.6 -96.6 -96.6 -96.6 -96.9 ... .. .. .. ..@ ID : chr "75" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:17, 1:2] -96.5 -96.5 -96.5 -96.5 -96.5 ... .. .. .. ..@ ID : chr "76" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:38, 1:2] -97.6 -97.6 -97.6 -97.6 -97.6 ... .. .. .. ..@ ID : chr "77" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:14, 1:2] -97.5 -97.5 -97.5 -97.5 -97.5 ... .. .. .. ..@ ID : chr "78" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:10, 1:2] -97.5 -97.5 -97.6 -97.6 -97.8 ... .. .. .. ..@ ID : chr "79" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:10, 1:2] -97.1 -97.1 -97.1 -97.1 -97.3 ... .. .. .. ..@ ID : chr "80" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 2 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:4, 1:2] -97.4 -97.4 -97.4 -97.5 44.8 ... .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:15, 1:2] -97 -97 -97 -97 -97.1 ... .. .. .. ..@ ID : chr "81" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 2 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:9, 1:2] -96.9 -96.9 -96.9 -96.9 -97 ... .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:2, 1:2] -97.1 -97.5 44.7 44.7 .. .. .. ..@ ID : chr "82" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 2 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:20, 1:2] -97.1 -97.1 -97.2 -97.2 -97.2 ... .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:4, 1:2] -96.9 -97 -97 -97 44.6 ... .. .. .. ..@ ID : chr "83" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:20, 1:2] -96.5 -96.5 -96.5 -96.5 -96.6 ... .. .. .. ..@ ID : chr "84" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:24, 1:2] -96.5 -96.5 -96.5 -96.5 -96.5 ... .. .. .. ..@ ID : chr "85" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:22, 1:2] -97 -97.1 -97.2 -97.2 -97.2 ... .. .. .. ..@ ID : chr "86" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:17, 1:2] -101 -101 -101 -101 -101 ... .. .. .. ..@ ID : chr "87" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:27, 1:2] -98.8 -98.8 -98.7 -98.7 -98.7 ... .. .. .. ..@ ID : chr "88" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:15, 1:2] -98.3 -98.3 -98.3 -98.3 -98.4 ... .. .. .. ..@ ID : chr "89" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:114, 1:2] -103 -103 -103 -103 -103 ... .. .. .. ..@ ID : chr "90" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 2 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:25, 1:2] -103 -103 -103 -103 -103 ... .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:44, 1:2] -102 -102 -102 -102 -102 ... .. .. .. ..@ ID : chr "91" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:44, 1:2] -96.7 -96.7 -96.7 -96.7 -96.7 ... .. .. .. ..@ ID : chr "92" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:43, 1:2] -100 -100 -100 -100 -100 ... .. .. .. ..@ ID : chr "93" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:30, 1:2] -99.9 -99.9 -99.9 -99.9 -99.9 ... .. .. .. ..@ ID : chr "94" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:37, 1:2] -98.3 -98.3 -98.3 -98.3 -98.4 ... .. .. .. ..@ ID : chr "95" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 2 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:6, 1:2] -100 -100 -100 -100 -100 ... .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:8, 1:2] -99.9 -99.9 -99.9 -99.9 -99.9 ... .. .. .. ..@ ID : chr "96" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:43, 1:2] -100 -100 -100 -100 -100 ... .. .. .. ..@ ID : chr "97" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:34, 1:2] -96.7 -96.7 -96.7 -96.7 -96.7 ... .. .. .. ..@ ID : chr "98" .. .. [list output truncated] ..@ bbox : num [1:2, 1:2] -103.5 42.6 -96.5 45.9 .. ..- 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 +datum=WGS84 +no_defs +ellps=WGS84 +towgs84=0,0,0" Browse[2]>
Is this what you are looking for??? I am sorry if it's not and please let me know what to do next. I would really appreciate your help.
On Tue, Mar 29, 2016 at 9:47 AM, Joe Cheng notifications@github.com wrote:
Can you call debug(addPolylines) from the R console, then run the app, and when it breaks into the debugger, run str(data) and tell me what it says?
— You are receiving this because you authored the thread. Reply to this email directly or view it on GitHub https://github.com/rstudio/leaflet/issues/254#issuecomment-202969029
I got this too:
.. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:15] -99.6 -99.7 -99.7 -99.7 -99.7 ... .. .. .. .. .. .. ..$ lat: num [1:15] 43.6 43.6 43.5 43.5 43.5 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:14] -99.9 -99.9 -99.9 -99.9 -99.9 ... .. .. .. .. .. .. ..$ lat: num [1:14] 43.3 43.3 43.3 43.3 43.3 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:35] -100 -100 -100 -100 -100 ... .. .. .. .. .. .. ..$ lat: num [1:35] 43.4 43.3 43.3 43.3 43.3 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:62] -100 -100 -100 -100 -100 ... .. .. .. .. .. .. ..$ lat: num [1:62] 43.7 43.7 43.6 43.6 43.6 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:28] -101 -101 -101 -101 -101 ... .. .. .. .. .. .. ..$ lat: num [1:28] 43.2 43.2 43.2 43.2 43.2 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:106] -103 -103 -103 -103 -103 ... .. .. .. .. .. .. ..$ lat: num [1:106] 43.4 43.4 43.4 43.4 43.4 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:16] -99.9 -99.9 -99.9 -99.9 -99.9 ... .. .. .. .. .. .. ..$ lat: num [1:16] 43.9 44 44 44 43.9 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:36] -101 -101 -101 -101 -101 ... .. .. .. .. .. .. ..$ lat: num [1:36] 43.9 43.9 43.9 44 44 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:60] -101 -101 -101 -101 -101 ... .. .. .. .. .. .. ..$ lat: num [1:60] 43.8 43.8 43.8 43.8 43.8 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:33] -101 -101 -101 -101 -101 ... .. .. .. .. .. .. ..$ lat: num [1:33] 44.1 44.1 44.1 44.1 44.1 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 2 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:8] -99.7 -99.7 -99.8 -99.8 -99.8 ... .. .. .. .. .. .. ..$ lat: num [1:8] 44.5 44.5 44.5 44.5 44.5 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:24] -100 -100 -100 -100 -100 ... .. .. .. .. .. .. ..$ lat: num [1:24] 44.5 44.5 44.5 44.5 44.5 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:91] -99.8 -99.8 -99.8 -99.8 -99.8 ... .. .. .. .. .. .. ..$ lat: num [1:91] 44.2 44.2 44.2 44.2 44.2 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:16] -98.7 -98.7 -98.7 -98.7 -98.7 ... .. .. .. .. .. .. ..$ lat: num [1:16] 44.6 44.7 44.7 44.7 44.7 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:21] -98.8 -98.8 -98.8 -98.8 -98.9 ... .. .. .. .. .. .. ..$ lat: num [1:21] 44.6 44.6 44.6 44.6 44.6 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:62] -99.1 -99.1 -99.1 -99.1 -99.1 ... .. .. .. .. .. .. ..$ lat: num [1:62] 44.5 44.5 44.5 44.5 44.5 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:39] -100 -100 -100 -100 -100 ... .. .. .. .. .. .. ..$ lat: num [1:39] 44.7 44.7 44.7 44.6 44.6 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:8] -99.6 -99.9 -99.9 -100.1 -100.1 ... .. .. .. .. .. .. ..$ lat: num [1:8] 44.9 44.9 44.9 44.9 44.9 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:17] -99.8 -100 -100.1 -100.1 -100.1 ... .. .. .. .. .. .. ..$ lat: num [1:17] 45.1 45.1 45.1 45.1 45.1 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:9] -99.7 -99.7 -99.7 -99.7 -99.9 ... .. .. .. .. .. .. ..$ lat: num [1:9] 45.2 45.2 45.2 45.1 45.1 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:31] -101 -101 -101 -101 -101 ... .. .. .. .. .. .. ..$ lat: num [1:31] 45.4 45.4 45.4 45.4 45.4 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 2 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:14] -99.8 -99.8 -99.8 -99.8 -99.8 ... .. .. .. .. .. .. ..$ lat: num [1:14] 45.4 45.5 45.5 45.5 45.5 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:2] -100 -100 .. .. .. .. .. .. ..$ lat: num [1:2] 45.5 45.5 .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:22] -99.1 -99.1 -99.1 -99.1 -99.1 ... .. .. .. .. .. .. ..$ lat: num [1:22] 45.9 45.9 45.9 45.9 45.9 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:11] -98.8 -99 -99 -99.1 -99.1 ... .. .. .. .. .. .. ..$ lat: num [1:11] 45.6 45.6 45.7 45.7 45.6 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:11] -98.7 -98.7 -98.8 -98.9 -99 ... .. .. .. .. .. .. ..$ lat: num [1:11] 45.5 45.5 45.5 45.5 45.5 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:6] -98.7 -98.8 -98.8 -99 -99 ... .. .. .. .. .. .. ..$ lat: num [1:6] 45.4 45.4 45.3 45.3 45.3 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:12] -98.7 -98.7 -98.7 -98.7 -98.8 ... .. .. .. .. .. .. ..$ lat: num [1:12] 45.1 45.2 45.2 45.2 45.2 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:9] -98.9 -98.9 -98.9 -99 -99 ... .. .. .. .. .. .. ..$ lat: num [1:9] 45 45 45 45 45 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:16] -98.1 -98.1 -98.2 -98.2 -98.2 ... .. .. .. .. .. .. ..$ lat: num [1:16] 45.9 45.9 45.9 45.9 45.9 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:8] -98.3 -98.3 -98.3 -98.4 -98.6 ... .. .. .. .. .. .. ..$ lat: num [1:8] 45.6 45.7 45.7 45.7 45.7 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:17] -98.3 -98.4 -98.4 -98.4 -98.4 ... .. .. .. .. .. .. ..$ lat: num [1:17] 45.3 45.3 45.3 45.3 45.3 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:7] -98 -98 -98 -98 -98.1 ... .. .. .. .. .. .. ..$ lat: num [1:7] 44.7 44.7 44.7 44.7 44.7 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:15] -98.2 -98.2 -98.2 -98.2 -98.2 ... .. .. .. .. .. .. ..$ lat: num [1:15] 44.8 44.8 44.8 44.8 44.8 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 2 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:13] -98.1 -98.2 -98.2 -98.3 -98.3 ... .. .. .. .. .. .. ..$ lat: num [1:13] 45.1 45.1 45.1 45.1 45.1 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:3] -98 -98 -98.1 .. .. .. .. .. .. ..$ lat: num [1:3] 45.1 45.1 45.1 .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:11] -98 -98 -98.4 -98.4 -98.4 ... .. .. .. .. .. .. ..$ lat: num [1:11] 45 45.1 45.1 45.1 45.1 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:37] -97.8 -97.8 -97.8 -97.8 -97.8 ... .. .. .. .. .. .. ..$ lat: num [1:37] 45.2 45.2 45.2 45.2 45.2 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:12] -97.7 -97.7 -97.7 -97.9 -97.9 ... .. .. .. .. .. .. ..$ lat: num [1:12] 45.6 45.6 45.6 45.6 45.7 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:9] -96.6 -96.6 -96.6 -96.6 -96.9 ... .. .. .. .. .. .. ..$ lat: num [1:9] 45.3 45.4 45.4 45.4 45.4 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:17] -96.5 -96.5 -96.5 -96.5 -96.5 ... .. .. .. .. .. .. ..$ lat: num [1:17] 45.3 45.3 45.2 45.2 45.2 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:38] -97.6 -97.6 -97.6 -97.6 -97.6 ... .. .. .. .. .. .. ..$ lat: num [1:38] 45 45 45 45 45 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:14] -97.5 -97.5 -97.5 -97.5 -97.5 ... .. .. .. .. .. .. ..$ lat: num [1:14] 44.9 44.9 44.9 44.9 44.9 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:10] -97.5 -97.5 -97.6 -97.6 -97.8 ... .. .. .. .. .. .. ..$ lat: num [1:10] 44.9 44.8 44.8 44.7 44.7 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:10] -97.1 -97.1 -97.1 -97.1 -97.3 ... .. .. .. .. .. .. ..$ lat: num [1:10] 45.1 45.1 45.1 45.1 45.1 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 2 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:4] -97.4 -97.4 -97.4 -97.5 .. .. .. .. .. .. ..$ lat: num [1:4] 44.8 44.8 44.8 44.8 .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:15] -97 -97 -97 -97 -97.1 ... .. .. .. .. .. .. ..$ lat: num [1:15] 44.8 44.8 44.8 44.8 44.8 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 2 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:9] -96.9 -96.9 -96.9 -96.9 -97 ... .. .. .. .. .. .. ..$ lat: num [1:9] 44.6 44.7 44.7 44.7 44.7 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:2] -97.1 -97.5 .. .. .. .. .. .. ..$ lat: num [1:2] 44.7 44.7 .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 2 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:20] -97.1 -97.1 -97.2 -97.2 -97.2 ... .. .. .. .. .. .. ..$ lat: num [1:20] 44.6 44.6 44.6 44.6 44.6 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:4] -96.9 -97 -97 -97 .. .. .. .. .. .. ..$ lat: num [1:4] 44.6 44.6 44.6 44.6 .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:20] -96.5 -96.5 -96.5 -96.5 -96.6 ... .. .. .. .. .. .. ..$ lat: num [1:20] 44.8 44.8 44.8 44.8 44.8 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:24] -96.5 -96.5 -96.5 -96.5 -96.5 ... .. .. .. .. .. .. ..$ lat: num [1:24] 44.6 44.6 44.6 44.6 44.6 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:22] -97 -97.1 -97.2 -97.2 -97.2 ... .. .. .. .. .. .. ..$ lat: num [1:22] 45 45 45 45 45 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:17] -101 -101 -101 -101 -101 ... .. .. .. .. .. .. ..$ lat: num [1:17] 44.4 44.4 44.4 44.4 44.4 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:27] -98.8 -98.8 -98.7 -98.7 -98.7 ... .. .. .. .. .. .. ..$ lat: num [1:27] 43.3 43.3 43.3 43.3 43.4 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:15] -98.3 -98.3 -98.3 -98.3 -98.4 ... .. .. .. .. .. .. ..$ lat: num [1:15] 43.3 43.3 43.4 43.4 43.4 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:114] -103 -103 -103 -103 -103 ... .. .. .. .. .. .. ..$ lat: num [1:114] 44.6 44.6 44.6 44.6 44.6 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 2 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:25] -103 -103 -103 -103 -103 ... .. .. .. .. .. .. ..$ lat: num [1:25] 45.7 45.7 45.7 45.7 45.7 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:44] -102 -102 -102 -102 -102 ... .. .. .. .. .. .. ..$ lat: num [1:44] 45.8 45.8 45.8 45.8 45.8 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:44] -96.7 -96.7 -96.7 -96.7 -96.7 ... .. .. .. .. .. .. ..$ lat: num [1:44] 45.8 45.8 45.8 45.8 45.8 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:43] -100 -100 -100 -100 -100 ... .. .. .. .. .. .. ..$ lat: num [1:43] 45.6 45.6 45.6 45.7 45.7 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:30] -99.9 -99.9 -99.9 -99.9 -99.9 ... .. .. .. .. .. .. ..$ lat: num [1:30] 45.6 45.6 45.7 45.7 45.7 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:37] -98.3 -98.3 -98.3 -98.3 -98.4 ... .. .. .. .. .. .. ..$ lat: num [1:37] 43.2 43.2 43.2 43.2 43.2 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 2 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:6] -100 -100 -100 -100 -100 ... .. .. .. .. .. .. ..$ lat: num [1:6] 43.8 43.8 43.8 43.8 43.8 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:8] -99.9 -99.9 -99.9 -99.9 -99.9 ... .. .. .. .. .. .. ..$ lat: num [1:8] 43.9 43.9 43.8 43.8 43.8 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:43] -100 -100 -100 -100 -100 ... .. .. .. .. .. .. ..$ lat: num [1:43] 45.4 45.4 45.4 45.4 45.4 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. ..$ :List of 1 .. .. .. .. .. ..$ :List of 2 .. .. .. .. .. .. ..$ lng: num [1:34] -96.7 -96.7 -96.7 -96.7 -96.7 ... .. .. .. .. .. .. ..$ lat: num [1:34] 43.7 43.7 43.7 43.7 43.7 ... .. .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. .. .. [list output truncated] .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. ..$ : NULL .. .. .. ..$ : NULL .. .. .. ..$ :List of 15 .. .. .. .. ..$ lineCap : NULL .. .. .. .. ..$ lineJoin : NULL .. .. .. .. ..$ clickable : logi TRUE .. .. .. .. ..$ pointerEvents: NULL .. .. .. .. ..$ className : chr "" .. .. .. .. ..$ stroke : logi TRUE .. .. .. .. ..$ color : chr "#03F" .. .. .. .. ..$ weight : num 5 .. .. .. .. ..$ opacity : num 0.5 .. .. .. .. ..$ fill : logi FALSE .. .. .. .. ..$ fillColor : chr "#03F" .. .. .. .. ..$ fillOpacity : num 0.2 .. .. .. .. ..$ dashArray : NULL .. .. .. .. ..$ smoothFactor : num 1 .. .. .. .. ..$ noClip : logi FALSE .. .. .. .. ..- attr(, "class")= chr "list" .. .. .. ..$ : NULL .. .. .. ..- attr(, "class")= chr "list" ..$ limits:List of 2 .. ..$ lat: num [1:2] 42.6 45.9 .. ..$ lng: num [1:2] -103.5 -96.5 ..- attr(, "leafletData")=Formal class 'SpatialLinesDataFrame' [package "sp"] with 4 slots .. .. ..@ data :'data.frame': 110 obs. of 9 variables: .. .. .. ..$ LENGTH : num [1:110] 30.1 30.1 30.2 30.3 30 ... .. .. .. ..$ COUNTY : Factor w/ 58 levels "Aurora","Beadle",..: 2 2 2 2 42 42 35 35 7 1 ... .. .. .. ..$ NAME : Factor w/ 108 levels "Aurora-Brule",..: 6 5 3 4 78 77 65 66 16 2 ... .. .. .. ..$ ID : Factor w/ 108 levels "01N","01W","03M",..: 9 8 6 7 82 81 69 70 25 20 ... .. .. .. ..$ CITY_AREA : Factor w/ 13 levels "Aberdeen","Brookings",..: 4 4 4 4 4 4 8 8 3 3 ... .. .. .. ..$ REGION : int [1:110] 3 3 3 3 3 3 3 3 2 3 ... .. .. .. ..$ CITY_AREA2: Factor w/ 9 levels "Brookings","Chamberlain",..: NA NA NA NA 3 3 1 NA NA 3 ... .. .. .. ..$ CITY_AREA3: Factor w/ 1 level "Pierre": NA NA NA NA NA NA NA NA NA NA ... .. .. .. ..$ notes : Factor w/ 3 levels "Route has been run this way for last 4 years",..: NA NA NA NA NA NA NA NA NA NA ... .. .. ..@ lines :List of 110 .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:8, 1:2] -98.4 -98.5 -98.5 -98.6 -98.6 ... .. .. .. .. .. ..@ ID : chr "0" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:6, 1:2] -98 -98.1 -98.1 -98.3 -98.3 ... .. .. .. .. .. ..@ ID : chr "1" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:15, 1:2] -97.9 -97.9 -97.9 -98.1 -98.1 ... .. .. .. .. .. ..@ ID : chr "2" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:6, 1:2] -98 -98.3 -98.3 -98.3 -98.3 ... .. .. .. .. .. ..@ ID : chr "3" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:4, 1:2] -97.4 -97.5 -97.5 -98 43.9 ... .. .. .. .. .. ..@ ID : chr "4" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:4, 1:2] -97.3 -97.7 -97.7 -97.9 44.1 ... .. .. .. .. .. ..@ ID : chr "5" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:12, 1:2] -96.9 -97 -97 -97.1 -97.1 ... .. .. .. .. .. ..@ ID : chr "6" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:15, 1:2] -96.9 -96.9 -97 -97 -97 ... .. .. .. .. .. ..@ ID : chr "7" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:8, 1:2] -98.8 -98.8 -98.8 -98.8 -99.1 ... .. .. .. .. .. ..@ ID : chr "8" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:13, 1:2] -98.3 -98.3 -98.5 -98.5 -98.6 ... .. .. .. .. .. ..@ ID : chr "9" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:8, 1:2] -98.4 -98.8 -98.8 -98.8 -98.9 ... .. .. .. .. .. ..@ ID : chr "10" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:10, 1:2] -98.9 -98.8 -98.8 -98.8 -98.8 ... .. .. .. .. .. ..@ ID : chr "11" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:22, 1:2] -99 -99 -99 -99.1 -99.1 ... .. .. .. .. .. ..@ ID : chr "12" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:15, 1:2] -98.4 -98.4 -98.4 -98.5 -98.5 ... .. .. .. .. .. ..@ ID : chr "13" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:15, 1:2] -98.4 -98.6 -98.6 -98.6 -98.6 ... .. .. .. .. .. ..@ ID : chr "14" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:13, 1:2] -97.8 -97.8 -97.8 -97.9 -97.9 ... .. .. .. .. .. ..@ ID : chr "15" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:10, 1:2] -97.9 -98 -98 -98 -98 ... .. .. .. .. .. ..@ ID : chr "16" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:19, 1:2] -97.2 -97.4 -97.4 -97.6 -97.6 ... .. .. .. .. .. ..@ ID : chr "17" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:15, 1:2] -97.1 -97.1 -97.2 -97.2 -97.2 ... .. .. .. .. .. ..@ ID : chr "18" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:12, 1:2] -96.5 -96.5 -96.5 -96.5 -96.6 ... .. .. .. .. .. ..@ ID : chr "19" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:6, 1:2] -96.5 -96.5 -96.5 -96.7 -96.7 ... .. .. .. .. .. ..@ ID : chr "20" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:14, 1:2] -96.9 -96.9 -96.9 -96.9 -97.1 ... .. .. .. .. .. ..@ ID : chr "21" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:11, 1:2] -97.3 -97.4 -97.4 -97.5 -97.5 ... .. .. .. .. .. ..@ ID : chr "22" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:10, 1:2] -97.1 -97.1 -97.1 -97.2 -97.2 ... .. .. .. .. .. ..@ ID : chr "23" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:8, 1:2] -96.9 -97.1 -97.1 -97.2 -97.2 ... .. .. .. .. .. ..@ ID : chr "24" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:27, 1:2] -96.6 -96.6 -96.6 -96.6 -96.6 ... .. .. .. .. .. ..@ ID : chr "25" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:2, 1:2] -96.5 -97.1 44.4 44.4 .. .. .. .. .. ..@ ID : chr "26" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:35, 1:2] -96.7 -96.7 -96.7 -96.7 -96.6 ... .. .. .. .. .. ..@ ID : chr "27" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:19, 1:2] -96.6 -96.6 -96.6 -96.6 -96.6 ... .. .. .. .. .. ..@ ID : chr "28" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:10, 1:2] -96.7 -97 -97 -97 -97 ... .. .. .. .. .. ..@ ID : chr "29" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:8, 1:2] -96.6 -96.6 -96.8 -96.8 -97 ... .. .. .. .. .. ..@ ID : chr "30" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:17, 1:2] -97.1 -97.3 -97.5 -97.5 -97.5 ... .. .. .. .. .. ..@ ID : chr "31" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:16, 1:2] -97.1 -97.2 -97.4 -97.4 -97.4 ... .. .. .. .. .. ..@ ID : chr "32" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:20, 1:2] -97.7 -97.8 -97.8 -97.9 -97.9 ... .. .. .. .. .. ..@ ID : chr "33" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 2 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:5, 1:2] -97.2 -97.3 -97.3 -97.3 -97.3 ... .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:7, 1:2] -97.4 -97.4 -97.5 -97.5 -97.6 ... .. .. .. .. .. ..@ ID : chr "34" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 2 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:5, 1:2] -97.5 -97.5 -97.5 -97.5 -97.6 ... .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:14, 1:2] -97.2 -97.2 -97.2 -97.3 -97.4 ... .. .. .. .. .. ..@ ID : chr "35" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:11, 1:2] -97.6 -97.6 -97.7 -97.7 -97.7 ... .. .. .. .. .. ..@ ID : chr "36" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:32, 1:2] -99.3 -99.3 -99.3 -99.3 -99.3 ... .. .. .. .. .. ..@ ID : chr "37" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:3, 1:2] -99.2 -99.5 -99.5 43.1 43.1 ... .. .. .. .. .. ..@ ID : chr "38" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:15, 1:2] -99.6 -99.7 -99.7 -99.7 -99.7 ... .. .. .. .. .. ..@ ID : chr "39" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:14, 1:2] -99.9 -99.9 -99.9 -99.9 -99.9 ... .. .. .. .. .. ..@ ID : chr "40" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:35, 1:2] -100 -100 -100 -100 -100 ... .. .. .. .. .. ..@ ID : chr "41" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:62, 1:2] -100 -100 -100 -100 -100 ... .. .. .. .. .. ..@ ID : chr "42" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:28, 1:2] -101 -101 -101 -101 -101 ... .. .. .. .. .. ..@ ID : chr "43" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:106, 1:2] -103 -103 -103 -103 -103 ... .. .. .. .. .. ..@ ID : chr "44" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:16, 1:2] -99.9 -99.9 -99.9 -99.9 -99.9 ... .. .. .. .. .. ..@ ID : chr "45" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:36, 1:2] -101 -101 -101 -101 -101 ... .. .. .. .. .. ..@ ID : chr "46" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:60, 1:2] -101 -101 -101 -101 -101 ... .. .. .. .. .. ..@ ID : chr "47" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:33, 1:2] -101 -101 -101 -101 -101 ... .. .. .. .. .. ..@ ID : chr "48" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 2 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:8, 1:2] -99.7 -99.7 -99.8 -99.8 -99.8 ... .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:24, 1:2] -100 -100 -100 -100 -100 ... .. .. .. .. .. ..@ ID : chr "49" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:91, 1:2] -99.8 -99.8 -99.8 -99.8 -99.8 ... .. .. .. .. .. ..@ ID : chr "50" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:16, 1:2] -98.7 -98.7 -98.7 -98.7 -98.7 ... .. .. .. .. .. ..@ ID : chr "51" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:21, 1:2] -98.8 -98.8 -98.8 -98.8 -98.9 ... .. .. .. .. .. ..@ ID : chr "52" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:62, 1:2] -99.1 -99.1 -99.1 -99.1 -99.1 ... .. .. .. .. .. ..@ ID : chr "53" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:39, 1:2] -100 -100 -100 -100 -100 ... .. .. .. .. .. ..@ ID : chr "54" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:8, 1:2] -99.6 -99.9 -99.9 -100.1 -100.1 ... .. .. .. .. .. ..@ ID : chr "55" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:17, 1:2] -99.8 -100 -100.1 -100.1 -100.1 ... .. .. .. .. .. ..@ ID : chr "56" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:9, 1:2] -99.7 -99.7 -99.7 -99.7 -99.9 ... .. .. .. .. .. ..@ ID : chr "57" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:31, 1:2] -101 -101 -101 -101 -101 ... .. .. .. .. .. ..@ ID : chr "58" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 2 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:14, 1:2] -99.8 -99.8 -99.8 -99.8 -99.8 ... .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:2, 1:2] -100.1 -100.2 45.5 45.5 .. .. .. .. .. ..@ ID : chr "59" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:22, 1:2] -99.1 -99.1 -99.1 -99.1 -99.1 ... .. .. .. .. .. ..@ ID : chr "60" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:11, 1:2] -98.8 -99 -99 -99.1 -99.1 ... .. .. .. .. .. ..@ ID : chr "61" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:11, 1:2] -98.7 -98.7 -98.8 -98.9 -99 ... .. .. .. .. .. ..@ ID : chr "62" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:6, 1:2] -98.7 -98.8 -98.8 -99 -99 ... .. .. .. .. .. ..@ ID : chr "63" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:12, 1:2] -98.7 -98.7 -98.7 -98.7 -98.8 ... .. .. .. .. .. ..@ ID : chr "64" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:9, 1:2] -98.9 -98.9 -98.9 -99 -99 ... .. .. .. .. .. ..@ ID : chr "65" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:16, 1:2] -98.1 -98.1 -98.2 -98.2 -98.2 ... .. .. .. .. .. ..@ ID : chr "66" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:8, 1:2] -98.3 -98.3 -98.3 -98.4 -98.6 ... .. .. .. .. .. ..@ ID : chr "67" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:17, 1:2] -98.3 -98.4 -98.4 -98.4 -98.4 ... .. .. .. .. .. ..@ ID : chr "68" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:7, 1:2] -98 -98 -98 -98 -98.1 ... .. .. .. .. .. ..@ ID : chr "69" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:15, 1:2] -98.2 -98.2 -98.2 -98.2 -98.2 ... .. .. .. .. .. ..@ ID : chr "70" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 2 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:13, 1:2] -98.1 -98.2 -98.2 -98.3 -98.3 ... .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:3, 1:2] -98 -98 -98.1 45.1 45.1 ... .. .. .. .. .. ..@ ID : chr "71" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:11, 1:2] -98 -98 -98.4 -98.4 -98.4 ... .. .. .. .. .. ..@ ID : chr "72" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:37, 1:2] -97.8 -97.8 -97.8 -97.8 -97.8 ... .. .. .. .. .. ..@ ID : chr "73" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:12, 1:2] -97.7 -97.7 -97.7 -97.9 -97.9 ... .. .. .. .. .. ..@ ID : chr "74" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:9, 1:2] -96.6 -96.6 -96.6 -96.6 -96.9 ... .. .. .. .. .. ..@ ID : chr "75" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:17, 1:2] -96.5 -96.5 -96.5 -96.5 -96.5 ... .. .. .. .. .. ..@ ID : chr "76" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:38, 1:2] -97.6 -97.6 -97.6 -97.6 -97.6 ... .. .. .. .. .. ..@ ID : chr "77" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:14, 1:2] -97.5 -97.5 -97.5 -97.5 -97.5 ... .. .. .. .. .. ..@ ID : chr "78" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:10, 1:2] -97.5 -97.5 -97.6 -97.6 -97.8 ... .. .. .. .. .. ..@ ID : chr "79" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:10, 1:2] -97.1 -97.1 -97.1 -97.1 -97.3 ... .. .. .. .. .. ..@ ID : chr "80" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 2 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:4, 1:2] -97.4 -97.4 -97.4 -97.5 44.8 ... .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:15, 1:2] -97 -97 -97 -97 -97.1 ... .. .. .. .. .. ..@ ID : chr "81" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 2 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:9, 1:2] -96.9 -96.9 -96.9 -96.9 -97 ... .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:2, 1:2] -97.1 -97.5 44.7 44.7 .. .. .. .. .. ..@ ID : chr "82" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 2 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:20, 1:2] -97.1 -97.1 -97.2 -97.2 -97.2 ... .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:4, 1:2] -96.9 -97 -97 -97 44.6 ... .. .. .. .. .. ..@ ID : chr "83" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:20, 1:2] -96.5 -96.5 -96.5 -96.5 -96.6 ... .. .. .. .. .. ..@ ID : chr "84" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:24, 1:2] -96.5 -96.5 -96.5 -96.5 -96.5 ... .. .. .. .. .. ..@ ID : chr "85" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:22, 1:2] -97 -97.1 -97.2 -97.2 -97.2 ... .. .. .. .. .. ..@ ID : chr "86" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:17, 1:2] -101 -101 -101 -101 -101 ... .. .. .. .. .. ..@ ID : chr "87" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:27, 1:2] -98.8 -98.8 -98.7 -98.7 -98.7 ... .. .. .. .. .. ..@ ID : chr "88" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:15, 1:2] -98.3 -98.3 -98.3 -98.3 -98.4 ... .. .. .. .. .. ..@ ID : chr "89" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:114, 1:2] -103 -103 -103 -103 -103 ... .. .. .. .. .. ..@ ID : chr "90" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 2 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:25, 1:2] -103 -103 -103 -103 -103 ... .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:44, 1:2] -102 -102 -102 -102 -102 ... .. .. .. .. .. ..@ ID : chr "91" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:44, 1:2] -96.7 -96.7 -96.7 -96.7 -96.7 ... .. .. .. .. .. ..@ ID : chr "92" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:43, 1:2] -100 -100 -100 -100 -100 ... .. .. .. .. .. ..@ ID : chr "93" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:30, 1:2] -99.9 -99.9 -99.9 -99.9 -99.9 ... .. .. .. .. .. ..@ ID : chr "94" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:37, 1:2] -98.3 -98.3 -98.3 -98.3 -98.4 ... .. .. .. .. .. ..@ ID : chr "95" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 2 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:6, 1:2] -100 -100 -100 -100 -100 ... .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:8, 1:2] -99.9 -99.9 -99.9 -99.9 -99.9 ... .. .. .. .. .. ..@ ID : chr "96" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:43, 1:2] -100 -100 -100 -100 -100 ... .. .. .. .. .. ..@ ID : chr "97" .. .. .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. .. .. ..@ Lines:List of 1 .. .. .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. .. .. ..@ coords: num [1:34, 1:2] -96.7 -96.7 -96.7 -96.7 -96.7 ... .. .. .. .. .. ..@ ID : chr "98" .. .. .. .. [list output truncated] .. .. ..@ bbox : num [1:2, 1:2] -103.5 42.6 -96.5 45.9 .. .. .. ..- 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 +datum=WGS84 +no_defs +ellps=WGS84 +towgs84=0,0,0" $ width : NULL $ height : NULL $ sizingPolicy :List of 6 ..$ defaultWidth : chr "100%" ..$ defaultHeight: num 400 ..$ padding : num 0 ..$ viewer :List of 6 .. ..$ defaultWidth : NULL .. ..$ defaultHeight: NULL .. ..$ padding : NULL .. ..$ fill : logi TRUE .. ..$ suppress : logi FALSE .. ..$ paneHeight : NULL ..$ browser :List of 4 .. ..$ defaultWidth : NULL .. ..$ defaultHeight: NULL .. ..$ padding : NULL .. ..$ fill : logi TRUE ..$ knitr :List of 3 .. ..$ defaultWidth : NULL .. ..$ defaultHeight: NULL .. ..$ figure : logi TRUE $ dependencies : NULL $ elementId : NULL $ preRenderHook: NULL $ jsHooks : list()
On Tue, Mar 29, 2016 at 10:26 AM, sprih harsh sprih.harsh@gmail.com wrote:
Yeah so gpa1 is working fine and when I am trying to add another shapefile through addPolylines, its giving me that error.
So I called debug(addPolylines) as you suggested and then str(data) and I got the below result.
debugging in: addPolylines(., fill = FALSE) debug: { options = c(options, list(stroke = stroke, color = color, weight = weight, opacity = opacity, fill = fill, fillColor = fillColor, fillOpacity = fillOpacity, dashArray = dashArray, smoothFactor = smoothFactor, noClip = noClip)) pgons = derivePolygons(data, lng, lat, missing(lng), missing(lat), "addPolylines") invokeMethod(map, data, "addPolylines", pgons, layerId, group, options, popup) %>% expandLimitsBbox(pgons) } Browse[2]> str(data) Formal class 'SpatialLinesDataFrame' [package "sp"] with 4 slots ..@ data :'data.frame': 110 obs. of 9 variables: .. ..$ LENGTH : num [1:110] 30.1 30.1 30.2 30.3 30 ... .. ..$ COUNTY : Factor w/ 58 levels "Aurora","Beadle",..: 2 2 2 2 42 42 35 35 7 1 ... .. ..$ NAME : Factor w/ 108 levels "Aurora-Brule",..: 6 5 3 4 78 77 65 66 16 2 ... .. ..$ ID : Factor w/ 108 levels "01N","01W","03M",..: 9 8 6 7 82 81 69 70 25 20 ... .. ..$ CITY_AREA : Factor w/ 13 levels "Aberdeen","Brookings",..: 4 4 4 4 4 4 8 8 3 3 ... .. ..$ REGION : int [1:110] 3 3 3 3 3 3 3 3 2 3 ... .. ..$ CITY_AREA2: Factor w/ 9 levels "Brookings","Chamberlain",..: NA NA NA NA 3 3 1 NA NA 3 ... .. ..$ CITY_AREA3: Factor w/ 1 level "Pierre": NA NA NA NA NA NA NA NA NA NA ... .. ..$ notes : Factor w/ 3 levels "Route has been run this way for last 4 years",..: NA NA NA NA NA NA NA NA NA NA ... ..@ lines :List of 110 .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:8, 1:2] -98.4 -98.5 -98.5 -98.6 -98.6 ... .. .. .. ..@ ID : chr "0" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:6, 1:2] -98 -98.1 -98.1 -98.3 -98.3 ... .. .. .. ..@ ID : chr "1" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:15, 1:2] -97.9 -97.9 -97.9 -98.1 -98.1 ... .. .. .. ..@ ID : chr "2" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:6, 1:2] -98 -98.3 -98.3 -98.3 -98.3 ... .. .. .. ..@ ID : chr "3" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:4, 1:2] -97.4 -97.5 -97.5 -98 43.9 ... .. .. .. ..@ ID : chr "4" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:4, 1:2] -97.3 -97.7 -97.7 -97.9 44.1 ... .. .. .. ..@ ID : chr "5" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:12, 1:2] -96.9 -97 -97 -97.1 -97.1 ... .. .. .. ..@ ID : chr "6" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:15, 1:2] -96.9 -96.9 -97 -97 -97 ... .. .. .. ..@ ID : chr "7" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:8, 1:2] -98.8 -98.8 -98.8 -98.8 -99.1 ... .. .. .. ..@ ID : chr "8" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:13, 1:2] -98.3 -98.3 -98.5 -98.5 -98.6 ... .. .. .. ..@ ID : chr "9" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:8, 1:2] -98.4 -98.8 -98.8 -98.8 -98.9 ... .. .. .. ..@ ID : chr "10" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:10, 1:2] -98.9 -98.8 -98.8 -98.8 -98.8 ... .. .. .. ..@ ID : chr "11" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:22, 1:2] -99 -99 -99 -99.1 -99.1 ... .. .. .. ..@ ID : chr "12" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:15, 1:2] -98.4 -98.4 -98.4 -98.5 -98.5 ... .. .. .. ..@ ID : chr "13" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:15, 1:2] -98.4 -98.6 -98.6 -98.6 -98.6 ... .. .. .. ..@ ID : chr "14" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:13, 1:2] -97.8 -97.8 -97.8 -97.9 -97.9 ... .. .. .. ..@ ID : chr "15" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:10, 1:2] -97.9 -98 -98 -98 -98 ... .. .. .. ..@ ID : chr "16" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:19, 1:2] -97.2 -97.4 -97.4 -97.6 -97.6 ... .. .. .. ..@ ID : chr "17" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:15, 1:2] -97.1 -97.1 -97.2 -97.2 -97.2 ... .. .. .. ..@ ID : chr "18" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:12, 1:2] -96.5 -96.5 -96.5 -96.5 -96.6 ... .. .. .. ..@ ID : chr "19" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:6, 1:2] -96.5 -96.5 -96.5 -96.7 -96.7 ... .. .. .. ..@ ID : chr "20" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:14, 1:2] -96.9 -96.9 -96.9 -96.9 -97.1 ... .. .. .. ..@ ID : chr "21" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:11, 1:2] -97.3 -97.4 -97.4 -97.5 -97.5 ... .. .. .. ..@ ID : chr "22" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:10, 1:2] -97.1 -97.1 -97.1 -97.2 -97.2 ... .. .. .. ..@ ID : chr "23" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:8, 1:2] -96.9 -97.1 -97.1 -97.2 -97.2 ... .. .. .. ..@ ID : chr "24" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:27, 1:2] -96.6 -96.6 -96.6 -96.6 -96.6 ... .. .. .. ..@ ID : chr "25" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:2, 1:2] -96.5 -97.1 44.4 44.4 .. .. .. ..@ ID : chr "26" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:35, 1:2] -96.7 -96.7 -96.7 -96.7 -96.6 ... .. .. .. ..@ ID : chr "27" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:19, 1:2] -96.6 -96.6 -96.6 -96.6 -96.6 ... .. .. .. ..@ ID : chr "28" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:10, 1:2] -96.7 -97 -97 -97 -97 ... .. .. .. ..@ ID : chr "29" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:8, 1:2] -96.6 -96.6 -96.8 -96.8 -97 ... .. .. .. ..@ ID : chr "30" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num [1:17, 1:2] -97.1 -97.3 -97.5 -97.5 -97.5 ... .. .. .. ..@ ID : chr "31" .. ..$ :Formal class 'Lines' [package "sp"] with 2 slots .. .. .. ..@ Lines:List of 1 .. .. .. .. ..$ :Formal class 'Line' [package "sp"] with 1 slot .. .. .. .. .. .. ..@ coords: num
Sorry, I never replied to this. In the second instance, it seems that somehow the Leaflet map object itself is being passed as the data
argument to addPolylines
.
For passerby, you need to specify data = PolygonData
leaflet(data) %>% ... addPolygons(data = PolygonData, ...)
Otherwise the map object gets pushed into the data argument of addPolygons.
@1beb @joshfrench why are two separate objects, data
and PolygonData
are being passed to leaflet
and addPolygons
respectively?
Apologies, I don't recall. It was 4 years ago!
I am trying to read shapefiles through leaflet package in shiny app. It gives me above error on executing following code
leaflet() %>% addTiles() %>% addPolygons(data=gpa1,fill = TRUE, stroke = TRUE, color = "#03F", group = "Study area")
but the error is gone when i do this leaflet(data=gpa1) %>% addTiles() %>% addPolygons(fill = TRUE, stroke = TRUE, color = "#03F", group = "Study area")
I checked type of gpa1 is SpatialPolygonsDataFrame.
Any help will be really appreciated.