O ggplot é uma função da linguagem R, do package
ggplot2
, usado para a construção de gráficos e lidar com
dados estatísticos. Nele, é possíve criar diferentes tipos de gráficos,
com diferentes configurações, para diferentes tipos de demandas.
Se você já usa o R há algum tempo, e precisou criar gráficos, você já
deve saber, mas se você começou agora nesse mundo, saiba que é possível
criar gráficos apenas com o R, sem precisar de um package extra. Essas
são as funções como plot()
, boxplot()
e
hist()
.
Por mais que os plots normais sejam mais fáceis de aprender, e relativamente mais rápidos, são muito rígidos e poucos práticos para configurá-los. No dia-a-dia das pesquisas, análises e relatórios, onde se está todo dia com diferentes tipos de dados, situações, exigências e demandas singulares, tanto para as análises quanto para expor esses resultados de diferentes maneiras a um público, como a apresentação de um seminário, uma banca avaliadora ou até uma empresa que contratou seus serviços, ter uma ferramenta como o ggplot, que permite que seja possível criar uma maior gama de diferentes tipos de gráficos, pode acabar sendo a diferença entre um gráfico informativo, prático e que economize tempo e dinheiro para entender um resultado e tomar uma decisão, e um gráfico ilegível e pouco entendível, gerando conflitos de interpretações, perda de tempo, de dinheiro, e até correndo o risco de tomar uma decisão errada. Tendo entendido o valor de se dedicar a entender e dominar o ggplot, vamos agora sim dar os primeiros passos.
library(tidyverse)
Foi carregado o package tidyverse
, que, aumaticamente,
carrega o package ggplot2
.
SW<-starwars
SW
## # A tibble: 87 × 14
## name height mass hair_…¹ skin_…² eye_c…³ birth…⁴ sex gender homew…⁵
## <chr> <int> <dbl> <chr> <chr> <chr> <dbl> <chr> <chr> <chr>
## 1 Luke Skywa… 172 77 blond fair blue 19 male mascu… Tatooi…
## 2 C-3PO 167 75 <NA> gold yellow 112 none mascu… Tatooi…
## 3 R2-D2 96 32 <NA> white,… red 33 none mascu… Naboo
## 4 Darth Vader 202 136 none white yellow 41.9 male mascu… Tatooi…
## 5 Leia Organa 150 49 brown light brown 19 fema… femin… Aldera…
## 6 Owen Lars 178 120 brown,… light blue 52 male mascu… Tatooi…
## 7 Beru White… 165 75 brown light blue 47 fema… femin… Tatooi…
## 8 R5-D4 97 32 <NA> white,… red NA none mascu… Tatooi…
## 9 Biggs Dark… 183 84 black light brown 24 male mascu… Tatooi…
## 10 Obi-Wan Ke… 182 77 auburn… fair blue-g… 57 male mascu… Stewjon
## # … with 77 more rows, 4 more variables: species <chr>, films <list>,
## # vehicles <list>, starships <list>, and abbreviated variable names
## # ¹hair_color, ²skin_color, ³eye_color, ⁴birth_year, ⁵homeworld
Essa é uma base de dados já pronta do package ggplot2
,
sem ser necessário carregá-la externamente. Basta apenas chama-la por
“starwars”. É uma base de dados de diversos personagens da franquia Star
Wars, com dados como altura, peso, gênero, sexo, etc. Há outras bases no
ggplot2, que também podem ser utilizadas. É aconselhado sempre ler antes
sua base de dados, para saber os tipos de dados que está lidando, como
irá ser feito as análises, o gráfico, etc. Para ser mais fácil, essa
base de dados foi atribuída ao objeto SW
. Não apenas o
package ggplot2, mas o próprio R possui bases de dddados já carregadas
que você pode acessar, como a base de dados iris
.
windowsFonts(TimesNewRoman = windowsFont("Times New Roman"))
tema<-theme(text=element_text(family="TimesNewRoman"),
title=element_text(color="black",size=15),
axis.text = element_text(color="black",size=10),
axis.title = element_text(color="black",size=10),
panel.grid=element_line(color="grey75",linetype = "dashed",size=.8),
axis.line=element_blank(),
plot.background=element_rect(fill="white",color="white"),
panel.background=element_rect(fill="white"),
panel.border = element_rect(colour = "black", fill = NA,size=0.59),
legend.key= element_rect(color="white",fill="white"))
## Warning: The `size` argument of `element_rect()` is deprecated as of ggplot2 3.4.0.
## ℹ Please use the `linewidth` argument instead.
## Warning: The `size` argument of `element_line()` is deprecated as of ggplot2 3.4.0.
## ℹ Please use the `linewidth` argument instead.
Os gráficos podem ser personalizados em relação à sua estetítica,
escolhendo as cores do fundo, dos valores e das linhas de grade. Usa-se
a função theme()
para isso, e atribuiu o tema criado ao
objeto tema
. Será abordado com mais detalhes sobre isso no
capítulo 17.
SW %>%
ggplot(aes(height,mass))+
tema
Foi adicionada a função %\>%
(pipe) à frente da base
de dados SW
. Essa é uma função do package
tidyr
, e serve para informar que comandos serão usados em
sequência. Nesse caso, foi utilizado para indicar que que os dados
utilizados no ggplot serão da base de dados SW
.
Alternativamente, dentro de ggplot()
, é possível usar o
comando data=
, para indicar a base de dados que será
utilizada. Logo abaixo, fez-se a construção do ggplot, onde uma das
primeiras coisas ao se fazer no ggplot é especificar os eixos a serem
usados. Para isso, usa-se a função aes()
(aesthetically),
que é a função que lida com a estética do gráfico, para indicar os
eixos. O primeiro termo que você utilizar em aes()
sempre
será o eixo X
, e o segundo, o eixo Y
. Nestes,
estarão variáveis da própria base de dados.
color=
, fill=
, alpha=
e
label=
SW %>%
ggplot(aes(x=eye_color,y=mass))+
geom_boxplot(color="black",fill="green")+
geom_label(aes(label=name),size=2,alpha=0.2)+
tema
## Warning: Removed 28 rows containing non-finite values (`stat_boxplot()`).
## Warning: Removed 28 rows containing missing values (`geom_label()`).
SW %>%
ggplot(aes(x=eye_color,y=mass))+
geom_boxplot(color="black",fill="green")+
geom_text(aes(label=name),size=2.5,alpha=1)+
tema
## Warning: Removed 28 rows containing non-finite values (`stat_boxplot()`).
## Warning: Removed 28 rows containing missing values (`geom_text()`).
4 dos principais comandos que controlam as estéticas dos gráficos no ggplot são:
color: controla a cor de contorno que será utilizada;
fill: controla a cor de preenchimento que será utilizada;
alpha: controla a transparência do objeto do gráfico, onde varia de 0 (valor mínimo) até 1 (valor máximo);
label: controla os rótulos, caso use o comando
geom_label()
(primeiro gráfico), ou textos, caso use o
comando geom_text()
(segundo gráfico), que serão
utilizados. Neste caso, tanto nos comandos geom_label()
quanto geom_text()
usaram o um
label=variável escolhida da base de dados
dentro de um
aes()
.
O R usa um sistema de cores bastante vasto. É possível selecionar a cor colocando o nome da cor em inglês entre aspas (como na imagem abaixo), ou utilizando o sistema Color-Hex, que consiste em um # seguido por código com 6 caractéres. Os gráfico utilizados foram do tipo boxplot, que será melhor abordado no capítulo 13.
As diversas tonalidades e paletas de cores que o R
permite para o color=
e o fill=
. Ao serem
urilizadas, devem estre entre aspas.
SW %>%
ggplot(aes(height,mass))+
labs(title="gráfico",
x="eixo x",
y="eixo y",
caption ="nota de roda-pé")+
tema
Mais ainda, é possível selecionar como estarão o título e os eixos,
através da função labs()
:
title: adiciona o título ao gráfico;
x: adiciona e altera o título do eixo X;
y: adiciona e altera o título do eixo y;
caption: adiciona uma nota de roda-pé.
Além destes comandos básicos, todos aqueles que inseridos dentro do
comando aes()
podem ser adicionados e alterados no comando
labs()
. exemplos são os comandos color=
,
fill=
, alpha=
e label=
. Se algum
desses comandos for utilizado dentro do comando aes()
,
serão atribuidos à estas variáveis da base de dados, e para alterar o
título destas nas legendas, basta apenas usar o mesmo comando em
labs()
, e atribuir o título que deseja. Exemplo:
SW %>%
ggplot(aes(x=height,y=mass,color=sex,fill=gender,alpha=birth_year,label=name))+
geom_point()+
geom_label(size=0.5)+
labs(title="exemplo",
x="altura",
y="massa",
color="sexo do personagem",
fill="gênero do personagem",
alpha="ano de nascimento do personagem",
label="nome do personagem")+
tema
## Warning: Removed 28 rows containing missing values (`geom_point()`).
## Warning: Removed 28 rows containing missing values (`geom_label()`).
O hisograma é utilizado para criar uma distribuição de frequências,
quando deseja-se divdir um conjunto de variáveis em intervalos
(eixo X
), e quantos dados cada um desses conjuntos possuem
(eixo Y
). Exemplo: da base de dados starwars
,
a maioria dos personagens possuem qual altura? É o que será feito
agora.
library(tidyverse)
SW<-starwars
SW
## # A tibble: 87 × 14
## name height mass hair_…¹ skin_…² eye_c…³ birth…⁴ sex gender homew…⁵
## <chr> <int> <dbl> <chr> <chr> <chr> <dbl> <chr> <chr> <chr>
## 1 Luke Skywa… 172 77 blond fair blue 19 male mascu… Tatooi…
## 2 C-3PO 167 75 <NA> gold yellow 112 none mascu… Tatooi…
## 3 R2-D2 96 32 <NA> white,… red 33 none mascu… Naboo
## 4 Darth Vader 202 136 none white yellow 41.9 male mascu… Tatooi…
## 5 Leia Organa 150 49 brown light brown 19 fema… femin… Aldera…
## 6 Owen Lars 178 120 brown,… light blue 52 male mascu… Tatooi…
## 7 Beru White… 165 75 brown light blue 47 fema… femin… Tatooi…
## 8 R5-D4 97 32 <NA> white,… red NA none mascu… Tatooi…
## 9 Biggs Dark… 183 84 black light brown 24 male mascu… Tatooi…
## 10 Obi-Wan Ke… 182 77 auburn… fair blue-g… 57 male mascu… Stewjon
## # … with 77 more rows, 4 more variables: species <chr>, films <list>,
## # vehicles <list>, starships <list>, and abbreviated variable names
## # ¹hair_color, ²skin_color, ³eye_color, ⁴birth_year, ⁵homeworld
SW %>%
ggplot(aes(height))+
geom_histogram()+
tema
## Warning: Removed 6 rows containing non-finite values (`stat_bin()`).
Após especificar os eixos, é preciso especificar o tipo de gráfico a
ser feito. Para isso, se usa um +
após a primeira linha do
ggplot, para especificar os próximos passos a serem feitos. Para fazer
um histograma, Se usa a função geom_histogram
. Como os
histogramas são gráficos de variáveis únicas, se usará apenas a variável
height
.
SW %>%
ggplot(aes(height))+
geom_histogram(color="black")+
tema
## Warning: Removed 6 rows containing non-finite values (`stat_bin()`).
Com a função color="black"
em
geom_histogram
, é possível criar linhas de borda que
dividem e diferenciem as barras. As coresna linguagem R são escritas em
inglês
e em aspas
, ou através de códigos do
sistema de cores Color Hex.
SW %>%
ggplot(aes(height))+
geom_histogram(fill="green",color="black")+
tema
## Warning: Removed 6 rows containing non-finite values (`stat_bin()`).
Com a função fill="green"
, é possível especificar o
preenchimento das barras no histograma, que nesse caso, serão verdes. É
possível também escolher outras cores.
O gráfico de densidade é utilizado quando se deseja criar um
resultado parecido ao de um histograma,
mas sem dividir os valores em categorias de intervalo
: não
cria barras, mas sim uma linha que traça um caminho, sendo a sua altura
equivalente à quantidade de repetições que aquele intervalo possui. No
gráfico de densidade, o eixo X
é contínuo, sem criar
intervalores, sendo a gráficação representada por uma linha. Exemplo: da
base de dados starwars
, a maioria dos personagens possuem
qual altura, mas de uma forma contínua? É o que será feito agora.
library(tidyverse)
SW<-starwars
SW
## # A tibble: 87 × 14
## name height mass hair_…¹ skin_…² eye_c…³ birth…⁴ sex gender homew…⁵
## <chr> <int> <dbl> <chr> <chr> <chr> <dbl> <chr> <chr> <chr>
## 1 Luke Skywa… 172 77 blond fair blue 19 male mascu… Tatooi…
## 2 C-3PO 167 75 <NA> gold yellow 112 none mascu… Tatooi…
## 3 R2-D2 96 32 <NA> white,… red 33 none mascu… Naboo
## 4 Darth Vader 202 136 none white yellow 41.9 male mascu… Tatooi…
## 5 Leia Organa 150 49 brown light brown 19 fema… femin… Aldera…
## 6 Owen Lars 178 120 brown,… light blue 52 male mascu… Tatooi…
## 7 Beru White… 165 75 brown light blue 47 fema… femin… Tatooi…
## 8 R5-D4 97 32 <NA> white,… red NA none mascu… Tatooi…
## 9 Biggs Dark… 183 84 black light brown 24 male mascu… Tatooi…
## 10 Obi-Wan Ke… 182 77 auburn… fair blue-g… 57 male mascu… Stewjon
## # … with 77 more rows, 4 more variables: species <chr>, films <list>,
## # vehicles <list>, starships <list>, and abbreviated variable names
## # ¹hair_color, ²skin_color, ³eye_color, ⁴birth_year, ⁵homeworld
SW %>%
ggplot(aes(x=height))+
geom_density(size=1)+
labs(title="densidade das alturas dos personagens de Starwars",
x="densidade dos dados",
y="altura")+
tema
## Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0.
## ℹ Please use `linewidth` instead.
## Warning: Removed 6 rows containing non-finite values (`stat_density()`).
Agora o gráfico de densidade será o feito. Ele é utilizado para
entender em que espaço ou período mais os dados se concentram. Neste
caso, foi feito um gráfico de densidade para entender qual é a altura da
maioria dos personagens da base de dados SW
. Como é
possível observar no gráfico, a maioria dos personagens possui uma
altura entre 1,5-1,8m.
SW %>%
ggplot(aes(height,color=sex))+
geom_density(size=1)+
labs(title="densidade das alturas dos personagens de Starwars,
baseado pelo sexo",
x="densidade dos dados",
y="altura",
color="sexo")+
tema
## Warning: Removed 6 rows containing non-finite values (`stat_density()`).
## Warning: Groups with fewer than two data points have been dropped.
## Warning in max(ids, na.rm = TRUE): nenhum argumento não faltante para max;
## retornando -Inf
No gráfico anterior, todos os personagens estavam em uma mesma linha
de densidade, sem nenhuma descriminação por características deles.
Agora, foram feitas linhas para os personagens em função do seu sexo, da
variável sex
da base de dados. Nesse caso, como se
adicionará uma estética para diferenciar a altura baseado na variável
sexo dos personagens, então se adicionaá color=sex
na
função aes()
. Isso significa que as cores das linhas devem
ser diferenciadas em relação ao sexo dos personagens. COmo é possível
observar, quando é descriminado pelo sexo, os siferentes sexos possuem
diferentes densidades nos seus dados.
O gráfico de dispersão é utilizado para interpretar como determinados
dados são distribuídos em relação à uma variável contínua
(eixo X
) sobre outra variável contínua
(eixo Y
). É muito utilizado quando se deseja entender como
um fator influenciando outro gera um perfil de comportamento em dados
resultantes das interações dos fatores, como em estudos de regressão,
que será explicado no capítulo 12. Exemplo: da base de dados
starwars
, personagens mais mais altos são mais pesados
(possuem maior massa)?
library(tidyverse)
SW<-starwars
SW
## # A tibble: 87 × 14
## name height mass hair_…¹ skin_…² eye_c…³ birth…⁴ sex gender homew…⁵
## <chr> <int> <dbl> <chr> <chr> <chr> <dbl> <chr> <chr> <chr>
## 1 Luke Skywa… 172 77 blond fair blue 19 male mascu… Tatooi…
## 2 C-3PO 167 75 <NA> gold yellow 112 none mascu… Tatooi…
## 3 R2-D2 96 32 <NA> white,… red 33 none mascu… Naboo
## 4 Darth Vader 202 136 none white yellow 41.9 male mascu… Tatooi…
## 5 Leia Organa 150 49 brown light brown 19 fema… femin… Aldera…
## 6 Owen Lars 178 120 brown,… light blue 52 male mascu… Tatooi…
## 7 Beru White… 165 75 brown light blue 47 fema… femin… Tatooi…
## 8 R5-D4 97 32 <NA> white,… red NA none mascu… Tatooi…
## 9 Biggs Dark… 183 84 black light brown 24 male mascu… Tatooi…
## 10 Obi-Wan Ke… 182 77 auburn… fair blue-g… 57 male mascu… Stewjon
## # … with 77 more rows, 4 more variables: species <chr>, films <list>,
## # vehicles <list>, starships <list>, and abbreviated variable names
## # ¹hair_color, ²skin_color, ³eye_color, ⁴birth_year, ⁵homeworld
SW %>%
ggplot(aes(height,mass))+
geom_point(color="darkgoldenrod4",fill="yellow",shape=21,size=4)+
labs(title="Alturas dos personagens de Starwars em relação à massa",
x="altura",
y="massa")+
tema
## Warning: Removed 28 rows containing missing values (`geom_point()`).
Como esse gráfico criado tem o intuíto de responder onde os pontos de
realção das variáveis de massa (mass
) e altura
(altura
) se estabelecem, com a função
geom_point()
é possível criar um gráfico de dispersão,
através de pontos. Para isso, é preciso especificar as variáveis do eixo
X e o eixo Y em aes()
. Contudo, há um ponto muito alto, com
um valor de massa > 1000, que compromete a interpretação. Para
contornar isso, os dados devem ser filtrados.
SW %>%
filter(mass<1000) %>%
ggplot(aes(height,mass))+
labs(title="Alturas dos personagens de Starwars em relação à massa",
x="altura",
y="massa")+
geom_point(color="darkgoldenrod4",fill="yellow",shape=21,size=4)+
tema
Como havia um ponto solitário com um valor muito alto > 1000, a
interpretação do gráfico ficou comprometida. Para resolver isso, usa-se
a função filter()
, do package dplyr
, onde esta
faz um filtro dos tipo de dados que serão inseridos, e com base no que
esses dados serão filtrados. Como deseja-se filtrar um ponto de massa
muito alto, que gerou um aoutlier, é feito
filter(mass<1000)
, para especificar que só devem entrar
dados de massa com valores abaixo de 1000.
SW %>%
filter(mass<1000) %>%
ggplot(aes(height,mass))+
labs(title="Alturas dos personagens de Starwars em relação à massa",
x="altura",
y="massa")+
geom_point(color="darkgoldenrod4",fill="yellow",shape=21,size=4)+
geom_smooth(method="lm",color="red")+
tema
Agora, como se deseja saber qual é a tendência dos dados, para então
responder a pergunta anteriormente feita, com a função
geom_smooth()
é possível criar uma linha de tendência, para
então interpretar melhor como os valores se distribuem no gráfico. Com o
argumento lm
, cria-se uma
linha de tendência linear
. Com esses resultados, é possivel
dizer que existe uma tendência de um personagem da base da dados ter
mais massa quanto mais alto ser.
SW %>%
filter(mass<1000) %>%
ggplot(aes(height,mass))+
labs(title="Alturas dos personagens de Starwars em relação à massa",
x="altura",
y="massa")+
geom_point(color="darkgoldenrod4",fill="yellow",shape=21,size=4)+
geom_smooth(method="loess",color="red")+
tema
Além da linha de tendência linear, também épossível criar outras
linhas de tendência. Com o argumento method="loess"
,
cria-se uma linha de tendência polinomial, mostrando que a linha segue
de outra forma a distribuição dos dados.
SW %>%
filter(mass<1000) %>%
ggplot(aes(height,mass))+
labs(title="Alturas dos personagens de Starwars em relação à massa",
x="altura",
y="massa")+
geom_point(color="darkgoldenrod4",fill="yellow",shape=21,size=4)+
geom_smooth(method="loess",color="red")+
geom_smooth(method="lm",color="red")+
tema
É possivel criar duas linhas antes feitas, ao mesmo tempo, apenas
usando duas vezes a função geom_smoth()
. Contudo, por serem
da mesma cor, isso acaba prejudicando a interpretação. Para resolver
isso, então é necessário defenciá-las, como por cores.
SW %>%
filter(mass<1000) %>%
ggplot(aes(height,mass))+
labs(title="Alturas dos personagens de Starwars em relação à massa",
x="altura",
y="massa")+
geom_point(color="darkgoldenrod4",fill="yellow",shape=21,size=4)+
geom_smooth(method="loess",color="sienna1")+
geom_smooth(method="lm",color="royalblue1")+
tema
Usando o comando color=
em cada
geom_smoth()
, é possível então fazer uma melhor
interpretação das tendências, selecionando uma cor específica para cada
tipo de linha.
SW %>%
filter(mass<1000) %>%
ggplot(aes(height,mass,color=sex,fill=sex))+
labs(title="Alturas dos personagens de Starwars em relação à massa,
baseado pelo sexo",
x="altura",
y="massa",
color="sexo",
fill="sexo")+
geom_point(color="black",shape=21,size=4)+
geom_smooth(method="lm",aes())+
tema
Neste caso, como o objetivo é entender essa mesma relação, mas para
cada um dos sexos dos personagens, será feito uma descriminação, baseada
nessa característica. Para poder difernciar os dados por cores e fazer
cada um ter sua linha de tendência, usa-se o argumento
color=sex
e fill=sex
em aes()
,
para especificar que se deseja fazer uma diferenciação baseada no sexo
dos personagens. Com esses dados, é possil ver que o sexo feminino é que
teve a menor tendência.
SW %>%
filter(mass<1000) %>%
ggplot(aes(height,mass))+
labs(title="Alturas dos personagens de Starwars em relação à massa",
x="altura",
y="massa")+
geom_point(color="darkgoldenrod4",fill="yellow",shape=21,size=4)+
geom_hline(yintercept = 80)+
geom_vline(xintercept=125)+
tema
Caso fosse preferíveel separar os dados por setores, é também
possível, traçando linhas que cortam o gráfico. Com a função
geom_hline()
, é possível traçar uma
linha horizontal
que corta o gráfico, especificando o ponto
do eixo Y
que a linha passará, através do argumento
yintercept=
. O mesmo vale para criar uma linha vertical,
usando a função geom_vline()
, com o argumento
xintercept=
. Os pontos que as linhas passarão serão os
valores dos elementos yintercept=
e
xintercept=
.
SW %>%
filter(mass<1000) %>%
ggplot(aes(height,mass))+
labs(title="Alturas dos personagens de Starwars em relação à massa",
x="densidade dos dados",
y="altura")+
geom_point(color="darkgoldenrod4",fill="yellow",shape=21,size=4)+
geom_hline(yintercept = 80,linetype="dashed")+
geom_vline(xintercept=125,linetype="dotted")+
tema
Também é possível definir o tipo de linha pela função
linetype=
. O tipo de linha deve estar entre aspas, e em
inglês.
SW %>%
filter(mass<1000) %>%
ggplot(aes(height,mass))+
labs(title="Alturas dos personagens de Starwars em relação à massa",
x="densidade dos dados",
y="altura")+
geom_point(color="darkgoldenrod4",fill="yellow",shape=21,size=4)+
geom_hline(yintercept = 80,linetype="dashed")+
geom_vline(xintercept=125,linetype="dotted",color="red")+
tema
Também é possível definir a cor da linha, pelo elemento
color=
.
O gráfico de barras é utilizado quando o objetivo é entender o quanto
de unidades amostrais, contágens ou repetições uma variável qualitativa
possui dentro de uma base de dados. Um exemplo é o quanto de observações
são feitas para três espécies diferentes em algum local de estudo. Nesse
gráfico, no eixo X
ficam as
variável qualitativas
, e no eixo Y
as
variáveis quantitativas
. É bastante semelhante ao gráfico
de histograma e de sensidade, mas a diferença é que este usa,
obrigatoriamente, dados qualitativos no eixo X
. Exemplo: na
base de dados starwars
, qual é a cor de olho que a maioria
dos personagens possuem?
library(tidyverse)
SW<-starwars
SW
## # A tibble: 87 × 14
## name height mass hair_…¹ skin_…² eye_c…³ birth…⁴ sex gender homew…⁵
## <chr> <int> <dbl> <chr> <chr> <chr> <dbl> <chr> <chr> <chr>
## 1 Luke Skywa… 172 77 blond fair blue 19 male mascu… Tatooi…
## 2 C-3PO 167 75 <NA> gold yellow 112 none mascu… Tatooi…
## 3 R2-D2 96 32 <NA> white,… red 33 none mascu… Naboo
## 4 Darth Vader 202 136 none white yellow 41.9 male mascu… Tatooi…
## 5 Leia Organa 150 49 brown light brown 19 fema… femin… Aldera…
## 6 Owen Lars 178 120 brown,… light blue 52 male mascu… Tatooi…
## 7 Beru White… 165 75 brown light blue 47 fema… femin… Tatooi…
## 8 R5-D4 97 32 <NA> white,… red NA none mascu… Tatooi…
## 9 Biggs Dark… 183 84 black light brown 24 male mascu… Tatooi…
## 10 Obi-Wan Ke… 182 77 auburn… fair blue-g… 57 male mascu… Stewjon
## # … with 77 more rows, 4 more variables: species <chr>, films <list>,
## # vehicles <list>, starships <list>, and abbreviated variable names
## # ¹hair_color, ²skin_color, ³eye_color, ⁴birth_year, ⁵homeworld
SW %>%
ggplot(aes(eye_color,mass))+
geom_bar(stat = "identity")+
labs(title="Número de personagens por cores de olho",
x="cor do olho",
y="massa")+
tema
## Warning: Removed 28 rows containing missing values (`position_stack()`).
Nesse caso, foi graficado a massa de cada personagem baseado em sua
cor de olho. Para isso, dentro do peimeiro aes()
, foi
adicionado uma variável qualitativa (cor do olho) ao eixo X
e uma variável quantitativa (massa) ao eixo Y
. Para usar o
gráfico de barras, foi usada a função geom_bar()
.
SW %>%
group_by(eye_color) %>%
summarise(
contagem = n()
) %>%
ggplot(aes(eye_color,contagem))+
geom_bar(stat = "identity")+
labs(title="Número de personagens por cores de olho",
x="cor do olho",
y="n° de ocorrência")+
tema
Alternativamente ao modo do gráfico anterior, é possível criar
gráfico com a altura das barras baseado no número de unidades amostrais
de uma variável qualitativa, como o número de personagens por cada cor
de olho. Uma forma de fazer isso é a base de dados possuir uma variável
quantitativa com esses dados. Outro forma, é manipular os dados para
criar essa contagem. No gráfico acima, foi feito isso, com a função
group_by()
, onde foram criados grupos baseado na cor dos
olhos dos personagens, e a função summarise()
, para a fazer
a contagem destes dados e atribuido ao objeto contagem
,
para que fosse possível adicionar ao ggplot.
SW %>%
group_by(eye_color) %>%
summarise(
contagem = n()
) %>%
ggplot(aes(eye_color,contagem))+
geom_bar(stat = "identity")+
labs(title="Número de personagens por cores de olho",
x="cor do olho",
y="n° de ocorrência")+
coord_flip()+
tema
Para que seja mais fácil de observar os nomes no eixo X
,
é poossível inveter a posição dos eixos, atraves da função
coord_flip()
.
SW %>%
group_by(eye_color) %>%
summarise(
contagem = n()
) %>%
ggplot(aes(eye_color,contagem))+
geom_bar(stat = "identity",fill="lightblue",color="black")+
labs(title="Número de personagens por cores de olho",
x="cor do olho",
y="n° de ocorrência")+
coord_flip()+
tema
Mais ainda, é possível adicionar uma cor de contorno e preenchimento para as barras.
SW %>%
group_by(eye_color) %>%
summarise(
contagem = n()
) %>%
ggplot(aes(eye_color,contagem,label=contagem))+
geom_bar(stat = "identity",fill="lightblue",color="black")+
labs(title="Número de personagens por cores de olho",
x="cor do olho",
y="n° de ocorrência")+
coord_flip()+
geom_label()+
tema
Para ser mais visível de interpretar os valores de cada grupo, também
é possível adicionar rótulos às barras, estes contendo os seus valores,
com a função geom_label()
.
SW %>%
group_by(eye_color) %>%
summarise(
contagem = n()
) %>%
ggplot(aes(eye_color,contagem,label=contagem))+
geom_bar(stat = "identity",fill="green",color="black",alpha=0.5)+
labs(title="Número de personagens por cores de olho",
x="cor do olho",
y="n° de ocorrência")+
coord_flip()+
geom_label(size=3,fill="green")+
coord_flip()+
tema
Os rótulos também podem sua estética editada, sendo que
size=
altera o tamanho, fill=
altera o
preenchimento e alpha=
altera a transparência.
SW %>%
group_by(eye_color,sex) %>%
summarise(
contagem = n()
) %>%
ggplot(aes(eye_color,contagem,fill=sex))+
geom_bar(stat = "identity", color="black")+
labs(title="Número de personagens por cores de olho,
em relação ao sexo",
x="cor do olho",
y="n° de ocorrência",
fill="sexo")+
coord_flip()+
tema
É possível também agrupar as barras em relação à porcentagem de uma
variável da base de dados. Nesse caso, agrupando pelo sexo dos
personagnes, dentro da função aes()
, se adiciona a variável
fill=sex
.
SW %>%
filter(eye_color %in% c("brown","blue","black")) %>%
group_by(eye_color,sex) %>%
summarise(
contagem = n()
) %>%
ggplot(aes(eye_color,contagem,fill=sex, label=contagem))+
geom_bar(stat = "identity",position = "dodge",color="black", alpha=0.5)+
labs(title="Número de personagens por cores de olho,
em relação ao sexo e 3 cores de olho específicas",
x="cor do olho",
y="n° de ocorrência",
fill="sexo")+
geom_label(position = position_dodge(width = 1))+
tema
Para separar apenas os olhos de cor marrom (brown
), azul
(blue
) e preto (black
), usa-se a função
filter()
, com o comando %in%
, para a variável
eye_color
, especificando quais as cores de olho a serem
selecionadas. Na função group_by()
, se adicionará as
variáveis eye_color
e sex
para especificar que
se formaram grupos baseados na quantidade de indivíduos com uma cor de
olho por determinado sexo, e então, a função
summarise()
.
Esse gráfico pode ser utilizado em duas principais situações: quando
se deseja entender o erro ou a incerteza dos dados trabalhados em uma
análise ou quando os valores dos objetos de uma variável qualitativa
possuem valores mínimos e máximos diferentes. No primeiro caso, quanto
menor a barra de erro, menor a incerteza dos dados. Exemplo: na base
dados starwars
, numa análise do genêro dos personagens,
qual gênero possui uma maior incerteza sobre os dados das suas
alturas?
library(tidyverse)
SW<-starwars
SW
## # A tibble: 87 × 14
## name height mass hair_…¹ skin_…² eye_c…³ birth…⁴ sex gender homew…⁵
## <chr> <int> <dbl> <chr> <chr> <chr> <dbl> <chr> <chr> <chr>
## 1 Luke Skywa… 172 77 blond fair blue 19 male mascu… Tatooi…
## 2 C-3PO 167 75 <NA> gold yellow 112 none mascu… Tatooi…
## 3 R2-D2 96 32 <NA> white,… red 33 none mascu… Naboo
## 4 Darth Vader 202 136 none white yellow 41.9 male mascu… Tatooi…
## 5 Leia Organa 150 49 brown light brown 19 fema… femin… Aldera…
## 6 Owen Lars 178 120 brown,… light blue 52 male mascu… Tatooi…
## 7 Beru White… 165 75 brown light blue 47 fema… femin… Tatooi…
## 8 R5-D4 97 32 <NA> white,… red NA none mascu… Tatooi…
## 9 Biggs Dark… 183 84 black light brown 24 male mascu… Tatooi…
## 10 Obi-Wan Ke… 182 77 auburn… fair blue-g… 57 male mascu… Stewjon
## # … with 77 more rows, 4 more variables: species <chr>, films <list>,
## # vehicles <list>, starships <list>, and abbreviated variable names
## # ¹hair_color, ²skin_color, ³eye_color, ⁴birth_year, ⁵homeworld
médias<-SW %>%
filter(!is.na(height)) %>%
group_by(gender) %>%
summarise(
media = mean(height),
limite_superior = mean(height) + sd(height),
limite_inferior = mean(height) - sd(height)
)
médias
## # A tibble: 3 × 4
## gender media limite_superior limite_inferior
## <chr> <dbl> <dbl> <dbl>
## 1 feminine 165. 188. 141.
## 2 masculine 177. 214. 139.
## 3 <NA> 181. 184. 178.
Para a criação de um gráfico de desvio padrão, é necessário antes
calcular a média, o limite superior
e o
limite inferior
de uma variável da bse de dados. Nesse
caso, procura-se saber da altura (height
) em relação aos
gêneros dos personagens. Para isso, é usado a função
filter()
, adicionando a função !is.na
para
retirar os valores nulos (NA
) da altura. Logo em seguida, é
feito o group_by()
para a variável gênero
(gender
), o summarise()
, para calcular a
média
, o limite superior
e o
limite inferior
. Tudo isso então é atribuído ao objeto
médias
.
médias %>%
ggplot(aes(x=gender,y=media))+
labs(title="média da altura dos personagens em relação ao gênero",
x="gênero",
y="média")+
geom_bar(stat="identity",color="black")+
geom_errorbar(aes(ymin = limite_inferior, ymax = limite_superior), width = 0.2)+
tema
Nesse caso, não se usará a base de dados SW
, mas sim a
base de dados médias
. Para criar o gráfico de erro, será
usado tanto a função geom_bar()
, para criar as barras das
médias em relação ao gênero, quanto a função
geom_errorbar()
, parar criar as barras de erro. Dentro de
geom_errorbar()
, na função aes()
, é
especificado o limite inferior (ymin
), o limite superior
(ymin
) e a alarbura das barras de erro
width=
..
médias %>%
ggplot(aes(x=gender,y=media))+
labs(title="média da altura dos personagens em relação ao gênero",
x="gênero",
y="média")+
geom_pointrange(color="black",fill="gray",shape=21,size=1,
aes(ymin = limite_inferior, ymax = limite_superior))+
tema
É possível também substituir as barras, colocando pontos nos valores
das médias, usando a função geom_pointrange()
.
médias %>%
ggplot(aes(x=gender,y=media,fill=gender))+
labs(title="média da altura dos personagens em relação ao gênero,
em relação so gênero",
x="gênero",
y="média",
fill="gênero")+
geom_pointrange(color="black",shape=21,size=1,
aes(ymin = limite_inferior, ymax = limite_superior))+
tema
Para diferenciar as linhas e as médias em função do gênero, é
adicionado a função color=gender
na função
aes()
.
dados<-data.frame(
metricas<-c("m1","m2","m3","m4","m5"),
limite_inferior<-c(-3.5,-2.5,1,4,8),
limite_superior<-c(1,1.5,3,7,10),
significativo<-c("não","não","sim","sim","sim")
)
dados %>%
ggplot(aes(metricas, color= significativo))+
geom_errorbar(size=1,aes(ymin = limite_inferior, ymax = limite_superior),width=0.2)+
geom_hline(yintercept = 0,linetype="dotted",color="black")+
tema
Esse foi um experimento usando dados criados, para averiguar se o
erro padrão dos elementos (m1, m2, m3, m4, m5). Para isso, dentro da
função aes()
se adicionou color=significativo
,
para separar os elementos ccom relção a essa variável. Como o erro
padrão só é significativo com valores de limite superior
e
limite inferior
forem acima de 0, então pode-se traçar uma
linha horizontal no ponto 0 para melhor interpretar, pela função
geom_hline()
.
dados %>%
ggplot(aes(metricas, color= significativo))+
geom_errorbar(size=1,aes(ymin = limite_inferior, ymax = limite_superior),width=0.2)+
geom_hline(yintercept = 0,linetype="dotted",color="black")+
theme_light()+
coord_flip()+
tema
coord_flip()
.Bem semelhante ao gráfico de dispersão, esse gráfico é utilizado
quando se deseja entender o comportamento dos dados resultantes da
interação de uma variável contínua (eixo X
) com outra
variável contínua (eixo Y
). Mas ao invés de de usar pontos
dispersos pelo gráfico, é utilizado uma ou mais linhas, sendo mais esse
modelo de gráfico mais utilizado para tratar com séries temporais.
Exemplo: utilizando a base de dados economics
, como foi a
taxa de desemprego dos Estados Unidos ao longo das décadas recentes?
library(tidyverse)
library(gapminder)
Ecs<-economics
Ecs
## # A tibble: 574 × 6
## date pce pop psavert uempmed unemploy
## <date> <dbl> <dbl> <dbl> <dbl> <dbl>
## 1 1967-07-01 507. 198712 12.6 4.5 2944
## 2 1967-08-01 510. 198911 12.6 4.7 2945
## 3 1967-09-01 516. 199113 11.9 4.6 2958
## 4 1967-10-01 512. 199311 12.9 4.9 3143
## 5 1967-11-01 517. 199498 12.8 4.7 3066
## 6 1967-12-01 525. 199657 11.8 4.8 3018
## 7 1968-01-01 531. 199808 11.7 5.1 2878
## 8 1968-02-01 534. 199920 12.3 4.5 3001
## 9 1968-03-01 544. 200056 11.7 4.1 2877
## 10 1968-04-01 544 200208 12.3 4.6 2709
## # … with 564 more rows
Nesse caso, não será usado a base de dados starwars
, mas
sim a base de dados economics
. Essa base de dados também é
do package ggplot, que apresenta dados de séries econômicas da história
dos Estados Unidos.
Ecs%>%
ggplot(aes(date,unemploy))+
labs(title="desemprego nos Estados Unidos entre 1970-2015",
x="data",
y="desemprego")+
geom_line(size=1)+
tema
Para criar um gráfico de linhas, usa-se a função
geom_line()
. Na função aes()
, usar-se as
variáveis de datas (date
) para o eixo X
e de
desempregados/1000 (unemploy
).
Ecs%>%
ggplot(aes(date,unemploy))+
labs(title="desemprego nos Estados Unidos entre 1990-2000",
x="data",
y="desemprego")+
geom_line(size=1)+
scale_x_date(limits = c(as.Date("1990-01-01"),as.Date("1999-12-31")))+
tema
## Warning: Removed 454 rows containing missing values (`geom_line()`).
Em alguns casos, é desejável analisar um período específico, também é
possível fazer um recorte de um período específico de tempo. Usa-se a
função
scale_x_date()
, onde se definem as datas, já que
avariável date
é feita dados temporais, e está no eixo
X
. Se define da data inical e a final onde se deseja
avaliar, onde a ordem da data é ano-mês-dia
.
Gap<-gapminder
Gap
## # A tibble: 1,704 × 6
## country continent year lifeExp pop gdpPercap
## <fct> <fct> <int> <dbl> <int> <dbl>
## 1 Afghanistan Asia 1952 28.8 8425333 779.
## 2 Afghanistan Asia 1957 30.3 9240934 821.
## 3 Afghanistan Asia 1962 32.0 10267083 853.
## 4 Afghanistan Asia 1967 34.0 11537966 836.
## 5 Afghanistan Asia 1972 36.1 13079460 740.
## 6 Afghanistan Asia 1977 38.4 14880372 786.
## 7 Afghanistan Asia 1982 39.9 12881816 978.
## 8 Afghanistan Asia 1987 40.8 13867957 852.
## 9 Afghanistan Asia 1992 41.7 16317921 649.
## 10 Afghanistan Asia 1997 41.8 22227415 635.
## # … with 1,694 more rows
Gap%>%
filter(country=="Brazil") %>%
ggplot(aes(year,pop))+
labs(title="População brasileira entre 1955-2015",
x="data",
y="população")+
geom_line(size=0.7)+
geom_point(color="black",fill="yellow",shape=21,size=3.5)+
tema
Para criar pontos nas linhas, semelhante ao que o Excel produz, é
necessário usar a função gapminder
, carregando uma base de
dados da população de diversos lugares do mundo, desde a década de 1950.
Usa-se a função filter()
para selecionar o Brasil, e então
usa-se as funções geom_line()
e
geom_point()
.
Gap%>%
filter(country %in% c("Brazil","Uruguay","Argentina")) %>%
ggplot(aes(year,pop,color=country,fill=country))+
labs(title="População da Argentina, Brasil e Uruguai entre 1955-2015",
x="data",
y="população",
color="país",
fill="país")+
geom_line()+
geom_point(color="black",shape=21,size=3)+
tema
Para analisar mais de um tipo de dado ao mesmo tempo, como entender o
crescimento populacional de diferentes lugares numa mesma escala de
tempo. Com a função filter()
, é possível selecionar mais de
um país por vez, através da função country %in% c()
, e a
função color=country
em aes()
para poder
diferenciar os países através de cores diferentes.
Ecs%>%
ggplot(aes(date,unemploy,color=pop))+
labs(title="desemprego nos Estados Unidos entre 1970-2015",
x="data",
y="desemprego",
color="população")+
geom_line(size=1)+
tema
Como é um gráfico de linha, para selecionar a cor da linha, é
selecionado a função color=
no comando aes()
.
Nesse caso, para criar uma cor em função de um gradiente, é usado a
variável pop
. Por ser uma variável quantitativa contínua, a
cor da linha está em um gradiente.
Ecs%>%
ggplot(aes(date,unemploy,color=pop))+
labs(title="desemprego nos Estados Unidos entre 1970-2015",
x="data",
y="desemprego",
color="população")+
geom_line(size=1)+
scale_color_gradient(low="yellow",high="brown")+
tema
Com a função scale_color_gradient()
é possível
selecionar um gradiente específico de cores selecionadas. O elemento
low=
é a cor dos valores mais baixos, e o elemento
high=
é a cor dos valores mais altos. É aconselhado usar
cores claras em low=
e cores mais escuras em
high=
.
Ecs%>%
ggplot(aes(date,unemploy,color=pop))+
labs(title="desemprego nos Estados Unidos entre 1970-2015",
x="data",
y="desemprego",
color="população")+
geom_line(size=1)+
scale_color_gradientn(colours =c("purple4","royalblue","dodgerblue","deepskyblue","mediumspringgreen","springgreen","green","lawngreen","greenyellow","yellow", "gold","darkorange","chocolate1","orangered","red","darkred"),breaks=seq(0,325000,20000))+
tema
Com o comando scale_color_gradientn()
, com o comando
interno colours=c()
, é possível não apenas escolher um
gradiente com mais cores, onde aqui foram usadas 16 cores diferentes,
como também definir o intervalo dos valores do gradiente, com o comando
interno breaks=seq()
, onde o primeiro valor é o valor
inicial, o segundo valor é o valor final e o terceiro valor é o
intervalo de cada valor.
Esse gráfico é utilizado quando se deseja identificar o quanto cada
variável contribui para formar o todo, e qual variável se faz mais
presente. É um tipo de gráfico bastante utilizado para identificar,
dentro de um conjunto de eventos ou ações, quem mais apresentou ações,
contribuições para formar o conjunto todo, ou seja,
frequência
, como na contribuição de certos funcionários
para um produto. É semelhante ao gráfico de barras, mas nesse, é
possível limitar à apenas 1 única barra
, ou até criar um
gráfico de pizza
. Exemplo: da base de dados
starwars
, qual gênero representa a maioria dos oersonagens?
É o que será feito agora.
library(ggplot2)
library(tidyverse)
SW<-starwars
SW
## # A tibble: 87 × 14
## name height mass hair_…¹ skin_…² eye_c…³ birth…⁴ sex gender homew…⁵
## <chr> <int> <dbl> <chr> <chr> <chr> <dbl> <chr> <chr> <chr>
## 1 Luke Skywa… 172 77 blond fair blue 19 male mascu… Tatooi…
## 2 C-3PO 167 75 <NA> gold yellow 112 none mascu… Tatooi…
## 3 R2-D2 96 32 <NA> white,… red 33 none mascu… Naboo
## 4 Darth Vader 202 136 none white yellow 41.9 male mascu… Tatooi…
## 5 Leia Organa 150 49 brown light brown 19 fema… femin… Aldera…
## 6 Owen Lars 178 120 brown,… light blue 52 male mascu… Tatooi…
## 7 Beru White… 165 75 brown light blue 47 fema… femin… Tatooi…
## 8 R5-D4 97 32 <NA> white,… red NA none mascu… Tatooi…
## 9 Biggs Dark… 183 84 black light brown 24 male mascu… Tatooi…
## 10 Obi-Wan Ke… 182 77 auburn… fair blue-g… 57 male mascu… Stewjon
## # … with 77 more rows, 4 more variables: species <chr>, films <list>,
## # vehicles <list>, starships <list>, and abbreviated variable names
## # ¹hair_color, ²skin_color, ³eye_color, ⁴birth_year, ⁵homeworld
gênero<-starwars %>%
group_by(gender) %>%
summarise(
n = n()
)
gênero
## # A tibble: 3 × 2
## gender n
## <chr> <int>
## 1 feminine 17
## 2 masculine 66
## 3 <NA> 4
Para facilitar o uso dos dados, foi atribuído ao objeto
gênero
a frequência dos gêneros da variável
gender
, através da função group_by()
e
summarise()
, criando assim a variável n
,
correspondente ao nº de personagens de cada gênero.
gênero %>%
ggplot(aes(gender,n,fill=gender,label=n))+
labs(title="n° de personagens de Stawars por gênero",
x="gênero",
y="n° de ocorrência",
fill="gênero")+
geom_bar(stat="identity",color="black",alpha=0.5)+
coord_flip()+
geom_label(color="black")+
tema
Com a função geom_bar()
para criar barras, com a função
stat=identity
, e alpha=0.5
para deixar as
barras transparente, a função coord_flip
para enverter os
eixos, a função geom_label()
para adicionar rótulos às
barras e a função label=n
na função aes()
para
adicinar o valor dos rótulos, foi feito o gráfico de frequência.
gênero %>%
ggplot(aes("",n,fill=gender,label=n))+
labs(title="n° de personagens de Stawars por gênero",
x=NULL,
y="n° de ocorrência",
fill="gênero")+
geom_bar(stat="identity",color="black",alpha=0.5,width=0.3)+
coord_flip()+
geom_label(position = position_stack(vjust=0.5),color="black")+
theme_void()+
tema
Removendo a variável gender
, alterando a largura da
barra com a função width=0.3
, usando a função
position = position_stack(vjust=0.5)
para posicionar
corretamente os rótulos e a função theme_void()
para
remover todos os elementos do fundo, fica apenas as barrras e seus
respectivos rótulos.
gênero %>%
ggplot(aes("",n,fill=gender,label=n))+
labs(title="n° de personagens de Stawars por gênero",
x=NULL,
y=NULL,
fill="gênero")+
geom_bar(stat="identity",color="black",alpha=0.5,width=0.3)+
coord_flip()+
coord_polar(theta="y",start=0)+
geom_label(position = position_stack(vjust=0.5),color="black")+
tema
Com a função coord_polar()
, é possível criar um gráfico
circulas, de pizza, com os mesmos elementos usadoa anteriormente.
O gráfico de correlação é utilizado para entender relações de
porporcionalidade de covariância entre duas variáveis quantitativas
contínuas, sendo esta uma relação diretamente proporcional
(positiva: à medida que uma variável cresce, a outra crescerá junto
)
ou inversalmente proporcional
(negativa: à medida que uma cresce, outra diminuirá
).
Exemplo: da base de dados mtcars
, o peso dos carros está
correlacionado com o nº de galões por milhas? É o que será feito
agora.
library(tidyverse)
library(ggcorrplot)
MC<-mtcars
MC
## mpg cyl disp hp drat wt qsec vs am gear carb
## Mazda RX4 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4
## Mazda RX4 Wag 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4
## Datsun 710 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1
## Hornet 4 Drive 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1
## Hornet Sportabout 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2
## Valiant 18.1 6 225.0 105 2.76 3.460 20.22 1 0 3 1
## Duster 360 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4
## Merc 240D 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2
## Merc 230 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2
## Merc 280 19.2 6 167.6 123 3.92 3.440 18.30 1 0 4 4
## Merc 280C 17.8 6 167.6 123 3.92 3.440 18.90 1 0 4 4
## Merc 450SE 16.4 8 275.8 180 3.07 4.070 17.40 0 0 3 3
## Merc 450SL 17.3 8 275.8 180 3.07 3.730 17.60 0 0 3 3
## Merc 450SLC 15.2 8 275.8 180 3.07 3.780 18.00 0 0 3 3
## Cadillac Fleetwood 10.4 8 472.0 205 2.93 5.250 17.98 0 0 3 4
## Lincoln Continental 10.4 8 460.0 215 3.00 5.424 17.82 0 0 3 4
## Chrysler Imperial 14.7 8 440.0 230 3.23 5.345 17.42 0 0 3 4
## Fiat 128 32.4 4 78.7 66 4.08 2.200 19.47 1 1 4 1
## Honda Civic 30.4 4 75.7 52 4.93 1.615 18.52 1 1 4 2
## Toyota Corolla 33.9 4 71.1 65 4.22 1.835 19.90 1 1 4 1
## Toyota Corona 21.5 4 120.1 97 3.70 2.465 20.01 1 0 3 1
## Dodge Challenger 15.5 8 318.0 150 2.76 3.520 16.87 0 0 3 2
## AMC Javelin 15.2 8 304.0 150 3.15 3.435 17.30 0 0 3 2
## Camaro Z28 13.3 8 350.0 245 3.73 3.840 15.41 0 0 3 4
## Pontiac Firebird 19.2 8 400.0 175 3.08 3.845 17.05 0 0 3 2
## Fiat X1-9 27.3 4 79.0 66 4.08 1.935 18.90 1 1 4 1
## Porsche 914-2 26.0 4 120.3 91 4.43 2.140 16.70 0 1 5 2
## Lotus Europa 30.4 4 95.1 113 3.77 1.513 16.90 1 1 5 2
## Ford Pantera L 15.8 8 351.0 264 4.22 3.170 14.50 0 1 5 4
## Ferrari Dino 19.7 6 145.0 175 3.62 2.770 15.50 0 1 5 6
## Maserati Bora 15.0 8 301.0 335 3.54 3.570 14.60 0 1 5 8
## Volvo 142E 21.4 4 121.0 109 4.11 2.780 18.60 1 1 4 2
Para esse exemplo, a base de dados usada sera a mtcars
,
que descreve dados de carros. Dados estes extraídoss de 1974 da Revista
de Estadunidense de Tendência de Motores, e então essa base dados
atribuída ao objeto MC
.
COR<-cor(MC$wt,MC$mpg)
COR
## [1] -0.8676594
Esse resultado mostra que há uma relação inversalmente proporcional
entre as variáveis calculadas da correlação (R=-0.86
).
próximo de R=1
: correlação diretamente proporcional;
próximo de R=0
: ausência de correlação;
próximo de R=-1
: correlação inversalmente proporciona.
CORR<-cor(MC)
CORR
## mpg cyl disp hp drat wt
## mpg 1.0000000 -0.8521620 -0.8475514 -0.7761684 0.68117191 -0.8676594
## cyl -0.8521620 1.0000000 0.9020329 0.8324475 -0.69993811 0.7824958
## disp -0.8475514 0.9020329 1.0000000 0.7909486 -0.71021393 0.8879799
## hp -0.7761684 0.8324475 0.7909486 1.0000000 -0.44875912 0.6587479
## drat 0.6811719 -0.6999381 -0.7102139 -0.4487591 1.00000000 -0.7124406
## wt -0.8676594 0.7824958 0.8879799 0.6587479 -0.71244065 1.0000000
## qsec 0.4186840 -0.5912421 -0.4336979 -0.7082234 0.09120476 -0.1747159
## vs 0.6640389 -0.8108118 -0.7104159 -0.7230967 0.44027846 -0.5549157
## am 0.5998324 -0.5226070 -0.5912270 -0.2432043 0.71271113 -0.6924953
## gear 0.4802848 -0.4926866 -0.5555692 -0.1257043 0.69961013 -0.5832870
## carb -0.5509251 0.5269883 0.3949769 0.7498125 -0.09078980 0.4276059
## qsec vs am gear carb
## mpg 0.41868403 0.6640389 0.59983243 0.4802848 -0.55092507
## cyl -0.59124207 -0.8108118 -0.52260705 -0.4926866 0.52698829
## disp -0.43369788 -0.7104159 -0.59122704 -0.5555692 0.39497686
## hp -0.70822339 -0.7230967 -0.24320426 -0.1257043 0.74981247
## drat 0.09120476 0.4402785 0.71271113 0.6996101 -0.09078980
## wt -0.17471588 -0.5549157 -0.69249526 -0.5832870 0.42760594
## qsec 1.00000000 0.7445354 -0.22986086 -0.2126822 -0.65624923
## vs 0.74453544 1.0000000 0.16834512 0.2060233 -0.56960714
## am -0.22986086 0.1683451 1.00000000 0.7940588 0.05753435
## gear -0.21268223 0.2060233 0.79405876 1.0000000 0.27407284
## carb -0.65624923 -0.5696071 0.05753435 0.2740728 1.00000000
Com a função cor()
, é possível calcular o indice de
correlação entre as diversas variáveis da base de dados
MC
.
ggcorrplot(CORR)+
tema
Criando índices de correlação das variáveis da base de dados
mtcars
e atribuindo ao objeto CORR
, usando a
função ggcorplot()
, é possível criar um gráfico de
correlação das variáveis. Nesse tipo de gráfico, os pontos mais
vermelhos representam as maiores correlações diretalmente proporcionais,
e os pontos mais azuis representam as maiores correlações inversalmente
porporcionais.
ggcorrplot(
CORR,
method="circle"
)+
tema
Também é possível usar círculos como os pontos das correlação,
através do comando method="circle"
.
ggcorrplot(
CORR,
method="circle",
hc.order=TRUE
)+
tema
Também é possível agrupar de maneira hierarquica, para facilitar o
entendimento do gráfico em realação às correlações das variáveis, com o
comando hc.order=TRUE
.
ggcorrplot(
CORR,
method="circle",
hc.order=TRUE,
type="lower"
)+
tema
Nos gráficos anteriores, eram gráficos espelhados, o que poderia
torná-los não apenas redundantes, como também poder comprometer a sua
interpretação. Para solucionar essa questão, Com a função
type="lower"
é possível criar um gráfico mais simples.
ggcorrplot(
CORR,
method="circle",
hc.order=TRUE,
type="lower",
lab=TRUE
)+
tema
Para facilitar mais ainda o entendimento, é possível também adicionar
os valores aoss pontos da correlação, com a função
lab=TRUE
.
ggcorrplot(
CORR,
method="circle",
hc.order=TRUE,
type="lower",
lab=TRUE,
lab_size = 3.5
)+
tema
Em caso do valor ficar desporpociaonal aos tamanhos dos pontos da
correlação, também é possível ajustar o tamanho da fonte dos rótulos,
com a função lab_size=3.5
.
ggcorrplot(
CORR,
method="circle",
hc.order=TRUE,
type="lower",
lab=TRUE,
lab_size = 3.5,
p.mat = cor_pmat(MC),
insig = "blank"
)+
tema
Para fins didáticos, em caso de apenas desejar os pontos com valores
de correlação significativos, também é possível excluir os valores não
significativos (<0.5, >-0.5
).
CORR<-cor(MC)
ggcorrplot(
CORR,
method="circle",
hc.order=TRUE,
type="lower",
lab=TRUE,
lab_size = 3,
p.mat = cor_pmat(MC),
insig = "blank",
legend.title="coeficiente de correlação"
)+
tema
Com a função legend.title=
, é possível determinar o
título do da legenda do gráfico de correlação.
CORR<-cor(MC)
ggcorrplot(
CORR,
method="circle",
hc.order=TRUE,
type="lower",
lab=TRUE,
lab_size = 3,
p.mat = cor_pmat(MC),
insig = "blank",
legend.title="coeficiente de correlação",
colors=c("red","yellow","green")
)+
tema
Com a função colors=c()
, é possível escolher as conres.
Devem ser escolhidos três cores, com seus nomes em inglês e entre aspas.
É aconselhado que a segunda cor seja uma cor que consiga ser transitória
entre os extremos.
Semelhante ao gráfico de correlação, o gráfico de regressão é
utilizado quando as análises são feitas com dados com
variáveis dependentes
e
variáveis independentes
, quando há sim uma relação de
causalidade entre as variáveis, através de uma graficação de dispersão
de pontos no gráfico. Nesse caso, o objetivo desse gráfico é mostrar as
realações de causa e efeito, através tanto da dispersão dos dados quanto
pelo parâmetro R². Exemplo: na base de dados mtcars
, o nº
de cilindros é ditado pelo nº de galões por milhas?
library(tidyverse)
library(ggpubr)
MC<-mtcars
MC
## mpg cyl disp hp drat wt qsec vs am gear carb
## Mazda RX4 21.0 6 160.0 110 3.90 2.620 16.46 0 1 4 4
## Mazda RX4 Wag 21.0 6 160.0 110 3.90 2.875 17.02 0 1 4 4
## Datsun 710 22.8 4 108.0 93 3.85 2.320 18.61 1 1 4 1
## Hornet 4 Drive 21.4 6 258.0 110 3.08 3.215 19.44 1 0 3 1
## Hornet Sportabout 18.7 8 360.0 175 3.15 3.440 17.02 0 0 3 2
## Valiant 18.1 6 225.0 105 2.76 3.460 20.22 1 0 3 1
## Duster 360 14.3 8 360.0 245 3.21 3.570 15.84 0 0 3 4
## Merc 240D 24.4 4 146.7 62 3.69 3.190 20.00 1 0 4 2
## Merc 230 22.8 4 140.8 95 3.92 3.150 22.90 1 0 4 2
## Merc 280 19.2 6 167.6 123 3.92 3.440 18.30 1 0 4 4
## Merc 280C 17.8 6 167.6 123 3.92 3.440 18.90 1 0 4 4
## Merc 450SE 16.4 8 275.8 180 3.07 4.070 17.40 0 0 3 3
## Merc 450SL 17.3 8 275.8 180 3.07 3.730 17.60 0 0 3 3
## Merc 450SLC 15.2 8 275.8 180 3.07 3.780 18.00 0 0 3 3
## Cadillac Fleetwood 10.4 8 472.0 205 2.93 5.250 17.98 0 0 3 4
## Lincoln Continental 10.4 8 460.0 215 3.00 5.424 17.82 0 0 3 4
## Chrysler Imperial 14.7 8 440.0 230 3.23 5.345 17.42 0 0 3 4
## Fiat 128 32.4 4 78.7 66 4.08 2.200 19.47 1 1 4 1
## Honda Civic 30.4 4 75.7 52 4.93 1.615 18.52 1 1 4 2
## Toyota Corolla 33.9 4 71.1 65 4.22 1.835 19.90 1 1 4 1
## Toyota Corona 21.5 4 120.1 97 3.70 2.465 20.01 1 0 3 1
## Dodge Challenger 15.5 8 318.0 150 2.76 3.520 16.87 0 0 3 2
## AMC Javelin 15.2 8 304.0 150 3.15 3.435 17.30 0 0 3 2
## Camaro Z28 13.3 8 350.0 245 3.73 3.840 15.41 0 0 3 4
## Pontiac Firebird 19.2 8 400.0 175 3.08 3.845 17.05 0 0 3 2
## Fiat X1-9 27.3 4 79.0 66 4.08 1.935 18.90 1 1 4 1
## Porsche 914-2 26.0 4 120.3 91 4.43 2.140 16.70 0 1 5 2
## Lotus Europa 30.4 4 95.1 113 3.77 1.513 16.90 1 1 5 2
## Ford Pantera L 15.8 8 351.0 264 4.22 3.170 14.50 0 1 5 4
## Ferrari Dino 19.7 6 145.0 175 3.62 2.770 15.50 0 1 5 6
## Maserati Bora 15.0 8 301.0 335 3.54 3.570 14.60 0 1 5 8
## Volvo 142E 21.4 4 121.0 109 4.11 2.780 18.60 1 1 4 2
MC %>%
ggplot(aes(carb, mpg))+
labs(title="relação entre o n° carburadores por nº milhas/galão",
x="n° de carburadores",
y="nº milhas/galão")+
geom_point(color="darkgoldenrod4",fill="yellow",shape=21,size=4)+
tema
Para criar o gráfico de regressão, primeiro é feito o gráfico de
dispersão, usando a função geom_point()
, e adicionando às
variáveis carb
ao eixo X
e mpg
ao
eixo Y
, dentro do comando aes()
.
MC %>%
ggplot(aes(carb, mpg))+
labs(title="relação entre o n° carburadores por nº milhas/galão",
x="n° de carburadores",
y="nº milhas/galão")+
geom_point(color="darkgoldenrod4",fill="yellow",shape=21,size=4)+
geom_smooth(method = "lm", col="red", se=FALSE,formula = "y~x")+
tema
É então calculada a curva de regressão dos dados, com a função
geom_smooth()
. É usado o comando method="lm"
,
assim como anteriormente doi feito nos gráficos de dispersão.
MC %>%
ggplot(aes(carb, mpg))+
labs(title="relação entre o n° carburadores por nº milhas/galão",
x="n° de carburadores",
y="nº milhas/galão")+
geom_point(color="darkgoldenrod4",fill="yellow",shape=21,size=4)+
geom_smooth(method = "lm", col="red", se=FALSE,formula = "y~x")+
stat_regline_equation(aes(label=paste(..eq.label..,..rr.label..,sep = "~~")),size=5)+
tema
## Warning: The dot-dot notation (`..eq.label..`) was deprecated in ggplot2 3.4.0.
## ℹ Please use `after_stat(eq.label)` instead.
Para calcular a função geradora da curva e o R2, usa-se a função
stat_regline_equation(aes(label=paste(..eq.label..,..rr.label..,sep = "~~")))
,
Criando assim tanto a função geradora dos dados do gráfico
,
quanto o R²
. Esses resultados mostram que há uma mínima
relação nº de carburadores e o nº de milhas/galão, com a variável
independente (eixo X
) explicando 30%
dos dados
observados na variável dependente (eixo Y
), sendo esta uma
relação inversalmente proporcional.
MC %>%
ggplot(aes(carb, mpg))+
labs(title="relação entre o n° carburadores por nº milhas/galão",
x="n° de carburadores",
y="nº milhas/galão")+
geom_point(color="darkgoldenrod4",fill="yellow",shape=21,size=4)+
geom_smooth(method = "lm", col="red", se=FALSE,formula = "y~x")+
stat_regline_equation(aes(label=paste(..eq.label..,..rr.label..,sep = "~~")),size=5,label.x=5,label.y=32.5)+
tema
Dentro do comando stat_regline_equation()
, usando os
comandos internos label.x=
e label.y=
, é
possível aterar a posição da equação derivada da requessão e do R²,
escolhendo os pontos no eixo X e no eixo Y, respctivamente.
O gráfico de boxplot é utilizado quando há variáveis qualitativas,
em que cada um dos objetos da variável qualitativa apresenta um conjunto de dados
,
dados esses da variável quantitativa, como em dados de pH em três
trechos específicos de um fragmento de mata ao longo dos 12 meses do
ano. Nesse gráfico, são criados boxplots
,
sendo assim, o gráfico de boxplot é um gráfico com uma variável
qualitativa (eixo X
) e uma varável quantitativa
(eixo Y
). Exemplo: da base de dados starwars
,
qual a variação da altura dos personagens em função da cor dos olhos? É
o que será feito agora.
library(tidyverse)
SW<-starwars
SW
## # A tibble: 87 × 14
## name height mass hair_…¹ skin_…² eye_c…³ birth…⁴ sex gender homew…⁵
## <chr> <int> <dbl> <chr> <chr> <chr> <dbl> <chr> <chr> <chr>
## 1 Luke Skywa… 172 77 blond fair blue 19 male mascu… Tatooi…
## 2 C-3PO 167 75 <NA> gold yellow 112 none mascu… Tatooi…
## 3 R2-D2 96 32 <NA> white,… red 33 none mascu… Naboo
## 4 Darth Vader 202 136 none white yellow 41.9 male mascu… Tatooi…
## 5 Leia Organa 150 49 brown light brown 19 fema… femin… Aldera…
## 6 Owen Lars 178 120 brown,… light blue 52 male mascu… Tatooi…
## 7 Beru White… 165 75 brown light blue 47 fema… femin… Tatooi…
## 8 R5-D4 97 32 <NA> white,… red NA none mascu… Tatooi…
## 9 Biggs Dark… 183 84 black light brown 24 male mascu… Tatooi…
## 10 Obi-Wan Ke… 182 77 auburn… fair blue-g… 57 male mascu… Stewjon
## # … with 77 more rows, 4 more variables: species <chr>, films <list>,
## # vehicles <list>, starships <list>, and abbreviated variable names
## # ¹hair_color, ²skin_color, ³eye_color, ⁴birth_year, ⁵homeworld
starwars
.SW %>%
ggplot(aes(skin_color, height))+
labs(title="altura dos persoanagens em relação à cor do olho",
x="cor da pele",
y="altura")+
geom_boxplot(fill="green", color="black")+
tema
## Warning: Removed 6 rows containing non-finite values (`stat_boxplot()`).
Para criar os boxplot, deve ser ecolhida uma variável qualitativa
para o eixo X
, como a cor da pele
(skin_color
), e uma quantitativa para o eixo
Y
, como a altura (height
). Para produzir os
boxplots, usa-se a função geom_boxplot()
. Porém, são muitos
boxplots, prejudicando o a interpretação dos dados.
SW %>%
filter(skin_color %in% c("light","dark","green","fair")) %>%
ggplot(aes(skin_color, height))+
labs(title="altura dos persoanagens em relação à cor do olho",
x="cor da pele",
y="altura")+
geom_boxplot(fill="green", color="black")+
tema
## Warning: Removed 4 rows containing non-finite values (`stat_boxplot()`).
É possível também selecionar uma cor para cada boxplot. Através do
comando fill=skin_color
foi possível colorir os boxplots de
acordo com seus grupos.
SW %>%
filter(skin_color %in% c("light","dark","green","fair")) %>%
ggplot(aes(skin_color, height,fill=skin_color))+
labs(title="altura dos persoanagens em relação à cor do olho",
x="cor do olho",
y="altura",
fill="cor da pele")+
geom_boxplot(color="black")+
scale_fill_manual(values = c("#5D5D5D","#E5BB91","green1","cyan"))+
tema
## Warning: Removed 4 rows containing non-finite values (`stat_boxplot()`).
Com a função scale_fill_manual()
é possível selecionar
uma paleta de cores específicas para os preenchimentos dos boxplots,
facilitando a interpretação de cada boxplot.
SW %>%
filter(skin_color %in% c("light","dark","green","fair")) %>%
ggplot(aes(skin_color, height,fill=skin_color,color=skin_color))+
labs(title="altura dos persoanagens em relação à cor do olho",
x="cor do olho",
y="altura",
fill="cor da pele",
color="cor da pele")+
geom_boxplot()+
scale_fill_manual(values = c("#5D5D5D","#E5BB91","green1","cyan"))+
scale_color_manual(values = c("red","yellow","darkgreen","blue"))+
tema
## Warning: Removed 4 rows containing non-finite values (`stat_boxplot()`).
Também é possível escolher as cores da borda de cada boxplot. Para
isso, é preciso primeiro especificar à função aes()
o
comando color=skin_color
, para especificar que as cores das
bordas variam em função da cor de pele dos personagens. Após, é
adicionada a função scale_color_manual()
, seguindo os
mesmos passos da função scale_fill_manual()
, sendo que
agora o que será selecionado serão as cores das bordas de cada um dos
boxplots. Outro ponto importante é: quando você atribui a
fill=
e color=
o mesmo título, eles acabam se
tornando a mesma legenda.
Em algumas situações específicas, se faz necessário o uso de textos,
com o intúito apontar ou enfatizar informações no gráfico em questão. Um
exemplo é quando linhas são traçadas, como com as funções
geom_hline()
e geom_vline()
, em que deseja-se
delimitar regiões ou limites dos dados trabalhados, o uso de textos para
explicar e apontar estes limites torna-se um recurso útil. Outro bom
exemplo é no uso de mapas, onde é possível combinar os textos com
labels, criar legendas para as regiões do mapa.
library(tidyverse)
Primeiro, foi carregada o package ggplot2
, para
conseguir produzir os gráficos ggplot, assim como carregar bases de
dados a seres analisadas. Em seguida, foi carregado o package
tidyverse
, para melhor manipular e trabalhar com os dados
utilizados
resposta<-c(0,0,0.05,0.06,0.1,0.15,0.2,0.37,0.45,0.5,0.68,0.74,0.82,0.95,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,0,0,0,0,0,0,0,0,0,0,0,0,0.05,0.09,0.15,0.27,0.39,0.42,0.5,0.62,0.78,0.83,0.91,1,1,1,1,1,1,1,1)
dose<-(rep(c(0,10,20,30,40,50,60,70,80,90,100,110,120,130,140,150,160,170,180,190,200,210,220,230,240,250,260,270,280,290,300),2))
espécies<-(rep(c("sp1","spe2"),each=31))
dados.toxicidade<-data.frame(resposta,dose,espécies)
dados.toxicidade
## resposta dose espécies
## 1 0.00 0 sp1
## 2 0.00 10 sp1
## 3 0.05 20 sp1
## 4 0.06 30 sp1
## 5 0.10 40 sp1
## 6 0.15 50 sp1
## 7 0.20 60 sp1
## 8 0.37 70 sp1
## 9 0.45 80 sp1
## 10 0.50 90 sp1
## 11 0.68 100 sp1
## 12 0.74 110 sp1
## 13 0.82 120 sp1
## 14 0.95 130 sp1
## 15 1.00 140 sp1
## 16 1.00 150 sp1
## 17 1.00 160 sp1
## 18 1.00 170 sp1
## 19 1.00 180 sp1
## 20 1.00 190 sp1
## 21 1.00 200 sp1
## 22 1.00 210 sp1
## 23 1.00 220 sp1
## 24 1.00 230 sp1
## 25 1.00 240 sp1
## 26 1.00 250 sp1
## 27 1.00 260 sp1
## 28 1.00 270 sp1
## 29 1.00 280 sp1
## 30 1.00 290 sp1
## 31 1.00 300 sp1
## 32 0.00 0 spe2
## 33 0.00 10 spe2
## 34 0.00 20 spe2
## 35 0.00 30 spe2
## 36 0.00 40 spe2
## 37 0.00 50 spe2
## 38 0.00 60 spe2
## 39 0.00 70 spe2
## 40 0.00 80 spe2
## 41 0.00 90 spe2
## 42 0.00 100 spe2
## 43 0.00 110 spe2
## 44 0.05 120 spe2
## 45 0.09 130 spe2
## 46 0.15 140 spe2
## 47 0.27 150 spe2
## 48 0.39 160 spe2
## 49 0.42 170 spe2
## 50 0.50 180 spe2
## 51 0.62 190 spe2
## 52 0.78 200 spe2
## 53 0.83 210 spe2
## 54 0.91 220 spe2
## 55 1.00 230 spe2
## 56 1.00 240 spe2
## 57 1.00 250 spe2
## 58 1.00 260 spe2
## 59 1.00 270 spe2
## 60 1.00 280 spe2
## 61 1.00 290 spe2
## 62 1.00 300 spe2
Para a construção do gráfico, foi criada uma base de dados de
toxidade de uma substância na água em função da sua toxicidade
(mortalidade) em duas espécies, e atribuído ao objeto
dados.toxicidade
. Primeiro, foi criada a variável
resposta
, e atribuído a esta os valores de % de mortalidade
de cada espécies às diferentes concentrações da susbtância. Após, foi
criada a variável dose
, e atribuindo à esta os valores das
concentrações testadas para cada espécie. Em seguida, foi criada a
variável espécies
, e utilizando a função
rep()
, foram adicionados as espécies testadas, com 15
repetições para ambas. Por último, foi criado o data frame
dados.toxicidade
, através da função
data.frame()
, utilizando as variáveis
resposta
, dose
e espécies
.
dados.toxicidade %>%
ggplot(aes(dose,resposta,color=espécies))+
geom_line(size=2)+
labs(title="respostas das espécies às concentrações da substância",
x="dose (mg/L)",
y="mortalidade (%)",
color="espécies")+
geom_hline(yintercept=0.5,color="red",linetype="dashed",size=1)+
geom_vline(xintercept=90,color="darkgreen",size=1)+
geom_vline(xintercept=180,color="darkred",size=1)+
scale_x_continuous(breaks=seq(0,300,20))+
scale_y_continuous(breaks=seq(0,1,0.1))+
scale_color_manual(values=c("green1","red"),labels=c("espécie 1","espécie 2"))+
tema
Com os dados da base de dados dados.toxicidade
, é
possível criar o gráfico. Para se tornar mais didático, será adicionado
textos.
dados.toxicidade %>%
ggplot(aes(dose,resposta,color=espécies))+
geom_line(size=2)+
labs(title="respostas das espécies às concentrações da substância",
x="dose (mg/L)",
y="mortalidade (%)",
color="espécies")+
geom_hline(yintercept=0.5,color="red",linetype="dashed",size=1)+
geom_vline(xintercept=90,color="darkgreen",size=1)+
geom_vline(xintercept=180,color="darkred",size=1)+
scale_x_continuous(breaks=seq(0,300,20))+
scale_y_continuous(breaks=seq(0,1,0.1))+
scale_color_manual(values=c("green1","red"),labels=c("espécie 1","espécie 2"))+
geom_text(aes(x = 29.5, y = 0.55),
label = "50% de mortalidade",
size = 4,
color = "red")+
tema
Usando a função geom_text()
é possível adicionar textos
ao gráfico. Dentro da função aes()
:
x: posição do eixo X onde o texto se encontrará;
y: posição do eixo Y onde o texto se encontrará.
Fora da função aes()
:
size: tamanho da letra;
color: cor do texto.
Nesse caso, como é de interesse saber saber a marca onde atingiu 50% de mortalidade, não apenas foi traçada uma linha no ponto 0.5 do eixo Y, como foi aí adicionado o texto.
dados.toxicidade %>%
ggplot(aes(dose,resposta,color=espécies))+
geom_line(size=2)+
labs(title="respostas das espécies às concentrações da substância",
x="dose (mg/L)",
y="mortalidade (%)",
color="espécies")+
geom_hline(yintercept=0.5,color="red",linetype="dashed",size=1)+
geom_vline(xintercept=90,color="darkgreen",size=1)+
geom_vline(xintercept=180,color="darkred",size=1)+
scale_x_continuous(breaks=seq(0,300,20))+
scale_y_continuous(breaks=seq(0,1,0.1))+
scale_color_manual(values=c("green1","red"),labels=c("espécie 1","espécie 2"))+
geom_text(aes(x = 29.5, y = 0.55),
label = "50% de mortalidade",
size = 4,
color = "red")+
geom_text(aes(x = 85, y = -0.03),
label = "dose com 50% de letalida",
size = 3.5,
color = "darkgreen")+
geom_text(aes(x = 190, y = -0.03),
label = "dose com 50% de letalida",
size = 3.5,
color = "darkred")+
tema
Além da linha que delimita o ponto de 50% de mortalidade, é possível também marcar o ponto da dose onde causa 50% de letalidade, para ambas as espécies.
Como muitas vezes aqueles gráficos produzidos irão para algum
destino, como alguma atividade, seminário, artigo, relatório ou tese, é
preiso que aquele gráfico produzido no ggplot seja exportado. Há duas
principais maneiras: manualmente na aba dos plots
ou
através da função ggsave()
.
Na região marcada em vermelho
é onde começa a
exportação, onde o gráfico poderá ser enviado para alguma área do
computador do usuário.
Na região marcada em vermelho
, há os formatos possíveis
a ser exportados os arquivos, como em imagem
,
PDF
ou até copiar, como um simples ctrl+C
. A
escolha vai do desejo do usuário, mas aqui iremos usar o formato de
imagem
, marcado em amarelo
.
Na região marcada em vermelho
é o formato do arquivo que
será selecionado para exportar a imagem, sendo os formatos disponíveis
para imagem: PNG
, JPG
, JPEG
,
TIFF
, BMP
, Metafile
,
SVG
e EPS
. A região marcada em
laranja
é o diretório, o local do dispositivo onde arquivo
será exportado. A região marcada em amarelo
é o nome do
arquivo que será exportado. A região marcada em verde
é a
largura da imagem, em azul
a altura. A região marcada em
roxo
é onde salvar e começar a exportar a imagem, em
rosa
cancelar toda a ação. Porém há um jeito mais simples
de salvar o gráfico, a partir da função ggsave()
, do
package ggplot
.
Como já falado antes, a função ggsave()
é uma função do
package ggplot
, que salva o último gráfico plotado para um
diretório do dispositivo.
library(tidyverse)
SW<-starwars
SW
## # A tibble: 87 × 14
## name height mass hair_…¹ skin_…² eye_c…³ birth…⁴ sex gender homew…⁵
## <chr> <int> <dbl> <chr> <chr> <chr> <dbl> <chr> <chr> <chr>
## 1 Luke Skywa… 172 77 blond fair blue 19 male mascu… Tatooi…
## 2 C-3PO 167 75 <NA> gold yellow 112 none mascu… Tatooi…
## 3 R2-D2 96 32 <NA> white,… red 33 none mascu… Naboo
## 4 Darth Vader 202 136 none white yellow 41.9 male mascu… Tatooi…
## 5 Leia Organa 150 49 brown light brown 19 fema… femin… Aldera…
## 6 Owen Lars 178 120 brown,… light blue 52 male mascu… Tatooi…
## 7 Beru White… 165 75 brown light blue 47 fema… femin… Tatooi…
## 8 R5-D4 97 32 <NA> white,… red NA none mascu… Tatooi…
## 9 Biggs Dark… 183 84 black light brown 24 male mascu… Tatooi…
## 10 Obi-Wan Ke… 182 77 auburn… fair blue-g… 57 male mascu… Stewjon
## # … with 77 more rows, 4 more variables: species <chr>, films <list>,
## # vehicles <list>, starships <list>, and abbreviated variable names
## # ¹hair_color, ²skin_color, ³eye_color, ⁴birth_year, ⁵homeworld
Para fins práticos, será feito com o último gráfico boxplot feito.
SW %>%
filter(skin_color %in% c("light","dark","green","fair")) %>%
ggplot(aes(skin_color, height,fill=skin_color))+
geom_boxplot(color="black")+
labs(title = "Altura dos personagens em função da cor de pele",
x="Cor de pele",
y="Altura (cm)",
fill="cor de pele")+
scale_fill_manual(values = c("#5D5D5D","#E5BB91","green1","cyan"))+
tema
## Warning: Removed 4 rows containing non-finite values (`stat_boxplot()`).
ggsave(filename = "G:/Meu Drive/R/Gráfico_Export.png")
## Warning: Removed 4 rows containing non-finite values (`stat_boxplot()`).
Com a função
filename = "G:/Meu Drive/R/Gráfico_Export.png"
, é informado
dois elementos: 1) o diretório onde o gráfico será exportado
(G:/Meu Drive/R/
); 2) o nome do arquivo, com o seu formato
(Gráfico_Export.png
).
Como feito no ggsave, o gráfico foi exportado para o diretório selecionado.
Como visto, o gráfico foi exportado com sucesso. Também é preciso
saber que o ggsave()
exporta o
último gráfico plotado
, independente se a linha de código
do ggsave()
está abaixo das linhas do ggplot que se deseja
exportar. Por isso, antes de exportar seu gráfico,
certifique-se que o seu gráfico escolhido foi plotado
.
Tudo que foi mostrado aqui são gráficos parados, sem nenhum tipo de
interação com quem o está fazendo ou o lendo. Porém,
há um jeito de tornar os gráficos criados no R interativos, como se fossem um dashboard
library(tidyverse)
library(plotly)
library(htmlwidgets)
Porém, dessa vez, além de dos pacotes básicos já usados, serão também
utilizados mais dois novos. O package plotly
é usado para
criar os gráficos interativos, como um dashboard
. Já o
package htmlwidgets
para salvar os gráficos, com eles
continuando por serem interativos.
SW<-starwars
SW
## # A tibble: 87 × 14
## name height mass hair_…¹ skin_…² eye_c…³ birth…⁴ sex gender homew…⁵
## <chr> <int> <dbl> <chr> <chr> <chr> <dbl> <chr> <chr> <chr>
## 1 Luke Skywa… 172 77 blond fair blue 19 male mascu… Tatooi…
## 2 C-3PO 167 75 <NA> gold yellow 112 none mascu… Tatooi…
## 3 R2-D2 96 32 <NA> white,… red 33 none mascu… Naboo
## 4 Darth Vader 202 136 none white yellow 41.9 male mascu… Tatooi…
## 5 Leia Organa 150 49 brown light brown 19 fema… femin… Aldera…
## 6 Owen Lars 178 120 brown,… light blue 52 male mascu… Tatooi…
## 7 Beru White… 165 75 brown light blue 47 fema… femin… Tatooi…
## 8 R5-D4 97 32 <NA> white,… red NA none mascu… Tatooi…
## 9 Biggs Dark… 183 84 black light brown 24 male mascu… Tatooi…
## 10 Obi-Wan Ke… 182 77 auburn… fair blue-g… 57 male mascu… Stewjon
## # … with 77 more rows, 4 more variables: species <chr>, films <list>,
## # vehicles <list>, starships <list>, and abbreviated variable names
## # ¹hair_color, ²skin_color, ³eye_color, ⁴birth_year, ⁵homeworld
Para esse exemplo, continuará sendo usado a base de dados
Starwars
.
Gráfico<-SW %>%
filter(mass<1000) %>%
ggplot(aes(height,mass,fill=eye_color))+
labs(title="relação entre a altura e a massa dos personagens",
x="altura",
y="massa",
color="cor do olho")+
geom_point(color="black",shape=21,size=4)+
scale_color_manual(values=c("black","blue","#597DAB","#875E1E","#B2FF00","#FFB727","orange","red","#A9A9A9","white","yellow"))+
tema
Gráfico
Para o exemplo que será feito com um gráfico interativo, será
utilizado um gráfico de pontos. Para ser mais interessante e prático de
ser feito com ele, foram feitas duas alterações, em relação ao gráfico
de dsipersão, feito anteriormente no começo desse guia: 1) o gráfico é
feito avaliando à massa em relação à altura dos personagaens da franquia
Star Wars, mas agora os pontos foram coloridos e diferenciados em função
da cor do olho
dos personagens; 2) para ser prático, todo o
script do ggplot foi atribuído ao objeto Gráfico
, e então
usado no função ggplotly()
.
Inter.Graf<-ggplotly(Gráfico)
Inter.Graf
Para poder salvar o gráfico com o formato interativo posteriormente,
foi atribuido ao objeto Inter.Graf
. À primeira vista, pode
parecer não haver mudado nada, mas ao passar o mouse pelo gráfico, ou
clicando em zoom
, as diferenças parecem, como neste gráfico
acima deste texto mesmo, ou através dp exemplo da imagem abaixo. Como é
possível ver, ao passar o mouse por cima dos pontos, é possivel ver os
dados do ponto, como a sua altura, a massa e a cor. Na segunda imagem, é
possível ver a barra de ferramentas na posição superior Direita. Da
esquerda para a direita, respectivamente:
*download do gráfico como png
;
*zoom
, puxando e arrastando, para dar zoom em uma área
específica do gráfico;
movimentar e arrastar o gráfico
;
selecionar pontos específicos com contorno em caixa
;
selecionar pontos específicos com contorno livre
;
zoom in
, para se “aprofundar” no gráfico;
*zoom out
, para se “distanciar” no gráfico;
autoescala
;
resetar área selecionada
;
mostar os dados de cada ponto por vez
e
mostrar todos os dados dos pontos selecionados
.
saveWidget(Inter.Graf,file ="G:/Meu Drive/R/Gráfico.html")
Com a função saveWidget()
, do pacote
htmlwidget
, é possível salvar o gráfico, preservando ele na
sua forma interativa. Para isso, é especificado o gráfico, que estava no
objeto Inter.Graf
, e o local do dispositivo onde o gráfico
será salvo (file ="G:/Meu Drive/R/"
) e o nome do arquivo,
no formato html (Gráfico.html
).
Como é possível observar, o arquivo foi salvo no formato html e no
local informado. É importante verificar se o arquivo está programado
para ser aberto com o seu navegador, que neste caso aqui, é o
Microsft Edge
. Caso não, procure alterar nas configuras, em
propriedades
, do arquivo.
E como pode ser visto, o arquivo foi aberto no Mirosoft Edge, preservando sua capacidade de ser interativo.
Quando criamos um ggplot, ele automaticamente lhe cria um aparência
para o plano de fundo, as grades, os nomes dos eixos, valores dos eixos,
aparência do título, etc. Isso é o que se chama de tema
.
Esses temas são feitos através da função theme()
e suas
variações, como:
theme();
theme_bw();
theme_classic();
theme_dark();
theme_get();
theme_gray();
theme_grey();
theme_light();
theme_linedraw();
theme_minimal();
theme_replace();
theme_set();
theme_test();
theme_update();
theme_void()
Algumas vezes, o tema padrão que o ggplot pode não influenciar na legidibilidade do gráficco, e em outras pode até ajudar. Contudo, há situações que os temas precisam ser alterados, por simples motivos estéticos, ou pelo tema padrão atrapalhar a legidibilidade ou até uma exigência de quem irá avaliar o trabalho. Como é possível personalizar os temas, é uma importante ferramenta para alterar os temas.
Antes de começar a personalizar, é importante lembrar que não
existem, necessariamente, temas melhores
ou
temas piores
. Existem sim temas mais adequados para
diversos fins e necessidades, mas com as possibilidades que serão
expostas aqui, existem mais
5.500 possibilidades de temas personalizados
. Por isso,
lembre-se que cada caso é um caso, e não encare um único tema como um
“salvador universal”.
library(tidyverse)
library(grDevices)
Para começar a criar um gráfico a ser usado para os exemplos, são
carregados os packages ggplot2
, para criar os gráficos em
ggplot, e tidyverse
, mas conseguir trabalhar melhor com os
dados. Em seguida, foi carregado o package grDevices
, para
manipular as fontes de texto dos gráficos.
Ecs<-economics
Ecs
## # A tibble: 574 × 6
## date pce pop psavert uempmed unemploy
## <date> <dbl> <dbl> <dbl> <dbl> <dbl>
## 1 1967-07-01 507. 198712 12.6 4.5 2944
## 2 1967-08-01 510. 198911 12.6 4.7 2945
## 3 1967-09-01 516. 199113 11.9 4.6 2958
## 4 1967-10-01 512. 199311 12.9 4.9 3143
## 5 1967-11-01 517. 199498 12.8 4.7 3066
## 6 1967-12-01 525. 199657 11.8 4.8 3018
## 7 1968-01-01 531. 199808 11.7 5.1 2878
## 8 1968-02-01 534. 199920 12.3 4.5 3001
## 9 1968-03-01 544. 200056 11.7 4.1 2877
## 10 1968-04-01 544 200208 12.3 4.6 2709
## # … with 564 more rows
Para começar, foi carregado a base de dados Economics
, e
atribuída ao objeto Ecs
. Essa base de dados é do package
ggplot, que apresenta dados de séries econômicas da história dos Estados
Unidos. Ela será usada para construir o gráfico ggplot que será testado
as funções de personalização de tema.
exemplo<-Ecs%>%
ggplot(aes(date,unemploy,color=pop))+
geom_line(size=1.1)+
labs(title="Nº de desempregados nos Estados Unidos",
subtitle=" entre 01/07/1967-01/04/2015",
x="Data",
y="Desemprego",
color="tamanho populacional",
caption="dados: Economics")+
scale_color_gradientn(colours =c("purple4","royalblue","dodgerblue","deepskyblue","mediumspringgreen","springgreen","green","lawngreen","greenyellow","yellow", "gold","darkorange","chocolate1","orangered","red","darkred"),breaks=seq(0,325000,20000))
exemplo
Criado o gráfico, é possível criar os temas personalizados.
element_text()
Esse elemento de texto do gráffico, como títulos e legendas. É
possível alterar tamanho, forma e cor. Os elementos devem sempre ser
seguidos de element_text()
. Dentre os diversos elementos de
texto, estão:
text=
:
personaliza todo e qualquer texto do gráfico, sendo tílos ou elementos
da legenda;exemplo+
theme( text = element_text(color="red"))
axis.text=
: personaliza todo e qualquer texto os eixos
do gráfico;exemplo+
theme( axis.text = element_text(color="red"))
axis.text.x=
: personaliza o texto do eixo X do
gráfico;exemplo+
theme( axis.text.x = element_text(color="red"))
axis.text.y=
: personaliza o texto do eixo Y do
gráfico;exemplo+
theme( axis.text.y = element_text(color="red"))
legend.text=
: personaliza o texto da legenda do
gráfico;exemplo+
theme( legend.text = element_text(color="red"))
title=
: personaliza apenas os títulos do gráfico;exemplo+
theme( title = element_text(color="red"))
legend.title=
: personaliza o título da legenda;exemplo+
theme( legend.title = element_text(color="red"))
plot.title=
: personaliza o título do gráfico:exemplo+
theme( plot.title = element_text(color="red"))
plot.subtitle=
: personaliza o subtítulo do
gráfico:exemplo+
theme( plot.subtitle = element_text(color="red"))
plot.caption=
: personaliza a nota de roda-pé do
gráfico:exemplo+
theme( plot.caption = element_text(color="red"))
plot.tag=
: personaliza a marcação do gráfico:exemplo2<-Ecs%>%
ggplot(aes(date,unemploy,color=pop))+
geom_line(size=1.1)+
labs(title="Nº de desempregados nos Estados Unidos",
subtitle=" entre 01/07/1967-01/04/2015",
tag="o tamanho populacional só cresceu",
x="Data",
y="Desemprego",
color="tamanho populacional",
caption="dados: Economics")+
scale_color_gradientn(colours =c("purple4","royalblue","dodgerblue","deepskyblue","mediumspringgreen","springgreen","green","lawngreen","greenyellow","yellow", "gold","darkorange","chocolate1","orangered","red","darkred"),breaks=seq(0,325000,20000))
exemplo2+
theme( plot.tag = element_text(color="red"))
axis.title=
:personaliza os títulos dos eixos X e
Y;exemplo+
theme( axis.title = element_text(color="red"))
axis.title.x=
: personaliza apenas o título do eixo
X;exemplo+
theme( axis.title.x = element_text(color="red"))
axis.title.y=
: personaliza apenas o título do eixo
Y.exemplo+
theme( axis.title.y = element_text(color="red"))
Personalizando a fonte
:windowsFonts(TimesNewRoman=windowsFont("Times New Roman"),
WideLatin=windowsFont("Wide Latin"),
Mistral=windowsFont("Mistral"))
exemplo+
theme(text=element_text(family = "TimesNewRoman"))
exemplo+
theme(text=element_text(family = "WideLatin"))
exemplo+
theme(text=element_text(family = "Mistral"))
Naturalmente, é o ggplot criar seus plots com textos na fonte Arial,
mas também é possível alterar a fonte dos textos do plot. Para isso, é
usado a função Windownsfonts()
, do package
grDevices
, especificando uma fonte salva no sistema do
dispositivo, e atribuindo a um objeto. Após feito, basta apenas usar o
comando family=
para o objeto criado, dentro do comando
text=element_text()
.
element_line()
Esse elemento de linhas do gráfico, como as linhas dos eixos e as
grades. É possível alterar tamanho, forma e cor. Os elementos devem
sempre ser seguidos de element_line()
. Dentre os diversos
elementos de texto, estão:
axis.line=
: personaliza as linhas dos eixos X e Y;exemplo+
theme( axis.line = element_line(color="red"))
axis.line.x=
: personaliza apenas a linha do eixo
X;exemplo+
theme( axis.line.x = element_line(color="red"))
axis.line.y=
: personaliza apenas a linha do eixo
Y;exemplo+
theme( axis.line.y = element_line(color="red"))
axis.ticks=
: personaliza as marcas dos valores dos
eixos;exemplo+
theme( axis.ticks = element_line(color="red"))
axis.ticks.x=
: personaliza as marcas dos valores do
eixo X;exemplo+
theme( axis.ticks.x = element_line(color="red"))
axis.ticks.y=
: personaliza as marcas dos valores do
eixo Y;exemplo+
theme( axis.ticks.y = element_line(color="red"))
panel.grid=
: personaliza as linhas de grade;exemplo+
theme( panel.grid = element_line(color="red"))
panel.grid,major=
: personaliza as linhas de grade
superiores;exemplo+
theme( panel.grid.major = element_line(color="red"))
panel.grid,major.x=
: personaliza as linhas de grade
superiores do eixo X;exemplo+
theme( panel.grid.major.x = element_line(color="red"))
panel.grid.major.y=
: personaliza as linhas de grade
superiores do eixo Y;exemplo+
theme( panel.grid.major.y = element_line(color="red"))
panel.grid.minor=
: personaliza as linhas de grade
inferiores;exemplo+
theme( panel.grid.minor = element_line(color="red"))
panel.grid.minor.x=
: personaliza as linhas de grade
inferiores do eixo X;exemplo+
theme( panel.grid.minor.x = element_line(color="red"))
panel.grid.minor.y=
: personaliza as linhas de grade
inferiores do eixo Y;exemplo+
theme( panel.grid.minor.y = element_line(color="red"))
element_rect()
Esse elemento do retângulo do controno do gráfico. É possível alterar
tamanho, forma e cor. Os elementos devem sempre ser seguidos de
element_rect()
. Dentre os diversos elementos de texto,
estão:
legend.background=
: personaliza o retângulo que
forma-se em volta da legenda. Usando a função fill=
,
escolhendo uma cor, é possível colorir o preenchimento do
retângulo;exemplo+
theme( legend.background = element_rect(color="red",fill="green"))
legend.key=
: personaliza o retângulo que forma-se em
volta de cada elemento da legenda. Nesse caso, foi usado um outro
gráfico, usando a base de dadUsando a função fill=
,
escolhendo uma cor, é possível colorir o preenchimento do
retângulo;SW<-starwars
SW
## # A tibble: 87 × 14
## name height mass hair_…¹ skin_…² eye_c…³ birth…⁴ sex gender homew…⁵
## <chr> <int> <dbl> <chr> <chr> <chr> <dbl> <chr> <chr> <chr>
## 1 Luke Skywa… 172 77 blond fair blue 19 male mascu… Tatooi…
## 2 C-3PO 167 75 <NA> gold yellow 112 none mascu… Tatooi…
## 3 R2-D2 96 32 <NA> white,… red 33 none mascu… Naboo
## 4 Darth Vader 202 136 none white yellow 41.9 male mascu… Tatooi…
## 5 Leia Organa 150 49 brown light brown 19 fema… femin… Aldera…
## 6 Owen Lars 178 120 brown,… light blue 52 male mascu… Tatooi…
## 7 Beru White… 165 75 brown light blue 47 fema… femin… Tatooi…
## 8 R5-D4 97 32 <NA> white,… red NA none mascu… Tatooi…
## 9 Biggs Dark… 183 84 black light brown 24 male mascu… Tatooi…
## 10 Obi-Wan Ke… 182 77 auburn… fair blue-g… 57 male mascu… Stewjon
## # … with 77 more rows, 4 more variables: species <chr>, films <list>,
## # vehicles <list>, starships <list>, and abbreviated variable names
## # ¹hair_color, ²skin_color, ³eye_color, ⁴birth_year, ⁵homeworld
exemplo3<-SW%>%
ggplot(aes(height,mass,color=eye_color))+
geom_line(size=1)+
labs(title="Relação altura em relação à massa dos personagens da franquia de Star Wars",
x="Altura",
y="Massa",
color="cor do olho")
exemplo3+
theme( legend.key = element_rect(color="red",fill="green"))
## Warning: Removed 12 rows containing missing values (`geom_line()`).
legend.box.background=
: personaliza o semi-retângulo
que forma-se em volta de cada elemento da legenda;exemplo+
theme( legend.box.background = element_rect(color="red"))
panel.background=
: personaliza o retângulo que forma-se
em volta do gráfico. Com a função fill=
, é possível colorir
o interior do gráfico;exemplo+
theme( panel.background = element_rect(color="red",fill="green"))
plot.background=
: personaliza o retângulo que forma-se
em volta dde todo o plot. Com a função fill=
, é possível
colorir o interior do gráfico;exemplo+
theme( plot.background = element_rect(color="red",fill="green",size=1.5))
element_blank()
Esse elemento elimina os demais elementos do gráfico, apagando-os. Os
elementos, como text=
, line=
ou
react
devem sempre ser seguidos de
element_blank()
. Dentre os diversos elementos de texto,
estão:
text=
: apaga todos os elementos de texto do
gráfico;exemplo+
theme( title = element_blank())
elementos específicos do texto
: é possível também
apagar um elemento de texto em específico, como o título da legenda, o
título do eixo X ou os valores dos eixos, com os comandos para estes
mesmos elementos específicos, ensinados antiormenteexemplo+
theme( legend.title = element_blank())
exemplo+
theme( axis.title.x = element_blank())
exemplo+
theme( axis.text = element_blank())
line=
: apaga todos os elementos de linha gráfico;exemplo+
theme( line = element_blank())
elementos específicos de linha
: é possível também
apagar um elemento de texto em específico, como as linhas dos valores do
eixo X, as linhas dos valores do eixo Y ou as linha dos valores
superiores dos eixos, com os comandos para estes mesmos elementos
específicos, ensinados antiormenteexemplo+
theme( axis.ticks.x = element_blank())
exemplo+
theme( axis.ticks.y = element_blank())
exemplo+
theme( panel.grid.major = element_blank())
react=
: apaga todos os retângulos;exemplo3+
theme( legend.key = element_blank())
## Warning: Removed 12 rows containing missing values (`geom_line()`).
Em muitas situações, é preciso reutilizar aquele mesmo tema, com
aquele mesmo estilo para gráficos com finalidades semelhantes. Para
evitar ter que escrever tudo de novo, é possível atribuir a configuração
de uma tema a um objeto. Porém, antes de criar um novo e tema e atribuir
à qualquer gráfico, certifique-se que
o gráfico é compatível com as configurações do tema criado
,
a fim de evitar problemas de plotar.
theme.new<-theme( text = element_text(color="black",size=12),axis.text=element_text(color="black"),legend.title = element_text(color="black"),panel.grid=element_line(color="gray"),axis.line=element_line(color="black"),panel.background=element_rect(fill="white"),legend.background = element_rect(fill="white"),plot.background=element_rect(fill="#7494a5"))
Tendo criado agora o tema, é possível configurar o gráfico modelo com este tema.
exemplo+
theme.new
Adicionando ao ggplot o objeto theme.line
, é possível
agora configurar o gráfico com o tema criado.
Há siruações em que diferentes análises semelhantes são feitas. Exemplo é testando o crescimento populacional de 4 espécies num mesmo espaço de tempo. Para facilitar a interpretação e análise nestas situações, uma solução útil é pôr os gráficos todos juntos no mesmo campo de visão. Para isso, os gráficos são plotados de uma única vez.
library(tidyverse)
library(cowplot)
Foi carregado o package ggplot2
para criar os gráficos,
assim como para carregar as bases de dados que serão utilizadas. Em
seguida, foi carregado o package tidyverse
, para melhor
trabalahr com os dados que serão utilizados. Por último, foi carregado o
package cowplot
, para poder ser plotado vários gráficos de
uma vez.
SW<-starwars
SW
## # A tibble: 87 × 14
## name height mass hair_…¹ skin_…² eye_c…³ birth…⁴ sex gender homew…⁵
## <chr> <int> <dbl> <chr> <chr> <chr> <dbl> <chr> <chr> <chr>
## 1 Luke Skywa… 172 77 blond fair blue 19 male mascu… Tatooi…
## 2 C-3PO 167 75 <NA> gold yellow 112 none mascu… Tatooi…
## 3 R2-D2 96 32 <NA> white,… red 33 none mascu… Naboo
## 4 Darth Vader 202 136 none white yellow 41.9 male mascu… Tatooi…
## 5 Leia Organa 150 49 brown light brown 19 fema… femin… Aldera…
## 6 Owen Lars 178 120 brown,… light blue 52 male mascu… Tatooi…
## 7 Beru White… 165 75 brown light blue 47 fema… femin… Tatooi…
## 8 R5-D4 97 32 <NA> white,… red NA none mascu… Tatooi…
## 9 Biggs Dark… 183 84 black light brown 24 male mascu… Tatooi…
## 10 Obi-Wan Ke… 182 77 auburn… fair blue-g… 57 male mascu… Stewjon
## # … with 77 more rows, 4 more variables: species <chr>, films <list>,
## # vehicles <list>, starships <list>, and abbreviated variable names
## # ¹hair_color, ²skin_color, ³eye_color, ⁴birth_year, ⁵homeworld
Para a criação dos dados, foi carregada abase dados
starwars
, do package ggplot2
, que possui dados
de alguns personagens da franquia Star Wars, e então atribuído ao objeto
SW
.
G1<-SW %>%
ggplot(aes(sex,height,fill=sex))+
geom_boxplot(color="black")+
labs(title = "altura dos personagens em função do sexo",
x="sexo",
y="altura",
fill="sexo")+
tema
G1
## Warning: Removed 6 rows containing non-finite values (`stat_boxplot()`).
G2<-SW %>%
ggplot(aes(gender,height,fill=gender))+
geom_boxplot(color="black")+
labs(title = "altura dos personagens em função do gênero",
x="gênero",
y="altura",
fill="gênero")+
tema
G2
## Warning: Removed 6 rows containing non-finite values (`stat_boxplot()`).
G3<-SW %>%
ggplot(aes(hair_color,height,fill=hair_color))+
geom_boxplot(color="black")+
labs(title = "altura dos personagens em função da cor de cabelo",
x="cor de cabelo",
y="altura",
fill="cor do cabelo")+
tema
G3
## Warning: Removed 6 rows containing non-finite values (`stat_boxplot()`).
Foram criados três gráficos, a aprtir da base de dado
SW
, e atribuídos aos objetos
G1
,G2
e G3
. Para poder plotar
todos os gráficos juntos de uma vez, é preciso atribuir os gráficos à
objetos.
plot_grid(G1,G2,G3)
## Warning: Removed 6 rows containing non-finite values (`stat_boxplot()`).
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family
## 'TimesNewRoman' not found in PostScript font database
## Warning: Removed 6 rows containing non-finite values (`stat_boxplot()`).
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning: Removed 6 rows containing non-finite values (`stat_boxplot()`).
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
Através da função plot_grid()
é possível plotar os 3
gráficos de uma vez, inserior os objetos dos gráficos, na ordem que
deseja aparecerem.
plot_grid(G1,G2,G3,ncol=1)
## Warning: Removed 6 rows containing non-finite values (`stat_boxplot()`).
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning: Removed 6 rows containing non-finite values (`stat_boxplot()`).
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning: Removed 6 rows containing non-finite values (`stat_boxplot()`).
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
Através do elemento ncol=
é possível escolher o Nº de
colunas. Se ncol=1
, todos os gráficos ficarão em linhas
diferentes, em que a quantidade de linhas será a quantidade de
gráficos.
plot_grid(G1,G2,G3,nrow=1)
## Warning: Removed 6 rows containing non-finite values (`stat_boxplot()`).
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning: Removed 6 rows containing non-finite values (`stat_boxplot()`).
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning: Removed 6 rows containing non-finite values (`stat_boxplot()`).
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family 'TimesNewRoman' not found in PostScript font database
Através do elemento nrows=
é possível escolher o Nº de
linhas. Se nrows=1
, todos os gráficos ficarão em colunas
diferentes, em que a quantidade de colunas será a quantidade de
gráficos.
facet_wrap()
SW %>%
mutate(`É humano?`=case_when(species=="Human"~"Humano",
species!="Human"~"Não-Humano",
species==NA~"Sem Identificação")) %>%
ggplot(aes(mass,height,fill=`É humano?`))+
geom_point(shape=21,color="black",size=4)+
labs(x="Massa",
y="Altura")+
facet_wrap(~`É humano?`)+
tema
## Warning: Removed 28 rows containing missing values (`geom_point()`).
A função facet_wrap()
é do package ggplot2
,
e cria um plot dividido baseado em algum critério, alguma variável, da
base de dados que está sendo utilizada na construção do ggplot. A grande
vantagem do uso do facet_wrap()
em relação ao
cowplot()
é que o facet_wrap()
não depende que
sejam criados objetos contendo os ggplots, mas sim que o critério de
divisão esteja em alguma variável da base de dados. A única possível
desvantagem do uso do facet_wrap()
é que caso não exista a
variável na base de dados, não será possível criar o gráfico
particionado. Contudo, isso pode ser contornado com uma simples
manipulação de dados: como existe uma qantidade muito grande de espécies
na bse de dados SW
, foi utilizada a função
mutate()
, para criar uma nova variável, em conjunto com a
função case_when()
, para criar uma seleção condicional,
criando uma nova variável É Humano?
, onde os personagens da
espécie humana estariam como Humano
e as outras espécies
como Não-Humano
ou NA
.
SW %>%
mutate(`É humano?`=case_when(species=="Human"~"Humano",
species!="Human"~"Não-Humano",
species==NA~"Sem Identificação")) %>%
ggplot(aes(mass,height,fill=`É humano?`))+
geom_point(shape=21,color="black",size=4)+
labs(x="Massa",
y="Altura")+
facet_wrap(~`É humano?`,ncol=2)+
tema
## Warning: Removed 28 rows containing missing values (`geom_point()`).
SW %>%
mutate(`É humano?`=case_when(species=="Human"~"Humano",
species!="Human"~"Não-Humano",
species==NA~"Sem Identificação")) %>%
ggplot(aes(mass,height,fill=`É humano?`))+
geom_point(shape=21,color="black",size=4)+
labs(x="Massa",
y="Altura")+
facet_wrap(~`É humano?`,nrow=3)+
tema
## Warning: Removed 28 rows containing missing values (`geom_point()`).
Assim como no cowplot()
, também é possível selecionar o
nº de linhas e colunas desejadas no plot.
SW %>%
mutate(`É humano?`=case_when(species=="Human"~"Humano",
species!="Human"~"Não-Humano",
species==NA~"Sem Identificação")) %>%
ggplot(aes(mass,height,fill=`É humano?`))+
geom_point(shape=21,color="black",size=4)+
labs(x="Massa",
y="Altura")+
facet_wrap(~`É humano?`,scale="free")+
tema
## Warning: Removed 28 rows containing missing values (`geom_point()`).
SW %>%
mutate(`É humano?`=case_when(species=="Human"~"Humano",
species!="Human"~"Não-Humano",
species==NA~"Sem Identificação")) %>%
ggplot(aes(mass,height,fill=`É humano?`))+
geom_point(shape=21,color="black",size=4)+
labs(x="Massa",
y="Altura")+
facet_wrap(~`É humano?`,scale="free_x")+
tema
## Warning: Removed 28 rows containing missing values (`geom_point()`).
SW %>%
mutate(`É humano?`=case_when(species=="Human"~"Humano",
species!="Human"~"Não-Humano",
species==NA~"Sem Identificação")) %>%
ggplot(aes(mass,height,fill=`É humano?`))+
geom_point(shape=21,color="black",size=4)+
labs(x="Massa",
y="Altura")+
facet_wrap(~`É humano?`,scale="free_y")+
tema
## Warning: Removed 28 rows containing missing values (`geom_point()`).
O padrão do facet_wrap()
é de deixar uma escala
padronizada para os dois eixos. Contudo, é possível observar nos ultimos
plots que há espaços do gráfico sem a ocorrência de pontos. Isso
acontece porque a padronização não leva em conta as diferenças nas
escalas das distribuiçõe para os diferentes elementos da variável que
divide os plots. É possível controlar essa escala com:
scale="free"
: para que as escalas de ambos os eixos
estejam ajustadas para cada distribuição em particular;
scale="free_x"
: para que a escala dos eixos X
estejam ajustadas para cada distribuição em particular;
scale="free_y"
: para que a escala dos eixos Y
estejam ajustadas para cada distribuição em particular;
SW %>%
mutate(`É humano?`=case_when(species=="Human"~"Humano",
species!="Human"~"Não-Humano",
species==NA~"Sem Identificação")) %>%
ggplot(aes(mass,height,fill=`É humano?`))+
geom_point(shape=21,color="black",size=4)+
labs(x="Massa",
y="Altura")+
facet_wrap(~`É humano?`+gender)+
tema
## Warning: Removed 28 rows containing missing values (`geom_point()`).
Também é possível combinar variáveis, fazendo assim análises combinatória com diferentes variáveis.
facet_wrap()
tema_facet<-theme(text=element_text(family="TimesNewRoman"),
title=element_text(color="black",size=15),
axis.text = element_text(color="black",size=10),
axis.title = element_text(color="black",size=10),
panel.grid=element_line(color="grey75",linetype = "dashed",size=.5),
axis.line=element_blank(),
plot.background=element_rect(fill="white",color="white"),
panel.background=element_rect(fill="white"),
panel.border = element_rect(colour = "black", fill = NA,size=0.59),
legend.key= element_rect(color="white",fill="white"),
strip.background = element_rect(colour="black",fill="#4B8899"))
SW %>%
mutate(`É humano?`=case_when(species=="Human"~"Humano",
species!="Human"~"Não-Humano",
species==NA~"Sem Identificação")) %>%
ggplot(aes(mass,height,fill=`É humano?`))+
geom_point(shape=21,color="black",size=4)+
labs(x="Massa",
y="Altura")+
facet_wrap(~`É humano?`)+
tema_facet
## Warning: Removed 28 rows containing missing values (`geom_point()`).
Outra coisa que é possível de ser feita com o
facet_wrap()
é mudando a cor de prrenchimento e contorno
das caixas. Para isso, é utilizado o comando
strip.background=element_rect()
na função
theme()
.
SW %>%
mutate(`É humano?`=case_when(species=="Human"~"Humano",
species!="Human"~"Não-Humano",
species==NA~"Sem Identificação")) %>%
ggplot(aes(mass,height,fill=`É humano?`))+
geom_point(shape=21,color="black",size=4)+
labs(x="Massa",
y="Altura")+
facet_grid(gender~`É humano?`)+
tema
## Warning: Removed 28 rows containing missing values (`geom_point()`).
Enquanto que o facet_wrap()
dividia baseado apenas em
colunas, usando uma única variável ou um conjunto de variáveis, o
facet_grid()
também cria uma vombinação, mas baseado em
formato de grade. Todas as propriedades anteriormente feitas no
facet_wrap()
são aplicáveis ao
facet_grid()
.
Em algumas situações, para melhor exemplificar aspectos de uma análise, ou apenas deixá-la mais didática, é muito utilizado a adição de imagens ao gráfico. Adição de imagens pode ser muito útil, como quando se deseja representar uma espécie, ou até apresentar as bandeiras de estados ou países.
library(tidyverse)
library(ggimage)
Foi carregado o package ggplot2
para criar os gráficos.
Em seguida, foi carregado o package tidyverse
, para melhor
trabalahr com os dados que serão utilizados. Por último, foi carregado o
package ggimage
, para poder adicionar imagens ao gráfico
ggplot
n.spe1<-c(18,15,14,12,9,7,5)
n.spe1
## [1] 18 15 14 12 9 7 5
n.spe2<-c(18,16,13,11,10,4,3)
n.spe2
## [1] 18 16 13 11 10 4 3
red.hab1<-c(0.0,0.05,0.1,0.15,0.2,0.25,0.3)
red.hab1
## [1] 0.00 0.05 0.10 0.15 0.20 0.25 0.30
red.hab2<-c(0.0,0.05,0.1,0.15,0.2,0.25,0.3)
red.hab2
## [1] 0.00 0.05 0.10 0.15 0.20 0.25 0.30
Primeiro, foram criados os objetos n.spe1
e
n.spe2
, que descrevem o nº de indivíduos de duas espécies
de serpentes do gênero Crotalus sp.. Após, foram criados os
objetos red.hab1
e red.hab2
, que descrevem as
porcentagens de redução de habitat em que as espécies foram
coletadas.
crotalus1<-data.frame(n.spe1,red.hab1)
crotalus1
## n.spe1 red.hab1
## 1 18 0.00
## 2 15 0.05
## 3 14 0.10
## 4 12 0.15
## 5 9 0.20
## 6 7 0.25
## 7 5 0.30
crotalus2<-data.frame(n.spe2,red.hab2)
crotalus2
## n.spe2 red.hab2
## 1 18 0.00
## 2 16 0.05
## 3 13 0.10
## 4 11 0.15
## 5 10 0.20
## 6 4 0.25
## 7 3 0.30
Após terem sido criadas as variáveis referentes à cada espécie, foram
criados os data frames para a base de dados de cada espécie, através da
função data.frame()
, e atribuídos aos objetos
crotalus1
e crotalus2
.
g1<-crotalus1 %>%
ggplot()+
geom_line(aes(red.hab1,n.spe1),color="black",size=1)+
geom_point(aes(red.hab1,n.spe1),color="black",fill="yellow",shape=21,size=4)+
scale_x_continuous(breaks=seq(0.0,0.30,0.05))+
scale_y_continuous(breaks=seq(0,18,2))+
labs(title=" ",
x="% da redução de habitat",
y="nº de indivíduos coletados")+
tema+
geom_image(aes(x=0.20,y=17,image = "crotalus1.png"),size=0.4)
g1
g2<-crotalus2 %>%
ggplot()+
geom_line(aes(red.hab2,n.spe2),color="black",size=1)+
geom_point(aes(red.hab2,n.spe2),color="black",fill="yellow",shape=21,size=4)+
scale_x_continuous(breaks=seq(0.0,0.30,0.05))+
scale_y_continuous(breaks=seq(0,18,2))+
labs(title=" ",
x="% da redução de habitat",
y="nº de indivíduos coletados")+
tema+
geom_image(aes(x=0.20,y=17,image = "crotalus2.png"),size=0.4)
g2
Após definido o diretório, são feitos os gráficos. Nesse caso, a
especificação dos eixos, no comando aes()
, não é feita no
elemento ggplot()
, mas sim no elemento
geom_line()
e no geom_point()
, para que o
comando consiga adicionar a imagem. Ou seja: a especificação dos eixos
deve ocorrer nos mesmos locais que se define o tipo de gráfico a ser
feito, na ondem de sobreposição em que se deseja fazer (nesse caso,
pontos por cima das linhas. Para asdicionar a imagem, é usada a função
geom_image()
, do package ggimage
, onde dentro
do comando aes()
da função é especificado:
x: posição da imagem pelo eixo X;
y: posição da imagem pelo eixo Y;
image: imagem a ser carregada, com “nome o arquivo.formato do arquivo”.
Fora do comando aes()
, é especificado o tamanho da
imagem, pelo argumento size=
, onde é aconselhável que o
tamanho da imagem esteja entre 0 e 1.
Nestas situações, é muito útil ter os dois gráficos no campo de visão
para serem comparados, como feito no tópico anterior do guia. Para isso,
usa-se a função plot_grid()
library(cowplot)
plot_grid(g1,g2)
Carregando o package cowplot
, e usando a sua função
plot_grid()
, é possível plot de uma única vez os dois
plots.
Em gráficos de dispersão, por exemplo, é comum usar oo comando
aes(color=variável)
, ou alternativamente
aes(fill=variável)
, para diferenciar os pontos em relação à
variáveis qualitativas no gráfico, como espécies, locais e comunidades
diferentes, e vizualizar de formas melhores como aqueles diferenntes
dados estão dispersos nos dados. Uma forma de facilitar essa
vizualização é delimitar círculos ou elípses que representem os
diferentes tipos de dados, criando clusters.
library(ggforce)
library(tidyverse)
library(palmerpenguins)
Foi carregado o package ggforce
, que é utilizado para
criar estes clusters. Em seguida, foi carregado o package
tidyverse
, que carrega tanto o package ggplot2
quanto outros utilizados para trabalhar com os dados. Por último, foi
carregado o package palmerpenguins
, para utilizar dados
morfométricos sobre pinguins.
pinguins<-penguins %>%
drop_na()
pinguins
## # A tibble: 333 × 8
## species island bill_length_mm bill_depth_mm flipper_…¹ body_…² sex year
## <fct> <fct> <dbl> <dbl> <int> <int> <fct> <int>
## 1 Adelie Torgersen 39.1 18.7 181 3750 male 2007
## 2 Adelie Torgersen 39.5 17.4 186 3800 fema… 2007
## 3 Adelie Torgersen 40.3 18 195 3250 fema… 2007
## 4 Adelie Torgersen 36.7 19.3 193 3450 fema… 2007
## 5 Adelie Torgersen 39.3 20.6 190 3650 male 2007
## 6 Adelie Torgersen 38.9 17.8 181 3625 fema… 2007
## 7 Adelie Torgersen 39.2 19.6 195 4675 male 2007
## 8 Adelie Torgersen 41.1 17.6 182 3200 fema… 2007
## 9 Adelie Torgersen 38.6 21.2 191 3800 male 2007
## 10 Adelie Torgersen 34.6 21.1 198 4400 male 2007
## # … with 323 more rows, and abbreviated variable names ¹flipper_length_mm,
## # ²body_mass_g
Usando a própia base de dados peguins
, do package
palmerpeguins
, atribuimos ela ao objeto
pinguins
. Explorando esta base de dados, podemos ver as
seguintes variáveis:
species
: as três espécies de pinguins estudadas
(Adélie, Chinstrap e Gentoo);
island
: as três ilhas estudadas (Biscoe, Dream ou
Torgersen);
bill_length_mm
: o número do comprimento do bico em
mm;
bill_depth_mm
: o número da profundidade do bico em
mm;
flipper_length_mm
: o número inteiro do comprimento
da asa/nadadeira em mm;
body_mass_g
: massa corporal em g;
sex
: sexo dos pinguins;
year
: os anos do estudo (2007, 2008 e
2009).
pinguins %>%
ggplot(aes(body_mass_g,bill_length_mm))+
geom_point(size=4)+
labs(title="Relação entre o tamanho do bico e a massa corporal",
subtitle="Espécies mais pesadas possuem maiores bicos?",
x="massa corporal (g)",
y="comprimento do bico (mm)")+
scale_x_continuous(breaks = seq(2500,7000,500))+
tema
Conseguimos ter uma noção de inferência básica de que espécimes mais pesados possuem maiores comprimento de bico. Mas como isso reflete-se nas espécies?
pinguins %>%
ggplot(aes(body_mass_g,bill_length_mm,fill=species))+
geom_point(size=4,shape=21,color="black",alpha=0.65)+
labs(title="Relação entre o tamanho do bico e a massa corporal",
subtitle="O padrão observado anteriormente tem influência da espécie?",
x="massa corporal (g)",
y="comprimento do bico (mm)",
fill="Espécies")+
scale_x_continuous(breaks = seq(2500,7000,500))+
scale_fill_manual(values=c("#FFAA52","#52FF73","#8952FF"))+
tema
Dsicriminando os pontos em relação às espécies, é possível observar que existe sim uma inflência das espécies em relação aos dados observados. Agora, vamos delimitar os grupos utilizando clusters.
pinguins %>%
ggplot(aes(body_mass_g,bill_length_mm,fill=species))+
geom_point(size=4,shape=21,color="black",alpha=0.65)+
labs(title="Relação entre o tamanho do bico e a massa corporal",
subtitle="O padrão observado anteriormente tem influência da espécie?",
x="massa corporal (g)",
y="comprimento do bico (mm)",
fill="Espécies",
color="Espécies")+
scale_x_continuous(breaks = seq(2500,7000,500))+
geom_mark_circle(aes(color=species))+
scale_fill_manual(values=c("#FFAA52","#52FF73","#8952FF"))+
tema
## Warning: Using the `size` aesthetic in this geom was deprecated in ggplot2 3.4.0.
## ℹ Please use `linewidth` in the `default_aes` field and elsewhere instead.
Com a função geom_mark_circle()
, é possível criar
círculos que delimitam os dados discriminados no comando
aes()
. Contudo, os cícrlos criam área que cobrem quase toda
a área dos dados, e não dão muita noção de dispersão dos dados. Vamos
tentar de outra forma
pinguins %>%
ggplot(aes(body_mass_g,bill_length_mm,fill=species))+
geom_point(size=4,shape=21,color="black",alpha=0.65)+
labs(title="Relação entre o tamanho do bico e a massa corporal",
subtitle="O padrão observado anteriormente tem influência da espécie?",
x="massa corporal (g)",
y="comprimento do bico (mm)",
fill="Espécies",
color="Espécies")+
scale_x_continuous(breaks = seq(2500,7000,500))+
geom_mark_ellipse(aes(color=species))+
scale_fill_manual(values=c("#FFAA52","#52FF73","#8952FF"))+
tema
Com a função geom_mark_ellipse()
, ao contrário de criar
um círculo perfeito, este cria uma elípse, baseado na distribuição dos
dados, não opucando tanto espaço, e dando melhor noção de distribuição.
Aqui podemos observar que os dados tendem a se distribuir mais pela
massa do que pelo comprimento do bico.
pinguins %>%
ggplot(aes(body_mass_g,bill_length_mm,fill=species))+
geom_point(size=4,shape=21,color="black",alpha=0.65)+
labs(title="Relação entre o tamanho do bico e a massa corporal",
subtitle="O padrão observado anteriormente tem influência da espécie?",
x="massa corporal (g)",
y="comprimento do bico (mm)",
fill="Espécies",
color="Espécies")+
scale_x_continuous(breaks = seq(2500,7000,500))+
geom_mark_rect(aes(color=species))+
scale_fill_manual(values=c("#FFAA52","#52FF73","#8952FF"))+
tema
É um funcionamento semelhante ao cluster em círculos, mas com polígonos.
pinguins %>%
ggplot(aes(body_mass_g,bill_length_mm,fill=species))+
geom_point(size=4,shape=21,color="black",alpha=0.65)+
labs(title="Relação entre o tamanho do bico e a massa corporal",
subtitle="O padrão observado anteriormente tem influência da espécie?",
x="massa corporal (g)",
y="comprimento do bico (mm)",
fill="Espécies",
color="Espécies")+
scale_x_continuous(breaks = seq(2500,7000,500))+
geom_mark_hull(aes(color=species))+
scale_fill_manual(values=c("#FFAA52","#52FF73","#8952FF"))+
tema
Este é o “menos elegante” de todos. Aqui não é criada uma forma geométrica específica, mas baseada na distribuição dos dados.
clusterpolígonos<-pinguins %>%
group_by(species) %>%
slice(chull(body_mass_g,bill_length_mm))
pinguins %>%
ggplot(aes(body_mass_g,bill_length_mm,fill=species,color=species))+
geom_point(size=4,shape=21,color="black",alpha=0.65)+
geom_polygon(data=clusterpolígonos,alpha=0.35)+
labs(title="Relação entre o tamanho do bico e a massa corporal",
subtitle="O padrão observado anteriormente tem influência da espécie?",
x="massa corporal (g)",
y="comprimento do bico (mm)",
fill="Espécies",
color="Espécies")+
scale_x_continuous(breaks = seq(2500,7000,500))+
scale_fill_manual(values=c("#FFAA52","#52FF73","#8952FF"))+
tema
Para criar os clúster baseados em polígonos, foi usada a função
geom_polygon()
, onde antes é necessário calcular a área do
polígono: foi usada a função group_by()
com a variável
species
, para diferenciar em função das espécies, em
seguida usando a função slice*()
, com chul()
junto, utilizando o eixo X e o eixo Y utilizado no gráfico, para indicar
com base em que produzir os polígonos. Com o novo objeto criado, foram
então feitos os polígonos. Nesse caso, o que é feito é criar um
mínimo polígono convexo
. A vantagem deste em relação aos
demais é que, ao usar um mínimo polígono convexo, os clusters ocupam o
menor espaço possível, o que é útil para tentar diferenciar os grupos
dentro de uma dispersão, já que usar o menor espaço possível também
evita confundir áreas de intersseção.
Em algumas situações onde estão sendo trabalhado com dados espaciais
de pontos em coordenadas específicas, busca-se entender a trajetória
daqueles pontos num espaço geográfico. É uma abordagem muito utilizada
ao trabalhar com objetos espaciais, como ruas, rios, trilhas ou o
caminho percorrido por algum animal. A forma mais clara de vizualizar
estes tipos de dados é através de um caminho, representado por uma
linha. Contudo, por mais que a função geom_line()
seja
usada para criar linhas nos gráficos, esta não é a mais adequada, e sim,
a função geom_path()
.
library(readxl)
library(tidyverse)
Além do package tidyverse
, que carregará não apenas o
package ggplot2
como também outros packages para trabalhar
com os dados, foi carregado o package readxl
, para poder
carregar nossa base de dados.
bdr<-read_xlsx("G:/Meu Drive/R/Base de dados rio.xlsx")
bdr
## # A tibble: 30 × 14
## X Y dfs ele slo dis pH har pho nit amm oxy bod
## <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl>
## 1 85.7 20 0.3 934 48 0.84 7.9 45 0.01 0.2 0 12.2 2.7
## 2 85.0 20.1 2.2 932 3 1 8 40 0.02 0.2 0.1 10.3 1.9
## 3 92.3 23.8 10.2 914 3.7 1.8 8.3 52 0.05 0.22 0.05 10.5 3.5
## 4 91.3 26.4 18.5 854 3.2 2.53 8 72 0.1 0.21 0 11 1.3
## 5 92.0 29.2 21.5 849 2.3 2.64 8.1 84 0.38 0.52 0.2 8 6.2
## 6 96.0 36.3 32.4 846 3.2 2.86 7.9 60 0.2 0.15 0 10.2 5.3
## 7 98.2 38.8 36.8 841 6.6 4 8.1 88 0.07 0.15 0 11.1 2.2
## 8 99.5 46.4 49.1 792 2.5 1.3 8.1 94 0.2 0.41 0.12 7 8.1
## 9 110. 55.9 70.5 752 1.2 4.8 8 90 0.3 0.82 0.12 7.2 5.2
## 10 131. 66.6 99 617 9.9 10 7.7 82 0.06 0.75 0.01 10 4.3
## # … with 20 more rows, and 1 more variable: pontos <dbl>
Será utilizada uma base de dados que contém dados de coordenadas
espaciais (X
e Y
) e dandos ambientais de
trechos de um rio.
geom_line()
bdr %>%
ggplot(aes(X,Y))+
geom_line(size=1)+
labs(title = "Pontos do rio",
x="Longitude",
y="Latitude")+
tema
Como pode ser observado, não é formado um caminho em si, mas uma
linha que cresce e sobe. Isso acontece pois o geom_line()
forma uma linha linear: ela vai da esquerda para a direita. Como o
objetivo é formar uma linha que se comporte como um caminho, que possa
fazer curvas e desvios, o mais adequada é usar a função
geom_path()
.
bdr %>%
ggplot(aes(X,Y,label=pontos))+
geom_path(size=1)+
geom_label(size=2.5)+
labs(title = "Pontos do rio",
x="Longitude",
y="Latitude")+
tema
Como observado acima, agora temos um caminho traçado. O próximo passo agora é customizar. Para isso, valos levantar as seguintes perguntas: como se comporta a elevação e a demanda biológica por oxigênio?
bdr %>%
ggplot(aes(X,Y,color=ele,label=pontos))+
geom_path(size=1.5)+
geom_label(size=2.5,color="black")+
labs(title = "Pontos do rio",
x="Longitude",
y="Latitude",
color="elevação (m)")+
scale_color_gradientn(colours =c("purple4","royalblue","dodgerblue","deepskyblue","mediumspringgreen","springgreen","green","lawngreen","greenyellow","yellow", "gold","darkorange","chocolate1","orangered","red","darkred"))+
tema
Como é possível observar, o ponto 1 é o ponto com maior elevação do rio, e segue-se um gradiente até o último ponto.
bdr %>%
ggplot(aes(X,Y,color=ele,label=pontos,fill=bod))+
geom_path(size=1.5)+
geom_label(size=2.5,color="black")+
labs(title = "Pontos do rio",
x="Longitude",
y="Latitude",
fill="BOD",
color="Elevação (m)")+
scale_fill_gradientn(colours=c("greenyellow","lawngreen","green","mediumspringgreen","dodgerblue","royalblue","purple4"),
breaks=seq(1,17,2))+
scale_color_gradientn(colours=c("purple4","royalblue","dodgerblue","deepskyblue","mediumspringgreen","springgreen","green","lawngreen","greenyellow","yellow", "gold","darkorange","chocolate1","orangered","red","darkred"))+
tema
Ao contrário do que foi observado nos dados de elevação, não foi possível observar um gradiente sobre o a demanda biológica por exigênio (BOD) ao longo do rio, onde os pontos 23 e 25 apresentaram altas taxas de BOD em relação às demais.
Uma desvantagem do uso de boxplots é que o boxplot não apresenta a distribuição dos pontos: os quartis apresenta apenas intervalos específicos. Em algumas situações, até não é aconselhável o uso de boxplots. Contudo, uma alternativa que tem se popularizado com o tempo é o uso de boxplots com pontos que representam dados.
library(tidyverse)
Foi carregado o package tidyverse
, que permite não só
utilizar outros packages para o tratamento de dados quanto o uso do
package ggplot2
.
Mpg<-mpg
Mpg
## # A tibble: 234 × 11
## manufacturer model displ year cyl trans drv cty hwy fl class
## <chr> <chr> <dbl> <int> <int> <chr> <chr> <int> <int> <chr> <chr>
## 1 audi a4 1.8 1999 4 auto… f 18 29 p comp…
## 2 audi a4 1.8 1999 4 manu… f 21 29 p comp…
## 3 audi a4 2 2008 4 manu… f 20 31 p comp…
## 4 audi a4 2 2008 4 auto… f 21 30 p comp…
## 5 audi a4 2.8 1999 6 auto… f 16 26 p comp…
## 6 audi a4 2.8 1999 6 manu… f 18 26 p comp…
## 7 audi a4 3.1 2008 6 auto… f 18 27 p comp…
## 8 audi a4 quattro 1.8 1999 4 manu… 4 18 26 p comp…
## 9 audi a4 quattro 1.8 1999 4 auto… 4 16 25 p comp…
## 10 audi a4 quattro 2 2008 4 manu… 4 20 28 p comp…
## # … with 224 more rows
Foi carregada a base de dados mpg
, que armazena dados
econômicos sobre 38 modelos de carros populares 1999-2008, e atribuído
ao objeto Mpg
. Essa e outras bases de dados, como a base de
dados star wars
está no sistema do package
ggplot2
Mpg %>%
ggplot(aes(class,hwy))+
geom_boxplot(color="black")+
labs(title = "milhas/galão em relação à classe do carro",
x="classe",
y="mihas/galão",
fill="classe")+
tema
Para entender melhor como os dados se distribuem, usará agora pontos.
Mpg %>%
ggplot(aes(class,hwy,fill=class))+
geom_point(size=3,color="black",shape=21)+
geom_boxplot(color="black",fill=NA,size=0.643)+
labs(title = "milhas/galão em relação à classe do carro",
x="classe",
y="mihas/galão",
fill="classe")+
scale_fill_manual(values=c("chocolate1","gold","royalblue","firebrick","seagreen1","darkorchid1","limegreen"))+
tema
Para conseguirmos entender mais informações no gráfico.
Mpg %>%
ggplot(aes(class,hwy,fill=displ))+
geom_point(shape=21,color="black",size=3)+
geom_boxplot(fill=NA,color="black",size=0.643)+
labs(title = "milhas/galão em relação à classe do carro",
x="classe",
y="mihas/galão",
fill="cilidradas/motor(L)")+
scale_fill_gradientn(colours=c("purple4","royalblue","dodgerblue","deepskyblue","mediumspringgreen","springgreen","green","lawngreen","greenyellow","yellow", "gold","darkorange","chocolate1","orangered","red","darkred"),breaks=seq(1.6,7.0,0.9))+
tema
Dess forma, é mais visível observarr a distibuição dos dados que compõe o boxplot. Nesse exemplo, os pontos se comportam formando uma linha vertical. Alternativamente, é possível utilizar ontos distribuídos não em uma linha reta.
Mpg %>%
ggplot(aes(class,hwy,fill=displ))+
geom_jitter(shape=21,color="black",size=3)+
geom_boxplot(fill=NA,color="black",size=0.643)+
labs(title = "milhas/galão em relação à classe do carro",
x="classe",
y="mihas/galão",
fill="cilidradas/motor(L)")+
scale_fill_gradientn(colours=c("purple4","royalblue","dodgerblue","deepskyblue","mediumspringgreen","springgreen","green","lawngreen","greenyellow","yellow", "gold","darkorange","chocolate1","orangered","red","darkred"),breaks=seq(1.6,7.0,0.9))+
tema
Usando o comando geom_jitterr()
, ao invés de os pontos
estarem distribuídos não como um linha reta, mas sim distribuídos como
grupos também na horizontal. Importante ressaltar que a distribuição
horizontal segue de forma aleatória, e cada novo plot, por mais que use
os mesmos dados, trás uma nova distribuição.
Mpg %>%
ggplot(aes(class,hwy,fill=displ))+
geom_jitter(shape=21,color="black",size=3)+
geom_boxplot(fill=NA,color="black",size=0.643)+
labs(title = "milhas/galão em relação à classe do carro",
x="classe",
y="mihas/galão",
fill="cilidradas/motor(L)")+
scale_fill_gradientn(colours=c("purple4","royalblue","dodgerblue","deepskyblue","mediumspringgreen","springgreen","green","lawngreen","greenyellow","yellow", "gold","darkorange","chocolate1","orangered","red","darkred"),breaks=seq(1.6,7.0,0.9))+
tema
Como foi possível observar, uma nova distribuição. Uma possível desvantagem desse uso é que, pelos pontos também possuírem uma distribuição horizontal, é possível haja problemas de interpretações quanto às distribuições horizontais.
É muito comum ao usar boxplots perder um pouco da noção sobre o quanto de dados cada intervalo possui. Os boxplots são úteis para sintetizar a distribuição dos dados de uma variável, mas não permite informar em que ponto daquela variável houve maior cinjunto de dados. Esse tipo de informação é útil quando deseja-se entender em que ponto uma variável apresentou mais observações.
library(tidyverse)
Foi carregado o package tidyverse, que permite não só utilizar outros packages para o tratamento de dados quanto o uso do package ggplot2.
Iris<-iris
Iris
## Sepal.Length Sepal.Width Petal.Length Petal.Width Species
## 1 5.1 3.5 1.4 0.2 setosa
## 2 4.9 3.0 1.4 0.2 setosa
## 3 4.7 3.2 1.3 0.2 setosa
## 4 4.6 3.1 1.5 0.2 setosa
## 5 5.0 3.6 1.4 0.2 setosa
## 6 5.4 3.9 1.7 0.4 setosa
## 7 4.6 3.4 1.4 0.3 setosa
## 8 5.0 3.4 1.5 0.2 setosa
## 9 4.4 2.9 1.4 0.2 setosa
## 10 4.9 3.1 1.5 0.1 setosa
## 11 5.4 3.7 1.5 0.2 setosa
## 12 4.8 3.4 1.6 0.2 setosa
## 13 4.8 3.0 1.4 0.1 setosa
## 14 4.3 3.0 1.1 0.1 setosa
## 15 5.8 4.0 1.2 0.2 setosa
## 16 5.7 4.4 1.5 0.4 setosa
## 17 5.4 3.9 1.3 0.4 setosa
## 18 5.1 3.5 1.4 0.3 setosa
## 19 5.7 3.8 1.7 0.3 setosa
## 20 5.1 3.8 1.5 0.3 setosa
## 21 5.4 3.4 1.7 0.2 setosa
## 22 5.1 3.7 1.5 0.4 setosa
## 23 4.6 3.6 1.0 0.2 setosa
## 24 5.1 3.3 1.7 0.5 setosa
## 25 4.8 3.4 1.9 0.2 setosa
## 26 5.0 3.0 1.6 0.2 setosa
## 27 5.0 3.4 1.6 0.4 setosa
## 28 5.2 3.5 1.5 0.2 setosa
## 29 5.2 3.4 1.4 0.2 setosa
## 30 4.7 3.2 1.6 0.2 setosa
## 31 4.8 3.1 1.6 0.2 setosa
## 32 5.4 3.4 1.5 0.4 setosa
## 33 5.2 4.1 1.5 0.1 setosa
## 34 5.5 4.2 1.4 0.2 setosa
## 35 4.9 3.1 1.5 0.2 setosa
## 36 5.0 3.2 1.2 0.2 setosa
## 37 5.5 3.5 1.3 0.2 setosa
## 38 4.9 3.6 1.4 0.1 setosa
## 39 4.4 3.0 1.3 0.2 setosa
## 40 5.1 3.4 1.5 0.2 setosa
## 41 5.0 3.5 1.3 0.3 setosa
## 42 4.5 2.3 1.3 0.3 setosa
## 43 4.4 3.2 1.3 0.2 setosa
## 44 5.0 3.5 1.6 0.6 setosa
## 45 5.1 3.8 1.9 0.4 setosa
## 46 4.8 3.0 1.4 0.3 setosa
## 47 5.1 3.8 1.6 0.2 setosa
## 48 4.6 3.2 1.4 0.2 setosa
## 49 5.3 3.7 1.5 0.2 setosa
## 50 5.0 3.3 1.4 0.2 setosa
## 51 7.0 3.2 4.7 1.4 versicolor
## 52 6.4 3.2 4.5 1.5 versicolor
## 53 6.9 3.1 4.9 1.5 versicolor
## 54 5.5 2.3 4.0 1.3 versicolor
## 55 6.5 2.8 4.6 1.5 versicolor
## 56 5.7 2.8 4.5 1.3 versicolor
## 57 6.3 3.3 4.7 1.6 versicolor
## 58 4.9 2.4 3.3 1.0 versicolor
## 59 6.6 2.9 4.6 1.3 versicolor
## 60 5.2 2.7 3.9 1.4 versicolor
## 61 5.0 2.0 3.5 1.0 versicolor
## 62 5.9 3.0 4.2 1.5 versicolor
## 63 6.0 2.2 4.0 1.0 versicolor
## 64 6.1 2.9 4.7 1.4 versicolor
## 65 5.6 2.9 3.6 1.3 versicolor
## 66 6.7 3.1 4.4 1.4 versicolor
## 67 5.6 3.0 4.5 1.5 versicolor
## 68 5.8 2.7 4.1 1.0 versicolor
## 69 6.2 2.2 4.5 1.5 versicolor
## 70 5.6 2.5 3.9 1.1 versicolor
## 71 5.9 3.2 4.8 1.8 versicolor
## 72 6.1 2.8 4.0 1.3 versicolor
## 73 6.3 2.5 4.9 1.5 versicolor
## 74 6.1 2.8 4.7 1.2 versicolor
## 75 6.4 2.9 4.3 1.3 versicolor
## 76 6.6 3.0 4.4 1.4 versicolor
## 77 6.8 2.8 4.8 1.4 versicolor
## 78 6.7 3.0 5.0 1.7 versicolor
## 79 6.0 2.9 4.5 1.5 versicolor
## 80 5.7 2.6 3.5 1.0 versicolor
## 81 5.5 2.4 3.8 1.1 versicolor
## 82 5.5 2.4 3.7 1.0 versicolor
## 83 5.8 2.7 3.9 1.2 versicolor
## 84 6.0 2.7 5.1 1.6 versicolor
## 85 5.4 3.0 4.5 1.5 versicolor
## 86 6.0 3.4 4.5 1.6 versicolor
## 87 6.7 3.1 4.7 1.5 versicolor
## 88 6.3 2.3 4.4 1.3 versicolor
## 89 5.6 3.0 4.1 1.3 versicolor
## 90 5.5 2.5 4.0 1.3 versicolor
## 91 5.5 2.6 4.4 1.2 versicolor
## 92 6.1 3.0 4.6 1.4 versicolor
## 93 5.8 2.6 4.0 1.2 versicolor
## 94 5.0 2.3 3.3 1.0 versicolor
## 95 5.6 2.7 4.2 1.3 versicolor
## 96 5.7 3.0 4.2 1.2 versicolor
## 97 5.7 2.9 4.2 1.3 versicolor
## 98 6.2 2.9 4.3 1.3 versicolor
## 99 5.1 2.5 3.0 1.1 versicolor
## 100 5.7 2.8 4.1 1.3 versicolor
## 101 6.3 3.3 6.0 2.5 virginica
## 102 5.8 2.7 5.1 1.9 virginica
## 103 7.1 3.0 5.9 2.1 virginica
## 104 6.3 2.9 5.6 1.8 virginica
## 105 6.5 3.0 5.8 2.2 virginica
## 106 7.6 3.0 6.6 2.1 virginica
## 107 4.9 2.5 4.5 1.7 virginica
## 108 7.3 2.9 6.3 1.8 virginica
## 109 6.7 2.5 5.8 1.8 virginica
## 110 7.2 3.6 6.1 2.5 virginica
## 111 6.5 3.2 5.1 2.0 virginica
## 112 6.4 2.7 5.3 1.9 virginica
## 113 6.8 3.0 5.5 2.1 virginica
## 114 5.7 2.5 5.0 2.0 virginica
## 115 5.8 2.8 5.1 2.4 virginica
## 116 6.4 3.2 5.3 2.3 virginica
## 117 6.5 3.0 5.5 1.8 virginica
## 118 7.7 3.8 6.7 2.2 virginica
## 119 7.7 2.6 6.9 2.3 virginica
## 120 6.0 2.2 5.0 1.5 virginica
## 121 6.9 3.2 5.7 2.3 virginica
## 122 5.6 2.8 4.9 2.0 virginica
## 123 7.7 2.8 6.7 2.0 virginica
## 124 6.3 2.7 4.9 1.8 virginica
## 125 6.7 3.3 5.7 2.1 virginica
## 126 7.2 3.2 6.0 1.8 virginica
## 127 6.2 2.8 4.8 1.8 virginica
## 128 6.1 3.0 4.9 1.8 virginica
## 129 6.4 2.8 5.6 2.1 virginica
## 130 7.2 3.0 5.8 1.6 virginica
## 131 7.4 2.8 6.1 1.9 virginica
## 132 7.9 3.8 6.4 2.0 virginica
## 133 6.4 2.8 5.6 2.2 virginica
## 134 6.3 2.8 5.1 1.5 virginica
## 135 6.1 2.6 5.6 1.4 virginica
## 136 7.7 3.0 6.1 2.3 virginica
## 137 6.3 3.4 5.6 2.4 virginica
## 138 6.4 3.1 5.5 1.8 virginica
## 139 6.0 3.0 4.8 1.8 virginica
## 140 6.9 3.1 5.4 2.1 virginica
## 141 6.7 3.1 5.6 2.4 virginica
## 142 6.9 3.1 5.1 2.3 virginica
## 143 5.8 2.7 5.1 1.9 virginica
## 144 6.8 3.2 5.9 2.3 virginica
## 145 6.7 3.3 5.7 2.5 virginica
## 146 6.7 3.0 5.2 2.3 virginica
## 147 6.3 2.5 5.0 1.9 virginica
## 148 6.5 3.0 5.2 2.0 virginica
## 149 6.2 3.4 5.4 2.3 virginica
## 150 5.9 3.0 5.1 1.8 virginica
Foi carregada a bse de dados iris
, que descreve o
comprimento e a largura das pétalas e das sépalas de 3 espécies de
plantas do gênero Iris sp (I. setosa, I.
versicolor e I. virginica) (Fisher, R. A. (1936) The use
of multiple measurements in taxonomic problems. Annals of Eugenics, 7,
Part II, 179–188, The data were collected by Anderson, Edgar (1935). The
irises of the Gaspe Peninsula, Bulletin of the American Iris Society,
59, 2–5), e atribuído ao objeto iris
. Essa base de dados é
nativa do próprio sistema do R, então não é necessário baixá-la por fora
nem instalar nenhum package para utiliza-la.
Iris %>%
ggplot(aes(Species,Sepal.Length,fill=Species))+
geom_violin(color="black",aes(fill=Species))+
labs(x="espécies",
y="comprimento da sépala",
fill="espécies")+
scale_fill_manual(values=c("#FFAA52","#52FF73","#8952FF"))+
tema
Como foi possível observar, as 3 espécies possuem um padrão os dados possuem uma gaussiana: os valores do comprimento mais frequente para as 3 espécies foram valores médios. Também foi possível observar que a espécie I. setosa mais valores de comprimento mínimo da sépala em relação ao comprimento máximo observado, equanto que foi observado o oposto na espécie I. virginica.
Iris %>%
ggplot(aes(Species,Sepal.Length,fill=Species))+
geom_violin(color="black",aes(fill=Species))+
geom_boxplot(color="black",alpha=0)+
labs(x="espécies",
y="comprimento da sépala",
fill="espécies")+
scale_fill_manual(values=c("#FFAA52","#52FF73","#8952FF"))+
tema
Foi criado um gráfico de boxplot em conjunto com o gráfico de violino, para somar as propriedades dos dois tipos de gráficos.
Iris %>%
ggplot(aes(Species,Sepal.Length,fill=Species))+
geom_violin(color="black",aes(fill=Species))+
geom_boxplot(color="black",alpha=0)+
geom_jitter(color="black",aes(fill=Species),size=4,shape=21,alpha=0.55)+
labs(x="espécies",
y="comprimento da sépala",
fill="espécies")+
scale_fill_manual(values=c("#FFAA52","#52FF73","#8952FF"))+
tema
Outra forma de apresentar os dados é utilizando a função
geom_jiter()
. Como o geom_violin()
e o
geom_jiter()
, na prátrica, apresentam a mesma coisa
(distribuição e concentração dos dados ao longo de uma distribuição), é
uma escolha interessante unir as duas funções. A vantagem do
geom_violin()
é que ele resolve um problema do
geom_jiter()
: enquanto que a distribuição horizontal
aleatória dos pontos do geom_jiter()
pode comprometer a
interpretação, o geom_violin()
consegue representar a mesma
coisa, mas sem comprometer a interpretação.
Nos últimos anos, o R ganhou notoriedade no quesito análises de dados
espaciais, e isso faz com que o desenvolvimento da visualização destes
dados também tenham ganhado notoriedade, principalmente o
ggplot
.
library(tidyverse)
library(geobr)
library(sf)
library(sp)
library(raster)
library(ggspatial)
Foi carregado o pacote o package tidyverse
para o
tratamento dos dados e para usar a função ggplot()
, o
package geobr
foi carregado para extrair dados vetoriais do
Brasil, os packages sf
, sp
e
raster
foram carregados para carregar e trabalhar com dados
vetorais e matriciais, e o package ggspatial
foi carregado
para adicionar elementos aos mapas.
Dados vetoriais são polígonos, shapefiles, criados para demarcar uma
área, baseado em coordenadas. Normalmente, estão no fromato
.shp
. A função read_sf()
, do package
sf
, bastando apenas indicar o caminho do dispositivo. Por
exemplo:
BR<-read_sf("G:/Meu Drive/QGIS/BR_Pais_2021.shp")
BR %>% plot
Arquivos .shp podem contar mais de uma propriedade dentro desses,
como as variáveis de um dataset. Contudo, para facilitar, será utilizada
o package geobr
, onde a função read_country()
carrega o shapefile Do Brasil, a função read_state()
os
estados e a função read_municipality()
os municípios, onde
foi filtrado apenas para Recife.
Brasil<-read_country()
##
Downloading: 1.8 kB
Downloading: 1.8 kB
Downloading: 1.8 kB
Downloading: 1.8 kB
Downloading: 9.9 kB
Downloading: 9.9 kB
Downloading: 18 kB
Downloading: 18 kB
Downloading: 26 kB
Downloading: 26 kB
Downloading: 34 kB
Downloading: 34 kB
Downloading: 34 kB
Downloading: 34 kB
Downloading: 42 kB
Downloading: 42 kB
Downloading: 50 kB
Downloading: 50 kB
Downloading: 50 kB
Downloading: 50 kB
Downloading: 58 kB
Downloading: 58 kB
Downloading: 67 kB
Downloading: 67 kB
Downloading: 67 kB
Downloading: 67 kB
Downloading: 75 kB
Downloading: 75 kB
Downloading: 83 kB
Downloading: 83 kB
Downloading: 91 kB
Downloading: 91 kB
Downloading: 110 kB
Downloading: 110 kB
Downloading: 110 kB
Downloading: 110 kB
Downloading: 120 kB
Downloading: 120 kB
Downloading: 120 kB
Downloading: 120 kB
Downloading: 140 kB
Downloading: 140 kB
Downloading: 140 kB
Downloading: 140 kB
Downloading: 160 kB
Downloading: 160 kB
Downloading: 170 kB
Downloading: 170 kB
Downloading: 190 kB
Downloading: 190 kB
Downloading: 200 kB
Downloading: 200 kB
Downloading: 210 kB
Downloading: 210 kB
Downloading: 210 kB
Downloading: 210 kB
Downloading: 230 kB
Downloading: 230 kB
Downloading: 230 kB
Downloading: 230 kB
Downloading: 240 kB
Downloading: 240 kB
Downloading: 260 kB
Downloading: 260 kB
Downloading: 270 kB
Downloading: 270 kB
Downloading: 270 kB
Downloading: 270 kB
Downloading: 290 kB
Downloading: 290 kB
Downloading: 290 kB
Downloading: 290 kB
Downloading: 310 kB
Downloading: 310 kB
Downloading: 310 kB
Downloading: 310 kB
Downloading: 330 kB
Downloading: 330 kB
Downloading: 340 kB
Downloading: 340 kB
Downloading: 360 kB
Downloading: 360 kB
Downloading: 370 kB
Downloading: 370 kB
Downloading: 380 kB
Downloading: 380 kB
Downloading: 400 kB
Downloading: 400 kB
Downloading: 410 kB
Downloading: 410 kB
Downloading: 420 kB
Downloading: 420 kB
Downloading: 420 kB
Downloading: 420 kB
Downloading: 430 kB
Downloading: 430 kB
Downloading: 430 kB
Downloading: 430 kB
Downloading: 440 kB
Downloading: 440 kB
Downloading: 440 kB
Downloading: 440 kB
Downloading: 440 kB
Downloading: 440 kB
Brasil
## Simple feature collection with 1 feature and 0 fields
## Geometry type: MULTIPOLYGON
## Dimension: XY
## Bounding box: xmin: -73.99045 ymin: -33.75208 xmax: -28.83594 ymax: 5.271841
## Geodetic CRS: SIRGAS 2000
## geom
## 1 MULTIPOLYGON (((-48.46837 -...
Estados<-read_state()
##
|
| | 0%
|
|=== | 4%
|
|===== | 7%
|
|======== | 11%
|
|========== | 15%
|
|============= | 19%
|
|================ | 22%
|
|================== | 26%
|
|===================== | 30%
|
|======================= | 33%
|
|========================== | 37%
|
|============================= | 41%
|
|=============================== | 44%
|
|================================== | 48%
|
|==================================== | 52%
|
|======================================= | 56%
|
|========================================= | 59%
|
|============================================ | 63%
|
|=============================================== | 67%
|
|================================================= | 70%
|
|==================================================== | 74%
|
|====================================================== | 78%
|
|========================================================= | 81%
|
|============================================================ | 85%
|
|============================================================== | 89%
|
|================================================================= | 93%
|
|=================================================================== | 96%
|
|======================================================================| 100%
Estados
## Simple feature collection with 27 features and 5 fields
## Geometry type: MULTIPOLYGON
## Dimension: XY
## Bounding box: xmin: -66.81025 ymin: -13.6937 xmax: -59.77435 ymax: -7.969294
## Geodetic CRS: SIRGAS 2000
## First 10 features:
## code_state abbrev_state name_state code_region name_region
## 1 11 RO Rondônia 1 Norte
## 2 12 AC Acre 1 Norte
## 3 13 AM Amazonas 1 Norte
## 4 14 RR Roraima 1 Norte
## 5 15 PA Pará 1 Norte
## 6 16 AP Amapá 1 Norte
## 7 17 TO Tocantins 1 Norte
## 8 21 MA Maranhão 2 Nordeste
## 9 22 PI Piauí 2 Nordeste
## 10 23 CE Ceará 2 Nordeste
## geom
## 1 MULTIPOLYGON (((-63.32721 -...
## 2 MULTIPOLYGON (((-73.18253 -...
## 3 MULTIPOLYGON (((-67.32609 2...
## 4 MULTIPOLYGON (((-60.20051 5...
## 5 MULTIPOLYGON (((-54.95431 2...
## 6 MULTIPOLYGON (((-51.1797 4....
## 7 MULTIPOLYGON (((-48.35878 -...
## 8 MULTIPOLYGON (((-45.84073 -...
## 9 MULTIPOLYGON (((-41.74605 -...
## 10 MULTIPOLYGON (((-41.16703 -...
estados<-read_sf("G:/Meu Drive/QGIS/BR_UF_2021.shp")
estados
## Simple feature collection with 27 features and 4 fields
## Geometry type: MULTIPOLYGON
## Dimension: XY
## Bounding box: xmin: -73.99045 ymin: -33.75118 xmax: -28.84764 ymax: 5.271841
## Geodetic CRS: SIRGAS 2000
## # A tibble: 27 × 5
## CD_UF NM_UF SIGLA NM_REGIAO geometry
## <chr> <chr> <chr> <chr> <MULTIPOLYGON [°]>
## 1 11 Rondônia RO Norte (((-62.86662 -7.975868, -62.86017 -7.982323,…
## 2 12 Acre AC Norte (((-73.1655 -7.341657, -73.0548 -7.381713, -…
## 3 13 Amazonas AM Norte (((-67.32609 2.029714, -67.31682 2.00125, -6…
## 4 14 Roraima RR Norte (((-60.20051 5.264343, -60.19828 5.260453, -…
## 5 15 Pará PA Norte (((-46.43676 -1.019055, -46.43723 -1.019144,…
## 6 16 Amapá AP Norte (((-50.45011 2.109243, -50.44715 2.109169, -…
## 7 17 Tocantins TO Norte (((-48.35878 -5.170085, -48.35617 -5.171852,…
## 8 21 Maranhão MA Nordeste (((-44.66115 -2.980178, -44.66157 -2.980344,…
## 9 22 Piauí PI Nordeste (((-41.78076 -2.760779, -41.77935 -2.764125,…
## 10 23 Ceará CE Nordeste (((-40.49582 -2.785405, -40.49242 -2.787038,…
## # … with 17 more rows
Recife<-read_municipality() %>%
filter(name_muni=="Recife")
##
|
| | 0%
|
|=== | 4%
|
|===== | 7%
|
|======== | 11%
|
|========== | 15%
|
|============= | 19%
|
|================ | 22%
|
|================== | 26%
|
|===================== | 30%
|
|======================= | 33%
|
|========================== | 37%
|
|============================= | 41%
|
|=============================== | 44%
|
|================================== | 48%
|
|==================================== | 52%
|
|======================================= | 56%
|
|========================================= | 59%
|
|============================================ | 63%
|
|=============================================== | 67%
|
|================================================= | 70%
|
|==================================================== | 74%
|
|====================================================== | 78%
|
|========================================================= | 81%
|
|============================================================ | 85%
|
|============================================================== | 89%
|
|================================================================= | 93%
|
|=================================================================== | 96%
|
|======================================================================| 100%
Recife
## Simple feature collection with 1 feature and 4 fields
## Geometry type: MULTIPOLYGON
## Dimension: XY
## Bounding box: xmin: -35.0167 ymin: -8.155123 xmax: -34.86058 ymax: -7.929206
## Geodetic CRS: SIRGAS 2000
## code_muni name_muni code_state abbrev_state geom
## 1 2611606 Recife 26 PE MULTIPOLYGON (((-34.96842 -...
Catimbau<-read_sf("G:/Meu Drive/QGIS/Catimbau.shp")
Já os dados matriciais, os raters, são dados que mostram diferentes
valores em diferentes pontos, através de pixelagem. Eles são utilizados
para gradientes em áreas espaciais, como em mapas de altitude,
normalmente no formato .tif
.
topo_catimbau <- raster("G:/Meu Drive/QGIS/TopoCatimbau.tif")
Assim como com os shapefiles, é possível carregar rasters do
dispositivo, através da função raster()
, do package
raster
. Contudo, também é possível baixar rasters usando o
R. Um exemplo de bases de dados, é a plataforma online WorldClim
.
É possível acessá-la através do função worldclim_country()
,
do package geodata
.
São 19 variáveis bioclimáticas do WorldClim, sendo estas:
BIO1
= Temperatura Média Anual;
BIO2
= Intervalo Diurno Médio (Média do mês
(temperatura máxima - temperatura mín.));
BIO3
= Isotermalidade (BIO2/BIO7) (×100);
BIO4
= Sazonalidade da Temperatura (desvio padrão
×100);
BIO5
= Temperatura máxima do mês mais
quente;
BIO6
= Temperatura mínima do mês mais frio;
BIO7
= Faixa Anual de Temperatura
(BIO5-BIO6);
BIO8
= Temperatura média do trimestre mais
úmido;
BIO9
= Temperatura média do trimestre mais
seco;
BIO10
= Temperatura Média do Trimestre Mais
Quente;
BIO11
= Temperatura média do trimestre mais
frio;
BIO12
= Precipitação Anual;
BIO13
= Precipitação do mês mais úmido;
BIO14
= Precipitação do Mês Mais Seco;
BIO15
= Sazonalidade de Precipitação (Coeficiente de
Variação);
BIO16
= Precipitação do trimestre mais
úmido;
BIO17
= Precipitação do trimestre mais
seco;
BIO18
= Precipitação do Quarto Mais Quente;
BIO19
= Precipitação do trimestre mais
frio;
Ao escolher a variável bio
, no comando
var=bio
, escolhe-se as variáveis bioclimáticas, mas outras
variáveis, como:
tmin
;
tmax
;
tavg
;
prec
;
bio
;
elev
Existem outros pacotes e outros tipos de rasters que podem ser
baixados, como dados de elevação, do pacote elevatr
.
Contudo, para facilitar esse guia, cujo objetivo é a costrução do
ggplot, aqui será focado no que fazer tendo os dados em mãos, e não na
aquisição destes dados. Em caso de dúvidas sobre aquisição de dados
rasters, como citados acima, recomendamos que o leitor procure materiais
sobre os pacotes e as funções citadas.
ggplot()+
geom_sf(data=Brasil)+
tema
De forma bem simples, utilizando a função geom_sf()
, é
possível carregar os shapefiles no ggplot. Assim como em outros ggplots,
cor de contorno e preenchimento podem ser definidos.
ggplot()+
geom_sf(data=Brasil,color="black",fill="yellow",alpha=0.5,linewidth=1)+
tema
Além do básico já apresentado nesse guia, é posível definir a
expessura da linha pelo comando linewidth=
.
ggplot()+
geom_sf(data=Estados,aes(fill=name_region),color="black",linewidth=0.75)+
scale_fill_manual(values = c("orangered",
"yellow",
"green",
"royalblue1",
"purple4"
))+
labs(fill="região")+
tema
Alguns arquivos .shp
possuem variáveis, semelhante aos
arquivos dataframe e tibble. Assim como foi feito em outros ggplots, é
possível fazer diferenças baseadas nestas variáveis. Nesse caso, foi
divido pela variável da região correspondente ao estado.
ggplot()+
geom_sf(data=Estados,aes(fill=name_region),color="black",linewidth=0.75)+
geom_sf_text(data=Estados,
aes(label=abbrev_state),
color="black",
size=3)+
scale_fill_manual(values = c("orangered",
"yellow",
"green",
"royalblue1",
"purple4"
))+
labs(fill="região")+
tema
## Warning in st_point_on_surface.sfc(sf::st_zm(x)): st_point_on_surface may not
## give correct results for longitude/latitude data
Quando se está trabalhando com dados vetoriasis, ao invés de se usar
geom_label()
ou geom_text()
, deve-se usar
geom_sf_label()
ou geom_sf_text()
, mas
seguindo a mesma lógica de funcionamento que as outras funções de rótulo
e texto.
ggplot()+
geom_sf(data=Brasil,color="black",aes(fill="Brasil"))+
geom_sf(data=subset(Estados,name_region=="Nordeste"),aes(fill="Nordeste"),color="black")+
geom_sf(data=subset(Estados,name_state=="Pernambuco"),aes(fill="Pernambuco"),color="black")+
scale_fill_manual(values = c("darkgreen",
"gray",
"yellow"))+
labs(fill=NULL)+
tema
Na construção de mapas, cada arquivo vetorial funciona como uma
camada, então é possível fazer camadas sobreporem camadas. Nesse caso,
era desejado usar mais duas camadas: uma contendo apenas os estados do
Nordeste e outra apenas o estado de Pernambuco. Para extrair estas
informações, usou-se a função subset()
para as camandas,
selecionando apenas o que era desejado. Alternativamente, pode-se
utilizar comandos de filtragem prévios com a função
filter()
. Contudo, não são vetores vindo de uma mesma
fonte, então para divir as cores dos vetores, na função
aes()
, em fill=
, ao invés de escolher uma cor,
apenas deu-se o nome do preenchimento da camada, e na função
scale_fill_manual()
, foram escolhidas as cores.
ggplot()+
geom_sf(data=Brasil,color="black",aes(fill="Brasil"))+
geom_sf(data=subset(Estados,name_region=="Nordeste"),aes(fill="Nordeste"),color="black")+
geom_sf(data=subset(Estados,name_state=="Pernambuco"),aes(fill="Pernambuco"),color="black")+
geom_sf(data=Recife,aes(fill="Recife"),color="black")+
scale_fill_manual(values = c("darkgreen",
"gray",
"yellow",
"orangered"))+
labs(fill=NULL)+
tema
Nessa situação, foi adicionada uma nova camada, correspondente à
cidade de Recife. Contudo, a escala não permite vizualizar Recife de
forma adquada. Para alterar a escala dos mapas feitos em ggplot, é usada
a função coord_sf()
.
ggplot()+
geom_sf(data=Brasil,color="black",aes(fill="Brasil"))+
geom_sf(data=subset(Estados,name_region=="Nordeste"),aes(fill="Nordeste"),color="black")+
geom_sf(data=subset(Estados,name_state=="Pernambuco"),aes(fill="Pernambuco"),color="black")+
geom_sf(data=Recife,aes(fill="Recife"),color="black")+
coord_sf(xlim=c(-41.15,-34.5),ylim=c(-9.5,-7.25))+
scale_fill_manual(values = c("darkgreen",
"gray",
"yellow",
"orangered"))+
labs(fill=NULL)+
tema
Na função coord_sf()
, é informado o intervalo da
longitude, pelo comando xlim=c()
, e o intervalo da
latitude, pelo comando ylim=c()
. Importante destacar que o
comando funciona em coordenadas decimais, que não são as que aparecem
nos eixos X e Y. Por isso, é importante conhecer os limites das
coordenadas no formato decimal. Nesse caso, como não aparece mais a
camada do Brasil, pode-se remover ela sem problemas.
ggplot()+
geom_sf(data=subset(Estados,name_region=="Nordeste"),aes(fill="Nordeste"),color="black")+
geom_sf(data=subset(Estados,name_state=="Pernambuco"),aes(fill="Pernambuco"),color="black")+
geom_sf(data=Recife,aes(fill="Recife"),color="black")+
coord_sf(xlim=c(-41.15,-34.5),ylim=c(-9.5,-7.25))+
scale_fill_manual(values = c("gray",
"yellow",
"orangered"))+
labs(fill=NULL)+
tema
ggplot()+
geom_sf(data=Brasil,color="black",aes(fill="Brasil"))+
geom_sf(data=subset(Estados,name_region=="Nordeste"),aes(fill="Nordeste"),color="black")+
geom_sf(data=subset(Estados,name_state=="Pernambuco"),aes(fill="Pernambuco"),color="black")+
scale_fill_manual(values = c("darkgreen",
"gray",
"yellow"))+
coord_sf(xlim=c(-73,-35.5),ylim=c(-33,4))+
annotation_scale(location="br",height = unit(0.3,"cm"),bar_cols=c("black","yellow"))+
annotation_north_arrow(style = north_arrow_nautical(fill=c("black","yellow")), location="tr",height = unit(1.85,"cm"),width = unit(1.85,"cm"))+
labs(fill=NULL)+
tema
Usando a função annotation_scale()
, é possível adicionar
uma barra de escala, onde o comando location=
comando onde
onde a barra aparecerá no mapa, onde:
"br"
: abaixo e à direita;
"bl"
: abaixo e à esquerda;
"tr"
: acima e à direita;
"tl"
: acima e à esquerda.
Além deste comando, há o comando bar_cols=c()
, onde é
possível selecionar a cor das barras. O padrão é preto e branco
(bar_cols=c("black","white")
), que é o que aparecerá se
este comando não for informado. O comando height=unit()
comanda a altura da barra.
Além desta função, foi usada a função
annotation_north_arrow()
, que cria uma rosa dos ventos no
mapa. O comando location=
funciona exatamente como
annotation_scale()
. O comando style=
comanda o
estilo da seta, sendo estes:
north_arrow_orienteering
;
north_arrow_fancy_orienteering
;
north_arrow_minimal
;
north_arrow_nautical
.
No estilo de seta escolhida, o comando fill=c()
comanda
as cores da rosa dos ventos. Por fim, o comando heigth=
comanda a altura e width=
o comprimento.
Tanto annotation_scale()
quanto
annotation_north_arrow()
são do pacote
ggspatial
.
Há formas automáticas de criar mapas raster no R, como com a função
plot()
. Contudo, o ggplot, a história é um pouco mais
compexa. Acontece que, atualmente (23 de Novembro de 2022), não existem
funções que leiam rasters no ggplot. Então, para serem trabalhados no
ggplot, os rasters antes precisam ser convertidos em data framses.
topo_catimbau<-topo_catimbau %>%
mask(Catimbau) %>%
crop(Catimbau)
topo_catimbau_df<-topo_catimbau %>%
as.data.frame(xy=TRUE) %>%
na.omit()
colnames(topo_catimbau_df)[3]<-"altitude"
topo_catimbau_df
## x y altitude
## 999 -37.28125 -8.387639 542.826
## 2350 -37.28236 -8.387917 542.567
## 2351 -37.28208 -8.387917 542.216
## 2352 -37.28180 -8.387917 541.961
## 2353 -37.28152 -8.387917 542.200
## 2354 -37.28125 -8.387917 542.493
## 2355 -37.28097 -8.387917 542.824
## 2356 -37.28069 -8.387917 543.398
## 2357 -37.28041 -8.387917 543.971
## 3702 -37.28319 -8.388194 543.814
## 3703 -37.28291 -8.388194 543.328
## 3704 -37.28263 -8.388194 542.914
## 3705 -37.28236 -8.388194 542.407
## 3706 -37.28208 -8.388194 542.096
## 3707 -37.28180 -8.388194 542.022
## 3708 -37.28152 -8.388194 542.155
## 3709 -37.28125 -8.388194 542.458
## 3710 -37.28097 -8.388194 542.805
## 3711 -37.28069 -8.388194 543.244
## 3712 -37.28041 -8.388194 543.829
## 3713 -37.28013 -8.388194 544.410
## 3714 -37.27986 -8.388194 544.949
## 3715 -37.27958 -8.388194 545.687
## 5054 -37.28402 -8.388472 544.949
## 5055 -37.28375 -8.388472 544.071
## 5056 -37.28347 -8.388472 543.472
## 5057 -37.28319 -8.388472 543.174
## 5058 -37.28291 -8.388472 543.084
## 5059 -37.28263 -8.388472 542.893
## 5060 -37.28236 -8.388472 542.527
## 5061 -37.28208 -8.388472 542.325
## 5062 -37.28180 -8.388472 542.315
## 5063 -37.28152 -8.388472 542.380
## 5064 -37.28125 -8.388472 542.608
## 5065 -37.28097 -8.388472 542.911
## 5066 -37.28069 -8.388472 543.378
## 5067 -37.28041 -8.388472 543.918
## 5068 -37.28013 -8.388472 544.420
## 5069 -37.27986 -8.388472 544.813
## 5070 -37.27958 -8.388472 545.230
## 5071 -37.27930 -8.388472 545.798
## 5072 -37.27902 -8.388472 546.632
## 6406 -37.28486 -8.388750 546.309
## 6407 -37.28458 -8.388750 545.341
## 6408 -37.28430 -8.388750 544.418
## 6409 -37.28402 -8.388750 543.487
## 6410 -37.28375 -8.388750 542.829
## 6411 -37.28347 -8.388750 542.405
## 6412 -37.28319 -8.388750 542.586
## 6413 -37.28291 -8.388750 542.841
## 6414 -37.28263 -8.388750 543.018
## 6415 -37.28236 -8.388750 542.940
## 6416 -37.28208 -8.388750 542.789
## 6417 -37.28180 -8.388750 542.630
## 6418 -37.28152 -8.388750 542.782
## 6419 -37.28125 -8.388750 543.015
## 6420 -37.28097 -8.388750 543.366
## 6421 -37.28069 -8.388750 543.856
## 6422 -37.28041 -8.388750 544.360
## 6423 -37.28013 -8.388750 544.808
## 6424 -37.27986 -8.388750 545.099
## 6425 -37.27958 -8.388750 545.383
## 6426 -37.27930 -8.388750 545.669
## 6427 -37.27902 -8.388750 546.214
## 6428 -37.27875 -8.388750 546.832
## 6429 -37.27847 -8.388750 547.559
## 7757 -37.28597 -8.389028 546.036
## 7758 -37.28569 -8.389028 545.895
## 7759 -37.28541 -8.389028 545.672
## 7760 -37.28513 -8.389028 545.402
## 7761 -37.28486 -8.389028 544.788
## 7762 -37.28458 -8.389028 544.069
## 7763 -37.28430 -8.389028 543.184
## 7764 -37.28402 -8.389028 542.450
## 7765 -37.28375 -8.389028 542.034
## 7766 -37.28347 -8.389028 541.927
## 7767 -37.28319 -8.389028 542.500
## 7768 -37.28291 -8.389028 543.079
## 7769 -37.28263 -8.389028 543.616
## 7770 -37.28236 -8.389028 543.760
## 7771 -37.28208 -8.389028 543.556
## 7772 -37.28180 -8.389028 543.341
## 7773 -37.28152 -8.389028 543.403
## 7774 -37.28125 -8.389028 543.649
## 7775 -37.28097 -8.389028 543.979
## 7776 -37.28069 -8.389028 544.489
## 7777 -37.28041 -8.389028 545.004
## 7778 -37.28013 -8.389028 545.454
## 7779 -37.27986 -8.389028 545.702
## 7780 -37.27958 -8.389028 545.850
## 7781 -37.27930 -8.389028 546.026
## 7782 -37.27902 -8.389028 546.234
## 7783 -37.27875 -8.389028 546.496
## 7784 -37.27847 -8.389028 546.918
## 9109 -37.28680 -8.389306 545.273
## 9110 -37.28652 -8.389306 544.971
## 9111 -37.28625 -8.389306 544.645
## 9112 -37.28597 -8.389306 544.356
## 9113 -37.28569 -8.389306 544.346
## 9114 -37.28541 -8.389306 544.410
## 9115 -37.28513 -8.389306 544.422
## 9116 -37.28486 -8.389306 543.944
## 9117 -37.28458 -8.389306 543.461
## 9118 -37.28430 -8.389306 542.817
## 9119 -37.28402 -8.389306 542.435
## 9120 -37.28375 -8.389306 542.389
## 9121 -37.28347 -8.389306 542.509
## 9122 -37.28319 -8.389306 543.438
## 9123 -37.28291 -8.389306 544.374
## 9124 -37.28263 -8.389306 545.130
## 9125 -37.28236 -8.389306 545.181
## 9126 -37.28208 -8.389306 544.814
## 9127 -37.28180 -8.389306 544.472
## 9128 -37.28152 -8.389306 544.259
## 9129 -37.28125 -8.389306 544.137
## 9130 -37.28097 -8.389306 544.370
## 9131 -37.28069 -8.389306 545.080
## 9132 -37.28041 -8.389306 545.866
## 9133 -37.28013 -8.389306 546.435
## 9134 -37.27986 -8.389306 546.582
## 9135 -37.27958 -8.389306 546.623
## 9136 -37.27930 -8.389306 546.554
## 9137 -37.27902 -8.389306 546.636
## 9138 -37.27875 -8.389306 546.628
## 9139 -37.27847 -8.389306 546.811
## 9140 -37.27819 -8.389306 547.045
## 10461 -37.28763 -8.389583 542.359
## 10462 -37.28736 -8.389583 542.795
## 10463 -37.28708 -8.389583 543.559
## 10464 -37.28680 -8.389583 544.098
## 10465 -37.28652 -8.389583 543.930
## 10466 -37.28625 -8.389583 543.583
## 10467 -37.28597 -8.389583 543.269
## 10468 -37.28569 -8.389583 543.471
## 10469 -37.28541 -8.389583 543.737
## 10470 -37.28513 -8.389583 543.909
## 10471 -37.28486 -8.389583 543.778
## 10472 -37.28458 -8.389583 543.576
## 10473 -37.28430 -8.389583 543.400
## 10474 -37.28402 -8.389583 543.389
## 10475 -37.28375 -8.389583 543.631
## 10476 -37.28347 -8.389583 544.190
## 10477 -37.28319 -8.389583 545.281
## 10478 -37.28291 -8.389583 546.349
## 10479 -37.28263 -8.389583 547.042
## 10480 -37.28236 -8.389583 546.917
## 10481 -37.28208 -8.389583 546.404
## 10482 -37.28180 -8.389583 545.750
## 10483 -37.28152 -8.389583 545.184
## 10484 -37.28125 -8.389583 544.850
## 10485 -37.28097 -8.389583 544.894
## 10486 -37.28069 -8.389583 545.607
## 10487 -37.28041 -8.389583 546.498
## 10488 -37.28013 -8.389583 547.260
## 10489 -37.27986 -8.389583 547.546
## 10490 -37.27958 -8.389583 547.586
## 10491 -37.27930 -8.389583 547.451
## 10492 -37.27902 -8.389583 547.272
## 10493 -37.27875 -8.389583 547.045
## 10494 -37.27847 -8.389583 546.839
## 10495 -37.27819 -8.389583 546.710
## 11813 -37.28847 -8.389861 543.844
## 11814 -37.28819 -8.389861 542.588
## 11815 -37.28791 -8.389861 542.047
## 11816 -37.28763 -8.389861 541.224
## 11817 -37.28736 -8.389861 541.846
## 11818 -37.28708 -8.389861 542.657
## 11819 -37.28680 -8.389861 543.344
## 11820 -37.28652 -8.389861 543.329
## 11821 -37.28625 -8.389861 543.048
## 11822 -37.28597 -8.389861 542.763
## 11823 -37.28569 -8.389861 543.208
## 11824 -37.28541 -8.389861 543.577
## 11825 -37.28513 -8.389861 543.864
## 11826 -37.28486 -8.389861 544.061
## 11827 -37.28458 -8.389861 544.176
## 11828 -37.28430 -8.389861 544.366
## 11829 -37.28402 -8.389861 544.693
## 11830 -37.28375 -8.389861 545.157
## 11831 -37.28347 -8.389861 546.102
## 11832 -37.28319 -8.389861 547.268
## 11833 -37.28291 -8.389861 548.324
## 11834 -37.28263 -8.389861 548.958
## 11835 -37.28236 -8.389861 548.597
## 11836 -37.28208 -8.389861 548.023
## 11837 -37.28180 -8.389861 546.973
## 11838 -37.28152 -8.389861 546.155
## 11839 -37.28125 -8.389861 545.630
## 11840 -37.28097 -8.389861 545.485
## 11841 -37.28069 -8.389861 546.170
## 11842 -37.28041 -8.389861 547.010
## 11843 -37.28013 -8.389861 548.006
## 11844 -37.27986 -8.389861 548.373
## 11845 -37.27958 -8.389861 548.539
## 11846 -37.27930 -8.389861 548.309
## 11847 -37.27902 -8.389861 547.940
## 11848 -37.27875 -8.389861 547.445
## 11849 -37.27847 -8.389861 546.981
## 11850 -37.27819 -8.389861 546.543
## 11851 -37.27791 -8.389861 546.296
## 13165 -37.28930 -8.390139 544.292
## 13166 -37.28902 -8.390139 543.702
## 13167 -37.28875 -8.390139 542.701
## 13168 -37.28847 -8.390139 542.019
## 13169 -37.28819 -8.390139 541.671
## 13170 -37.28791 -8.390139 541.457
## 13171 -37.28763 -8.390139 541.686
## 13172 -37.28736 -8.390139 541.942
## 13173 -37.28708 -8.390139 542.323
## 13174 -37.28680 -8.390139 542.869
## 13175 -37.28652 -8.390139 543.198
## 13176 -37.28625 -8.390139 543.345
## 13177 -37.28597 -8.390139 543.242
## 13178 -37.28569 -8.390139 543.432
## 13179 -37.28541 -8.390139 543.679
## 13180 -37.28513 -8.390139 543.997
## 13181 -37.28486 -8.390139 544.506
## 13182 -37.28458 -8.390139 544.894
## 13183 -37.28430 -8.390139 545.421
## 13184 -37.28402 -8.390139 545.806
## 13185 -37.28375 -8.390139 546.428
## 13186 -37.28347 -8.390139 547.405
## 13187 -37.28319 -8.390139 548.559
## 13188 -37.28291 -8.390139 549.587
## 13189 -37.28263 -8.390139 550.069
## 13190 -37.28236 -8.390139 549.812
## 13191 -37.28208 -8.390139 549.223
## 13192 -37.28180 -8.390139 548.149
## 13193 -37.28152 -8.390139 547.174
## 13194 -37.28125 -8.390139 546.470
## 13195 -37.28097 -8.390139 546.250
## 13196 -37.28069 -8.390139 546.697
## 13197 -37.28041 -8.390139 547.285
## 13198 -37.28013 -8.390139 548.223
## 13199 -37.27986 -8.390139 548.743
## 13200 -37.27958 -8.390139 548.990
## 13201 -37.27930 -8.390139 548.863
## 13202 -37.27902 -8.390139 548.433
## 13203 -37.27875 -8.390139 547.827
## 13204 -37.27847 -8.390139 547.157
## 13205 -37.27819 -8.390139 546.645
## 13206 -37.27791 -8.390139 546.228
## 13309 -37.24930 -8.390139 556.604
## 14516 -37.29041 -8.390417 542.351
## 14517 -37.29013 -8.390417 542.978
## 14518 -37.28986 -8.390417 543.113
## 14519 -37.28958 -8.390417 543.418
## 14520 -37.28930 -8.390417 543.503
## 14521 -37.28902 -8.390417 542.890
## 14522 -37.28875 -8.390417 542.160
## 14523 -37.28847 -8.390417 541.656
## 14524 -37.28819 -8.390417 541.547
## 14525 -37.28791 -8.390417 541.843
## 14526 -37.28763 -8.390417 542.341
## 14527 -37.28736 -8.390417 542.820
## 14528 -37.28708 -8.390417 543.293
## 14529 -37.28680 -8.390417 543.487
## 14530 -37.28652 -8.390417 543.743
## 14531 -37.28625 -8.390417 543.763
## 14532 -37.28597 -8.390417 543.727
## 14533 -37.28569 -8.390417 543.995
## 14534 -37.28541 -8.390417 544.287
## 14535 -37.28513 -8.390417 544.656
## 14536 -37.28486 -8.390417 545.084
## 14537 -37.28458 -8.390417 545.534
## 14538 -37.28430 -8.390417 545.931
## 14539 -37.28402 -8.390417 546.417
## 14540 -37.28375 -8.390417 546.978
## 14541 -37.28347 -8.390417 547.779
## 14542 -37.28319 -8.390417 548.843
## 14543 -37.28291 -8.390417 549.854
## 14544 -37.28263 -8.390417 550.465
## 14545 -37.28236 -8.390417 550.371
## 14546 -37.28208 -8.390417 549.852
## 14547 -37.28180 -8.390417 549.094
## 14548 -37.28152 -8.390417 548.170
## 14549 -37.28125 -8.390417 547.424
## 14550 -37.28097 -8.390417 546.891
## 14551 -37.28069 -8.390417 547.131
## 14552 -37.28041 -8.390417 547.559
## 14553 -37.28013 -8.390417 548.140
## 14554 -37.27986 -8.390417 548.703
## 14555 -37.27958 -8.390417 549.075
## 14556 -37.27930 -8.390417 549.252
## 14557 -37.27902 -8.390417 548.603
## 14558 -37.27875 -8.390417 547.927
## 14559 -37.27847 -8.390417 547.196
## 14560 -37.27819 -8.390417 546.764
## 14561 -37.27791 -8.390417 546.328
## 14562 -37.27763 -8.390417 545.804
## 14656 -37.25152 -8.390417 561.030
## 14657 -37.25125 -8.390417 560.926
## 14658 -37.25097 -8.390417 560.030
## 14659 -37.25069 -8.390417 558.369
## 14660 -37.25041 -8.390417 556.468
## 14661 -37.25013 -8.390417 555.017
## 14662 -37.24986 -8.390417 554.588
## 14663 -37.24958 -8.390417 554.589
## 14664 -37.24930 -8.390417 554.742
## 14665 -37.24902 -8.390417 554.380
## 15868 -37.29125 -8.390694 541.248
## 15869 -37.29097 -8.390694 540.550
## 15870 -37.29069 -8.390694 540.322
## 15871 -37.29041 -8.390694 540.453
## 15872 -37.29013 -8.390694 541.169
## 15873 -37.28986 -8.390694 542.011
## 15874 -37.28958 -8.390694 542.467
## 15875 -37.28930 -8.390694 542.907
## 15876 -37.28902 -8.390694 542.329
## 15877 -37.28875 -8.390694 541.875
## 15878 -37.28847 -8.390694 541.504
## 15879 -37.28819 -8.390694 541.814
## 15880 -37.28791 -8.390694 542.280
## 15881 -37.28763 -8.390694 543.225
## 15882 -37.28736 -8.390694 543.936
## 15883 -37.28708 -8.390694 544.570
## 15884 -37.28680 -8.390694 544.668
## 15885 -37.28652 -8.390694 544.560
## 15886 -37.28625 -8.390694 544.455
## 15887 -37.28597 -8.390694 544.550
## 15888 -37.28569 -8.390694 544.766
## 15889 -37.28541 -8.390694 545.173
## 15890 -37.28513 -8.390694 545.538
## 15891 -37.28486 -8.390694 545.891
## 15892 -37.28458 -8.390694 546.267
## 15893 -37.28430 -8.390694 546.663
## 15894 -37.28402 -8.390694 546.945
## 15895 -37.28375 -8.390694 547.394
## 15896 -37.28347 -8.390694 547.797
## 15897 -37.28319 -8.390694 548.781
## 15898 -37.28291 -8.390694 549.704
## 15899 -37.28263 -8.390694 550.415
## 15900 -37.28236 -8.390694 550.489
## 15901 -37.28208 -8.390694 550.060
## 15902 -37.28180 -8.390694 549.598
## 15903 -37.28152 -8.390694 548.924
## 15904 -37.28125 -8.390694 548.227
## 15905 -37.28097 -8.390694 547.593
## 15906 -37.28069 -8.390694 547.513
## 15907 -37.28041 -8.390694 547.783
## 15908 -37.28013 -8.390694 548.115
## 15909 -37.27986 -8.390694 548.563
## 15910 -37.27958 -8.390694 548.955
## 15911 -37.27930 -8.390694 548.992
## 15912 -37.27902 -8.390694 548.560
## 15913 -37.27875 -8.390694 547.756
## 15914 -37.27847 -8.390694 547.092
## 15915 -37.27819 -8.390694 546.749
## 15916 -37.27791 -8.390694 546.408
## 15917 -37.27763 -8.390694 545.697
## 16002 -37.25402 -8.390694 554.770
## 16003 -37.25375 -8.390694 554.279
## 16004 -37.25347 -8.390694 554.259
## 16005 -37.25319 -8.390694 554.912
## 16006 -37.25291 -8.390694 555.612
## 16007 -37.25263 -8.390694 556.686
## 16008 -37.25236 -8.390694 557.961
## 16009 -37.25208 -8.390694 558.865
## 16010 -37.25180 -8.390694 559.578
## 16011 -37.25152 -8.390694 559.901
## 16012 -37.25125 -8.390694 559.833
## 16013 -37.25097 -8.390694 559.074
## 16014 -37.25069 -8.390694 557.202
## 16015 -37.25041 -8.390694 555.318
## 16016 -37.25013 -8.390694 553.798
## 16017 -37.24986 -8.390694 553.324
## 16018 -37.24958 -8.390694 553.466
## 16019 -37.24930 -8.390694 553.561
## 16020 -37.24902 -8.390694 553.310
## 16021 -37.24875 -8.390694 553.273
## 17221 -37.29180 -8.390972 541.600
## 17222 -37.29152 -8.390972 541.264
## 17223 -37.29125 -8.390972 540.961
## 17224 -37.29097 -8.390972 540.094
## 17225 -37.29069 -8.390972 539.710
## 17226 -37.29041 -8.390972 539.477
## 17227 -37.29013 -8.390972 540.031
## 17228 -37.28986 -8.390972 541.087
## 17229 -37.28958 -8.390972 541.970
## 17230 -37.28930 -8.390972 542.541
## 17231 -37.28902 -8.390972 542.132
## 17232 -37.28875 -8.390972 541.916
## 17233 -37.28847 -8.390972 541.825
## 17234 -37.28819 -8.390972 542.168
## 17235 -37.28791 -8.390972 542.683
## 17236 -37.28763 -8.390972 543.608
## 17237 -37.28736 -8.390972 544.680
## 17238 -37.28708 -8.390972 545.578
## 17239 -37.28680 -8.390972 545.883
## 17240 -37.28652 -8.390972 545.439
## 17241 -37.28625 -8.390972 544.962
## 17242 -37.28597 -8.390972 544.903
## 17243 -37.28569 -8.390972 545.490
## 17244 -37.28541 -8.390972 546.329
## 17245 -37.28513 -8.390972 546.895
## 17246 -37.28486 -8.390972 547.067
## 17247 -37.28458 -8.390972 547.310
## 17248 -37.28430 -8.390972 547.443
## 17249 -37.28402 -8.390972 547.664
## 17250 -37.28375 -8.390972 547.912
## 17251 -37.28347 -8.390972 548.173
## 17252 -37.28319 -8.390972 548.874
## 17253 -37.28291 -8.390972 549.456
## 17254 -37.28263 -8.390972 549.973
## 17255 -37.28236 -8.390972 550.210
## 17256 -37.28208 -8.390972 550.051
## 17257 -37.28180 -8.390972 549.742
## 17258 -37.28152 -8.390972 549.211
## 17259 -37.28125 -8.390972 548.726
## 17260 -37.28097 -8.390972 548.141
## 17261 -37.28069 -8.390972 547.923
## 17262 -37.28041 -8.390972 547.975
## 17263 -37.28013 -8.390972 548.085
## 17264 -37.27986 -8.390972 548.623
## 17265 -37.27958 -8.390972 548.878
## 17266 -37.27930 -8.390972 549.223
## 17267 -37.27902 -8.390972 548.390
## 17268 -37.27875 -8.390972 547.186
## 17269 -37.27847 -8.390972 546.346
## 17270 -37.27819 -8.390972 546.287
## 17271 -37.27791 -8.390972 546.417
## 17272 -37.27763 -8.390972 545.982
## 17273 -37.27736 -8.390972 545.001
## 17353 -37.25513 -8.390972 556.605
## 17354 -37.25486 -8.390972 555.318
## 17355 -37.25458 -8.390972 554.536
## 17356 -37.25430 -8.390972 553.725
## 17357 -37.25402 -8.390972 553.469
## 17358 -37.25375 -8.390972 553.801
## 17359 -37.25347 -8.390972 554.367
## 17360 -37.25319 -8.390972 554.775
## 17361 -37.25291 -8.390972 555.017
## 17362 -37.25263 -8.390972 555.849
## 17363 -37.25236 -8.390972 556.867
## 17364 -37.25208 -8.390972 557.415
## 17365 -37.25180 -8.390972 557.959
## 17366 -37.25152 -8.390972 558.226
## 17367 -37.25125 -8.390972 558.155
## 17368 -37.25097 -8.390972 557.525
## 17369 -37.25069 -8.390972 556.021
## 17370 -37.25041 -8.390972 554.670
## 17371 -37.25013 -8.390972 553.467
## 17372 -37.24986 -8.390972 553.201
## 17373 -37.24958 -8.390972 553.581
## 17374 -37.24930 -8.390972 553.795
## 17375 -37.24902 -8.390972 553.905
## 17376 -37.24875 -8.390972 553.970
## 17377 -37.24847 -8.390972 554.486
## 17378 -37.24819 -8.390972 554.684
## 18575 -37.29208 -8.391250 541.315
## 18576 -37.29180 -8.391250 541.373
## 18577 -37.29152 -8.391250 541.478
## 18578 -37.29125 -8.391250 541.275
## 18579 -37.29097 -8.391250 540.805
## 18580 -37.29069 -8.391250 540.362
## 18581 -37.29041 -8.391250 539.956
## 18582 -37.29013 -8.391250 539.971
## 18583 -37.28986 -8.391250 540.709
## 18584 -37.28958 -8.391250 541.600
## 18585 -37.28930 -8.391250 542.166
## 18586 -37.28902 -8.391250 542.320
## 18587 -37.28875 -8.391250 542.100
## 18588 -37.28847 -8.391250 542.075
## 18589 -37.28819 -8.391250 542.341
## 18590 -37.28791 -8.391250 543.003
## 18591 -37.28763 -8.391250 543.869
## 18592 -37.28736 -8.391250 544.945
## 18593 -37.28708 -8.391250 545.843
## 18594 -37.28680 -8.391250 546.262
## 18595 -37.28652 -8.391250 545.988
## 18596 -37.28625 -8.391250 545.609
## 18597 -37.28597 -8.391250 545.423
## 18598 -37.28569 -8.391250 546.275
## 18599 -37.28541 -8.391250 547.266
## 18600 -37.28513 -8.391250 548.110
## 18601 -37.28486 -8.391250 548.452
## 18602 -37.28458 -8.391250 548.564
## 18603 -37.28430 -8.391250 548.664
## 18604 -37.28402 -8.391250 548.611
## 18605 -37.28375 -8.391250 548.700
## 18606 -37.28347 -8.391250 548.949
## 18607 -37.28319 -8.391250 549.237
## 18608 -37.28291 -8.391250 549.577
## 18609 -37.28263 -8.391250 549.819
## 18610 -37.28236 -8.391250 549.857
## 18611 -37.28208 -8.391250 549.729
## 18612 -37.28180 -8.391250 549.460
## 18613 -37.28152 -8.391250 549.132
## 18614 -37.28125 -8.391250 548.795
## 18615 -37.28097 -8.391250 548.344
## 18616 -37.28069 -8.391250 548.321
## 18617 -37.28041 -8.391250 548.312
## 18618 -37.28013 -8.391250 548.517
## 18619 -37.27986 -8.391250 549.028
## 18620 -37.27958 -8.391250 549.371
## 18621 -37.27930 -8.391250 549.367
## 18622 -37.27902 -8.391250 548.036
## 18623 -37.27875 -8.391250 546.723
## 18624 -37.27847 -8.391250 545.529
## 18625 -37.27819 -8.391250 545.670
## 18626 -37.27791 -8.391250 545.894
## 18627 -37.27763 -8.391250 545.904
## 18628 -37.27736 -8.391250 545.259
## 18707 -37.25541 -8.391250 556.434
## 18708 -37.25513 -8.391250 554.935
## 18709 -37.25486 -8.391250 553.939
## 18710 -37.25458 -8.391250 553.417
## 18711 -37.25430 -8.391250 553.398
## 18712 -37.25402 -8.391250 553.909
## 18713 -37.25375 -8.391250 554.686
## 18714 -37.25347 -8.391250 555.764
## 18715 -37.25319 -8.391250 555.428
## 18716 -37.25291 -8.391250 555.314
## 18717 -37.25263 -8.391250 555.556
## 18718 -37.25236 -8.391250 555.384
## 18719 -37.25208 -8.391250 555.584
## 18720 -37.25180 -8.391250 555.809
## 18721 -37.25152 -8.391250 556.084
## 18722 -37.25125 -8.391250 556.144
## 18723 -37.25097 -8.391250 555.619
## 18724 -37.25069 -8.391250 555.091
## 18725 -37.25041 -8.391250 554.322
## 18726 -37.25013 -8.391250 553.898
## 18727 -37.24986 -8.391250 554.293
## 18728 -37.24958 -8.391250 554.973
## 18729 -37.24930 -8.391250 555.641
## 18730 -37.24902 -8.391250 555.844
## 18731 -37.24875 -8.391250 555.878
## 18732 -37.24847 -8.391250 556.013
## 18733 -37.24819 -8.391250 555.362
## 18734 -37.24791 -8.391250 554.861
## 19929 -37.29236 -8.391528 540.763
## 19930 -37.29208 -8.391528 540.816
## 19931 -37.29180 -8.391528 541.425
## 19932 -37.29152 -8.391528 541.910
## 19933 -37.29125 -8.391528 542.002
## 19934 -37.29097 -8.391528 542.126
## 19935 -37.29069 -8.391528 541.668
## 19936 -37.29041 -8.391528 541.095
## 19937 -37.29013 -8.391528 540.425
## 19938 -37.28986 -8.391528 540.759
## 19939 -37.28958 -8.391528 541.423
## 19940 -37.28930 -8.391528 542.328
## 19941 -37.28902 -8.391528 542.592
## 19942 -37.28875 -8.391528 542.265
## 19943 -37.28847 -8.391528 542.151
## 19944 -37.28819 -8.391528 542.453
## 19945 -37.28791 -8.391528 543.144
## 19946 -37.28763 -8.391528 543.982
## 19947 -37.28736 -8.391528 544.913
## 19948 -37.28708 -8.391528 545.821
## 19949 -37.28680 -8.391528 546.451
## 19950 -37.28652 -8.391528 546.392
## 19951 -37.28625 -8.391528 546.172
## 19952 -37.28597 -8.391528 546.052
## 19953 -37.28569 -8.391528 547.072
## 19954 -37.28541 -8.391528 548.192
## 19955 -37.28513 -8.391528 549.318
## 19956 -37.28486 -8.391528 549.794
## 19957 -37.28458 -8.391528 549.755
## 19958 -37.28430 -8.391528 549.699
## 19959 -37.28402 -8.391528 549.558
## 19960 -37.28375 -8.391528 549.535
## 19961 -37.28347 -8.391528 549.649
## 19962 -37.28319 -8.391528 549.776
## 19963 -37.28291 -8.391528 549.905
## 19964 -37.28263 -8.391528 549.785
## 19965 -37.28236 -8.391528 549.605
## 19966 -37.28208 -8.391528 549.341
## 19967 -37.28180 -8.391528 549.217
## 19968 -37.28152 -8.391528 548.986
## 19969 -37.28125 -8.391528 548.855
## 19970 -37.28097 -8.391528 548.858
## 19971 -37.28069 -8.391528 548.728
## 19972 -37.28041 -8.391528 548.679
## 19973 -37.28013 -8.391528 548.986
## 19974 -37.27986 -8.391528 549.519
## 19975 -37.27958 -8.391528 550.009
## 19976 -37.27930 -8.391528 549.319
## 19977 -37.27902 -8.391528 547.891
## 19978 -37.27875 -8.391528 546.417
## 19979 -37.27847 -8.391528 545.258
## 19980 -37.27819 -8.391528 545.245
## 19981 -37.27791 -8.391528 545.443
## 19982 -37.27763 -8.391528 545.961
## 19983 -37.27736 -8.391528 545.549
## 19984 -37.27708 -8.391528 545.121
## 20061 -37.25569 -8.391528 556.546
## 20062 -37.25541 -8.391528 554.967
## 20063 -37.25513 -8.391528 553.601
## 20064 -37.25486 -8.391528 553.024
## 20065 -37.25458 -8.391528 552.849
## 20066 -37.25430 -8.391528 553.478
## 20067 -37.25402 -8.391528 554.856
## 20068 -37.25375 -8.391528 555.885
## 20069 -37.25347 -8.391528 556.634
## 20070 -37.25319 -8.391528 556.263
## 20071 -37.25291 -8.391528 555.849
## 20072 -37.25263 -8.391528 554.819
## 20073 -37.25236 -8.391528 554.129
## 20074 -37.25208 -8.391528 553.971
## 20075 -37.25180 -8.391528 554.046
## 20076 -37.25152 -8.391528 554.294
## 20077 -37.25125 -8.391528 554.602
## 20078 -37.25097 -8.391528 554.759
## 20079 -37.25069 -8.391528 554.748
## 20080 -37.25041 -8.391528 554.556
## 20081 -37.25013 -8.391528 554.943
## 20082 -37.24986 -8.391528 555.970
## 20083 -37.24958 -8.391528 556.923
## 20084 -37.24930 -8.391528 557.821
## 20085 -37.24902 -8.391528 558.211
## 20086 -37.24875 -8.391528 558.056
## 20087 -37.24847 -8.391528 557.297
## 20088 -37.24819 -8.391528 556.385
## 20089 -37.24791 -8.391528 555.588
## 20090 -37.24763 -8.391528 554.684
## 21284 -37.29236 -8.391806 540.799
## 21285 -37.29208 -8.391806 540.741
## 21286 -37.29180 -8.391806 540.944
## 21287 -37.29152 -8.391806 542.377
## 21288 -37.29125 -8.391806 543.358
## 21289 -37.29097 -8.391806 544.045
## 21290 -37.29069 -8.391806 543.256
## 21291 -37.29041 -8.391806 542.198
## 21292 -37.29013 -8.391806 541.195
## 21293 -37.28986 -8.391806 541.305
## 21294 -37.28958 -8.391806 541.549
## 21295 -37.28930 -8.391806 541.933
## 21296 -37.28902 -8.391806 542.429
## 21297 -37.28875 -8.391806 542.686
## 21298 -37.28847 -8.391806 542.818
## 21299 -37.28819 -8.391806 542.600
## 21300 -37.28791 -8.391806 542.753
## 21301 -37.28763 -8.391806 543.151
## 21302 -37.28736 -8.391806 544.517
## 21303 -37.28708 -8.391806 545.874
## 21304 -37.28680 -8.391806 546.839
## 21305 -37.28652 -8.391806 546.817
## 21306 -37.28625 -8.391806 546.658
## 21307 -37.28597 -8.391806 546.589
## 21308 -37.28569 -8.391806 547.829
## 21309 -37.28541 -8.391806 549.302
## 21310 -37.28513 -8.391806 550.742
## 21311 -37.28486 -8.391806 550.836
## 21312 -37.28458 -8.391806 550.617
## 21313 -37.28430 -8.391806 550.210
## 21314 -37.28402 -8.391806 550.220
## 21315 -37.28375 -8.391806 550.441
## 21316 -37.28347 -8.391806 550.529
## 21317 -37.28319 -8.391806 550.504
## 21318 -37.28291 -8.391806 550.513
## 21319 -37.28263 -8.391806 550.277
## 21320 -37.28236 -8.391806 549.845
## 21321 -37.28208 -8.391806 549.352
## 21322 -37.28180 -8.391806 548.891
## 21323 -37.28152 -8.391806 549.041
## 21324 -37.28125 -8.391806 549.227
## 21325 -37.28097 -8.391806 549.474
## 21326 -37.28069 -8.391806 549.152
## 21327 -37.28041 -8.391806 548.892
## 21328 -37.28013 -8.391806 549.116
## 21329 -37.27986 -8.391806 549.773
## 21330 -37.27958 -8.391806 550.380
## 21331 -37.27930 -8.391806 549.748
## 21332 -37.27902 -8.391806 548.375
## 21333 -37.27875 -8.391806 546.953
## 21334 -37.27847 -8.391806 545.657
## 21335 -37.27819 -8.391806 545.271
## 21336 -37.27791 -8.391806 545.421
## 21337 -37.27763 -8.391806 545.955
## 21338 -37.27736 -8.391806 545.603
## 21339 -37.27708 -8.391806 545.343
## 21416 -37.25569 -8.391806 555.189
## 21417 -37.25541 -8.391806 553.710
## 21418 -37.25513 -8.391806 552.361
## 21419 -37.25486 -8.391806 552.358
## 21420 -37.25458 -8.391806 552.639
## 21421 -37.25430 -8.391806 553.962
## 21422 -37.25402 -8.391806 555.135
## 21423 -37.25375 -8.391806 556.013
## 21424 -37.25347 -8.391806 556.706
## 21425 -37.25319 -8.391806 556.627
## 21426 -37.25291 -8.391806 556.146
## 21427 -37.25263 -8.391806 555.071
## 21428 -37.25236 -8.391806 553.848
## 21429 -37.25208 -8.391806 553.068
## 21430 -37.25180 -8.391806 552.778
## 21431 -37.25152 -8.391806 553.645
## 21432 -37.25125 -8.391806 554.667
## 21433 -37.25097 -8.391806 555.342
## 21434 -37.25069 -8.391806 555.550
## 21435 -37.25041 -8.391806 555.638
## 21436 -37.25013 -8.391806 556.255
## 21437 -37.24986 -8.391806 557.626
## 21438 -37.24958 -8.391806 558.893
## 21439 -37.24930 -8.391806 560.134
## 21440 -37.24902 -8.391806 560.007
## 21441 -37.24875 -8.391806 559.440
## 21442 -37.24847 -8.391806 558.312
## 21443 -37.24819 -8.391806 557.523
## 21444 -37.24791 -8.391806 556.749
## 21445 -37.24763 -8.391806 555.632
## 21446 -37.24736 -8.391806 554.586
## 22638 -37.29263 -8.392083 541.227
## 22639 -37.29236 -8.392083 540.803
## 22640 -37.29208 -8.392083 540.692
## 22641 -37.29180 -8.392083 541.228
## 22642 -37.29152 -8.392083 542.707
## 22643 -37.29125 -8.392083 544.180
## 22644 -37.29097 -8.392083 545.136
## 22645 -37.29069 -8.392083 544.504
## 22646 -37.29041 -8.392083 543.407
## 22647 -37.29013 -8.392083 542.347
## 22648 -37.28986 -8.392083 541.955
## 22649 -37.28958 -8.392083 541.873
## 22650 -37.28930 -8.392083 542.048
## 22651 -37.28902 -8.392083 542.325
## 22652 -37.28875 -8.392083 542.636
## 22653 -37.28847 -8.392083 542.857
## 22654 -37.28819 -8.392083 542.609
## 22655 -37.28791 -8.392083 542.515
## 22656 -37.28763 -8.392083 542.908
## 22657 -37.28736 -8.392083 544.290
## 22658 -37.28708 -8.392083 545.805
## 22659 -37.28680 -8.392083 546.874
## 22660 -37.28652 -8.392083 547.035
## 22661 -37.28625 -8.392083 547.076
## 22662 -37.28597 -8.392083 547.383
## 22663 -37.28569 -8.392083 548.789
## 22664 -37.28541 -8.392083 550.287
## 22665 -37.28513 -8.392083 551.376
## 22666 -37.28486 -8.392083 551.356
## 22667 -37.28458 -8.392083 550.960
## 22668 -37.28430 -8.392083 550.608
## 22669 -37.28402 -8.392083 550.726
## 22670 -37.28375 -8.392083 550.981
## 22671 -37.28347 -8.392083 551.248
## 22672 -37.28319 -8.392083 551.340
## 22673 -37.28291 -8.392083 551.271
## 22674 -37.28263 -8.392083 550.968
## 22675 -37.28236 -8.392083 550.339
## 22676 -37.28208 -8.392083 549.700
## 22677 -37.28180 -8.392083 549.334
## 22678 -37.28152 -8.392083 549.476
## 22679 -37.28125 -8.392083 549.740
## 22680 -37.28097 -8.392083 549.935
## 22681 -37.28069 -8.392083 549.588
## 22682 -37.28041 -8.392083 549.276
## 22683 -37.28013 -8.392083 549.288
## 22684 -37.27986 -8.392083 549.973
## 22685 -37.27958 -8.392083 550.591
## 22686 -37.27930 -8.392083 550.549
## 22687 -37.27902 -8.392083 549.459
## 22688 -37.27875 -8.392083 548.051
## 22689 -37.27847 -8.392083 546.748
## 22690 -37.27819 -8.392083 546.309
## 22691 -37.27791 -8.392083 546.127
## 22692 -37.27763 -8.392083 546.019
## 22693 -37.27736 -8.392083 545.674
## 22694 -37.27708 -8.392083 545.457
## 22695 -37.27680 -8.392083 545.569
## 22710 -37.27263 -8.392083 548.000
## 22711 -37.27236 -8.392083 547.960
## 22712 -37.27208 -8.392083 547.884
## 22770 -37.25597 -8.392083 555.711
## 22771 -37.25569 -8.392083 554.148
## 22772 -37.25541 -8.392083 552.784
## 22773 -37.25513 -8.392083 551.964
## 22774 -37.25486 -8.392083 552.138
## 22775 -37.25458 -8.392083 552.847
## 22776 -37.25430 -8.392083 554.235
## 22777 -37.25402 -8.392083 554.823
## 22778 -37.25375 -8.392083 555.619
## 22779 -37.25347 -8.392083 556.096
## 22780 -37.25319 -8.392083 556.161
## 22781 -37.25291 -8.392083 555.857
## 22782 -37.25263 -8.392083 555.188
## 22783 -37.25236 -8.392083 554.214
## 22784 -37.25208 -8.392083 553.439
## 22785 -37.25180 -8.392083 553.367
## 22786 -37.25152 -8.392083 554.365
## 22787 -37.25125 -8.392083 555.655
## 22788 -37.25097 -8.392083 556.816
## 22789 -37.25069 -8.392083 557.148
## 22790 -37.25041 -8.392083 557.385
## 22791 -37.25013 -8.392083 557.896
## 22792 -37.24986 -8.392083 559.063
## 22793 -37.24958 -8.392083 560.239
## 22794 -37.24930 -8.392083 560.953
## 22795 -37.24902 -8.392083 560.737
## 22796 -37.24875 -8.392083 560.116
## 22797 -37.24847 -8.392083 559.279
## 22798 -37.24819 -8.392083 558.648
## 22799 -37.24791 -8.392083 557.941
## 22800 -37.24763 -8.392083 557.091
## 22801 -37.24736 -8.392083 556.071
## 22802 -37.24708 -8.392083 555.043
## 22803 -37.24680 -8.392083 554.136
## 23992 -37.29291 -8.392361 541.334
## 23993 -37.29263 -8.392361 541.066
## 23994 -37.29236 -8.392361 540.708
## 23995 -37.29208 -8.392361 540.729
## 23996 -37.29180 -8.392361 541.467
## 23997 -37.29152 -8.392361 543.077
## 23998 -37.29125 -8.392361 544.627
## 23999 -37.29097 -8.392361 545.941
## 24000 -37.29069 -8.392361 545.380
## 24001 -37.29041 -8.392361 544.448
## 24002 -37.29013 -8.392361 543.312
## 24003 -37.28986 -8.392361 542.775
## 24004 -37.28958 -8.392361 542.453
## 24005 -37.28930 -8.392361 542.278
## 24006 -37.28902 -8.392361 542.483
## 24007 -37.28875 -8.392361 542.747
## 24008 -37.28847 -8.392361 543.001
## 24009 -37.28819 -8.392361 542.696
## 24010 -37.28791 -8.392361 542.896
## 24011 -37.28763 -8.392361 543.039
## 24012 -37.28736 -8.392361 544.504
## 24013 -37.28708 -8.392361 546.018
## 24014 -37.28680 -8.392361 547.204
## 24015 -37.28652 -8.392361 547.494
## 24016 -37.28625 -8.392361 547.612
## 24017 -37.28597 -8.392361 548.244
## 24018 -37.28569 -8.392361 549.777
## 24019 -37.28541 -8.392361 551.094
## 24020 -37.28513 -8.392361 551.815
## 24021 -37.28486 -8.392361 551.647
## 24022 -37.28458 -8.392361 551.228
## 24023 -37.28430 -8.392361 550.826
## 24024 -37.28402 -8.392361 551.086
## 24025 -37.28375 -8.392361 551.334
## 24026 -37.28347 -8.392361 551.821
## 24027 -37.28319 -8.392361 552.024
## 24028 -37.28291 -8.392361 551.920
## 24029 -37.28263 -8.392361 551.557
## 24030 -37.28236 -8.392361 550.855
## 24031 -37.28208 -8.392361 550.148
## 24032 -37.28180 -8.392361 549.858
## 24033 -37.28152 -8.392361 549.993
## 24034 -37.28125 -8.392361 550.302
## 24035 -37.28097 -8.392361 550.494
## 24036 -37.28069 -8.392361 550.100
## 24037 -37.28041 -8.392361 549.824
## 24038 -37.28013 -8.392361 549.624
## 24039 -37.27986 -8.392361 550.359
## 24040 -37.27958 -8.392361 550.947
## 24041 -37.27930 -8.392361 551.552
## 24042 -37.27902 -8.392361 550.851
## 24043 -37.27875 -8.392361 549.577
## 24044 -37.27847 -8.392361 548.245
## 24045 -37.27819 -8.392361 547.790
## 24046 -37.27791 -8.392361 547.229
## 24047 -37.27763 -8.392361 546.454
## 24048 -37.27736 -8.392361 545.935
## 24049 -37.27708 -8.392361 545.630
## 24050 -37.27680 -8.392361 546.054
## 24059 -37.27430 -8.392361 548.692
## 24060 -37.27402 -8.392361 547.863
## 24061 -37.27375 -8.392361 546.990
## 24062 -37.27347 -8.392361 546.440
## 24063 -37.27319 -8.392361 546.432
## 24064 -37.27291 -8.392361 546.800
## 24065 -37.27263 -8.392361 546.825
## 24066 -37.27236 -8.392361 546.730
## 24067 -37.27208 -8.392361 546.477
## 24068 -37.27180 -8.392361 546.270
## 24069 -37.27152 -8.392361 546.798
## 24124 -37.25625 -8.392361 556.031
## 24125 -37.25597 -8.392361 554.911
## 24126 -37.25569 -8.392361 553.398
## 24127 -37.25541 -8.392361 552.219
## 24128 -37.25513 -8.392361 551.948
## 24129 -37.25486 -8.392361 552.216
## 24130 -37.25458 -8.392361 553.144
## 24131 -37.25430 -8.392361 553.749
## 24132 -37.25402 -8.392361 554.477
## 24133 -37.25375 -8.392361 555.142
## 24134 -37.25347 -8.392361 555.487
## 24135 -37.25319 -8.392361 555.727
## 24136 -37.25291 -8.392361 555.595
## 24137 -37.25263 -8.392361 555.363
## 24138 -37.25236 -8.392361 554.915
## 24139 -37.25208 -8.392361 554.332
## 24140 -37.25180 -8.392361 554.373
## 24141 -37.25152 -8.392361 555.547
## 24142 -37.25125 -8.392361 556.946
## 24143 -37.25097 -8.392361 558.479
## 24144 -37.25069 -8.392361 558.725
## 24145 -37.25041 -8.392361 559.030
## 24146 -37.25013 -8.392361 559.196
## 24147 -37.24986 -8.392361 560.049
## 24148 -37.24958 -8.392361 560.910
## 24149 -37.24930 -8.392361 561.177
## 24150 -37.24902 -8.392361 560.849
## 24151 -37.24875 -8.392361 560.331
## 24152 -37.24847 -8.392361 559.889
## 24153 -37.24819 -8.392361 559.621
## 24154 -37.24791 -8.392361 559.142
## 24155 -37.24763 -8.392361 558.676
## 24156 -37.24736 -8.392361 557.820
## 24157 -37.24708 -8.392361 556.807
## 24158 -37.24680 -8.392361 555.460
## 24159 -37.24652 -8.392361 554.492
## 25346 -37.29319 -8.392639 541.188
## 25347 -37.29291 -8.392639 540.711
## 25348 -37.29263 -8.392639 540.414
## 25349 -37.29236 -8.392639 540.317
## 25350 -37.29208 -8.392639 540.531
## 25351 -37.29180 -8.392639 541.633
## 25352 -37.29152 -8.392639 542.784
## 25353 -37.29125 -8.392639 544.344
## 25354 -37.29097 -8.392639 545.536
## 25355 -37.29069 -8.392639 545.517
## 25356 -37.29041 -8.392639 545.213
## 25357 -37.29013 -8.392639 544.326
## 25358 -37.28986 -8.392639 543.789
## 25359 -37.28958 -8.392639 543.549
## 25360 -37.28930 -8.392639 543.286
## 25361 -37.28902 -8.392639 543.275
## 25362 -37.28875 -8.392639 543.074
## 25363 -37.28847 -8.392639 543.154
## 25364 -37.28819 -8.392639 543.496
## 25365 -37.28791 -8.392639 543.982
## 25366 -37.28763 -8.392639 544.806
## 25367 -37.28736 -8.392639 545.728
## 25368 -37.28708 -8.392639 546.613
## 25369 -37.28680 -8.392639 547.621
## 25370 -37.28652 -8.392639 548.135
## 25371 -37.28625 -8.392639 548.652
## 25372 -37.28597 -8.392639 549.304
## 25373 -37.28569 -8.392639 550.441
## 25374 -37.28541 -8.392639 551.482
## 25375 -37.28513 -8.392639 551.945
## 25376 -37.28486 -8.392639 551.854
## 25377 -37.28458 -8.392639 551.508
## 25378 -37.28430 -8.392639 551.374
## 25379 -37.28402 -8.392639 551.420
## 25380 -37.28375 -8.392639 551.550
## 25381 -37.28347 -8.392639 551.926
## 25382 -37.28319 -8.392639 552.195
## 25383 -37.28291 -8.392639 552.253
## 25384 -37.28263 -8.392639 551.929
## 25385 -37.28236 -8.392639 551.154
## 25386 -37.28208 -8.392639 550.471
## 25387 -37.28180 -8.392639 550.122
## 25388 -37.28152 -8.392639 550.392
## 25389 -37.28125 -8.392639 550.781
## 25390 -37.28097 -8.392639 551.039
## 25391 -37.28069 -8.392639 550.778
## 25392 -37.28041 -8.392639 550.612
## 25393 -37.28013 -8.392639 550.550
## 25394 -37.27986 -8.392639 551.203
## 25395 -37.27958 -8.392639 551.890
## 25396 -37.27930 -8.392639 552.353
## 25397 -37.27902 -8.392639 552.153
## 25398 -37.27875 -8.392639 551.664
## 25399 -37.27847 -8.392639 550.551
## 25400 -37.27819 -8.392639 549.435
## 25401 -37.27791 -8.392639 548.297
## 25402 -37.27763 -8.392639 547.211
## 25403 -37.27736 -8.392639 546.600
## 25404 -37.27708 -8.392639 545.944
## 25405 -37.27680 -8.392639 546.387
## 25406 -37.27652 -8.392639 546.823
## 25408 -37.27597 -8.392639 547.531
## 25409 -37.27569 -8.392639 547.253
## 25410 -37.27541 -8.392639 547.075
## 25411 -37.27513 -8.392639 546.763
## 25412 -37.27486 -8.392639 547.105
## 25413 -37.27458 -8.392639 547.662
## 25414 -37.27430 -8.392639 547.812
## 25415 -37.27402 -8.392639 547.103
## 25416 -37.27375 -8.392639 546.353
## 25417 -37.27347 -8.392639 546.023
## 25418 -37.27319 -8.392639 546.413
## 25419 -37.27291 -8.392639 547.082
## 25420 -37.27263 -8.392639 547.120
## 25421 -37.27236 -8.392639 547.079
## 25422 -37.27208 -8.392639 546.830
## 25423 -37.27180 -8.392639 546.697
## 25424 -37.27152 -8.392639 546.262
## 25425 -37.27125 -8.392639 546.019
## 25479 -37.25625 -8.392639 555.018
## 25480 -37.25597 -8.392639 553.874
## 25481 -37.25569 -8.392639 552.853
## 25482 -37.25541 -8.392639 552.223
## 25483 -37.25513 -8.392639 552.133
## 25484 -37.25486 -8.392639 552.574
## 25485 -37.25458 -8.392639 553.395
## 25486 -37.25430 -8.392639 554.128
## 25487 -37.25402 -8.392639 554.508
## 25488 -37.25375 -8.392639 555.083
## 25489 -37.25347 -8.392639 555.512
## 25490 -37.25319 -8.392639 555.840
## 25491 -37.25291 -8.392639 555.755
## 25492 -37.25263 -8.392639 555.764
## 25493 -37.25236 -8.392639 555.533
## 25494 -37.25208 -8.392639 555.421
## 25495 -37.25180 -8.392639 555.591
## 25496 -37.25152 -8.392639 556.615
## 25497 -37.25125 -8.392639 557.816
## 25498 -37.25097 -8.392639 559.100
## 25499 -37.25069 -8.392639 559.599
## 25500 -37.25041 -8.392639 559.923
## 25501 -37.25013 -8.392639 560.137
## 25502 -37.24986 -8.392639 560.442
## 25503 -37.24958 -8.392639 560.869
## 25504 -37.24930 -8.392639 560.597
## 25505 -37.24902 -8.392639 560.490
## 25506 -37.24875 -8.392639 560.386
## 25507 -37.24847 -8.392639 560.343
## 25508 -37.24819 -8.392639 560.390
## 25509 -37.24791 -8.392639 560.347
## 25510 -37.24763 -8.392639 560.179
## 25511 -37.24736 -8.392639 559.427
## 25512 -37.24708 -8.392639 558.495
## 25513 -37.24680 -8.392639 557.034
## 25514 -37.24652 -8.392639 555.884
## 25515 -37.24625 -8.392639 555.070
## 26700 -37.29347 -8.392917 540.975
## 26701 -37.29319 -8.392917 540.176
## 26702 -37.29291 -8.392917 539.719
## 26703 -37.29263 -8.392917 539.611
## 26704 -37.29236 -8.392917 539.800
## 26705 -37.29208 -8.392917 540.347
## 26706 -37.29180 -8.392917 541.199
## 26707 -37.29152 -8.392917 542.537
## 26708 -37.29125 -8.392917 543.788
## 26709 -37.29097 -8.392917 544.861
## 26710 -37.29069 -8.392917 545.146
## 26711 -37.29041 -8.392917 545.180
## 26712 -37.29013 -8.392917 545.029
## 26713 -37.28986 -8.392917 544.927
## 26714 -37.28958 -8.392917 544.805
## 26715 -37.28930 -8.392917 544.747
## 26716 -37.28902 -8.392917 544.493
## 26717 -37.28875 -8.392917 544.417
## 26718 -37.28847 -8.392917 544.604
## 26719 -37.28819 -8.392917 545.180
## 26720 -37.28791 -8.392917 546.001
## 26721 -37.28763 -8.392917 546.920
## 26722 -37.28736 -8.392917 547.650
## 26723 -37.28708 -8.392917 548.321
## 26724 -37.28680 -8.392917 548.598
## 26725 -37.28652 -8.392917 549.209
## 26726 -37.28625 -8.392917 549.564
## 26727 -37.28597 -8.392917 550.115
## 26728 -37.28569 -8.392917 550.907
## 26729 -37.28541 -8.392917 551.727
## 26730 -37.28513 -8.392917 552.257
## 26731 -37.28486 -8.392917 552.240
## 26732 -37.28458 -8.392917 551.996
## 26733 -37.28430 -8.392917 551.599
## 26734 -37.28402 -8.392917 551.654
## 26735 -37.28375 -8.392917 551.667
## 26736 -37.28347 -8.392917 551.696
## 26737 -37.28319 -8.392917 551.909
## 26738 -37.28291 -8.392917 551.942
## 26739 -37.28263 -8.392917 551.716
## 26740 -37.28236 -8.392917 551.066
## 26741 -37.28208 -8.392917 550.435
## 26742 -37.28180 -8.392917 550.206
## 26743 -37.28152 -8.392917 550.521
## 26744 -37.28125 -8.392917 551.088
## 26745 -37.28097 -8.392917 551.685
## 26746 -37.28069 -8.392917 551.659
## 26747 -37.28041 -8.392917 551.663
## 26748 -37.28013 -8.392917 551.838
## 26749 -37.27986 -8.392917 552.465
## 26750 -37.27958 -8.392917 553.101
## 26751 -37.27930 -8.392917 553.498
## 26752 -37.27902 -8.392917 553.514
## 26753 -37.27875 -8.392917 553.134
## 26754 -37.27847 -8.392917 552.484
## 26755 -37.27819 -8.392917 551.214
## 26756 -37.27791 -8.392917 549.931
## 26757 -37.27763 -8.392917 548.719
## 26758 -37.27736 -8.392917 547.769
## 26759 -37.27708 -8.392917 547.046
## 26760 -37.27680 -8.392917 546.375
## 26761 -37.27652 -8.392917 546.477
## 26762 -37.27625 -8.392917 546.434
## 26763 -37.27597 -8.392917 546.487
## 26764 -37.27569 -8.392917 546.048
## 26765 -37.27541 -8.392917 545.798
## 26766 -37.27513 -8.392917 545.808
## 26767 -37.27486 -8.392917 546.339
## 26768 -37.27458 -8.392917 546.923
## 26769 -37.27430 -8.392917 547.312
## 26770 -37.27402 -8.392917 546.901
## 26771 -37.27375 -8.392917 546.582
## 26772 -37.27347 -8.392917 546.745
## 26773 -37.27319 -8.392917 547.396
## 26774 -37.27291 -8.392917 548.385
## 26775 -37.27263 -8.392917 549.132
## 26776 -37.27236 -8.392917 549.259
## 26777 -37.27208 -8.392917 548.982
## 26778 -37.27180 -8.392917 548.054
## 26779 -37.27152 -8.392917 547.476
## 26780 -37.27125 -8.392917 546.712
## 26781 -37.27097 -8.392917 546.107
## 26782 -37.27069 -8.392917 546.949
## 26833 -37.25652 -8.392917 554.888
## 26834 -37.25625 -8.392917 554.023
## 26835 -37.25597 -8.392917 553.272
## 26836 -37.25569 -8.392917 552.675
## 26837 -37.25541 -8.392917 552.331
## 26838 -37.25513 -8.392917 552.398
## 26839 -37.25486 -8.392917 553.009
## 26840 -37.25458 -8.392917 553.877
## 26841 -37.25430 -8.392917 554.856
## 26842 -37.25402 -8.392917 555.468
## 26843 -37.25375 -8.392917 555.962
## 26844 -37.25347 -8.392917 556.060
## 26845 -37.25319 -8.392917 556.468
## 26846 -37.25291 -8.392917 556.490
## 26847 -37.25263 -8.392917 556.208
## 26848 -37.25236 -8.392917 556.089
## 26849 -37.25208 -8.392917 555.949
## 26850 -37.25180 -8.392917 556.100
## 26851 -37.25152 -8.392917 556.967
## 26852 -37.25125 -8.392917 557.931
## 26853 -37.25097 -8.392917 558.757
## 26854 -37.25069 -8.392917 559.325
## 26855 -37.25041 -8.392917 559.607
## 26856 -37.25013 -8.392917 559.764
## 26857 -37.24986 -8.392917 559.876
## 26858 -37.24958 -8.392917 559.950
## 26859 -37.24930 -8.392917 560.133
## 26860 -37.24902 -8.392917 560.134
## 26861 -37.24875 -8.392917 560.298
## 26862 -37.24847 -8.392917 560.520
## 26863 -37.24819 -8.392917 560.923
## 26864 -37.24791 -8.392917 561.196
## 26865 -37.24763 -8.392917 561.159
## 26866 -37.24736 -8.392917 560.604
## 26867 -37.24708 -8.392917 559.748
## 26868 -37.24680 -8.392917 558.661
## 26869 -37.24652 -8.392917 557.549
## 26870 -37.24625 -8.392917 556.438
## 26871 -37.24597 -8.392917 555.298
## 28055 -37.29347 -8.393194 540.141
## 28056 -37.29319 -8.393194 539.186
## 28057 -37.29291 -8.393194 538.716
## 28058 -37.29263 -8.393194 538.940
## 28059 -37.29236 -8.393194 539.287
## 28060 -37.29208 -8.393194 539.963
## 28061 -37.29180 -8.393194 540.818
## 28062 -37.29152 -8.393194 541.909
## 28063 -37.29125 -8.393194 543.100
## 28064 -37.29097 -8.393194 544.052
## 28065 -37.29069 -8.393194 544.581
## 28066 -37.29041 -8.393194 544.988
## 28067 -37.29013 -8.393194 545.569
## 28068 -37.28986 -8.393194 546.056
## 28069 -37.28958 -8.393194 546.215
## 28070 -37.28930 -8.393194 546.289
## 28071 -37.28902 -8.393194 545.952
## 28072 -37.28875 -8.393194 545.951
## 28073 -37.28847 -8.393194 546.306
## 28074 -37.28819 -8.393194 547.070
## 28075 -37.28791 -8.393194 547.946
## 28076 -37.28763 -8.393194 548.983
## 28077 -37.28736 -8.393194 549.645
## 28078 -37.28708 -8.393194 550.142
## 28079 -37.28680 -8.393194 550.312
## 28080 -37.28652 -8.393194 550.343
## 28081 -37.28625 -8.393194 550.539
## 28082 -37.28597 -8.393194 550.663
## 28083 -37.28569 -8.393194 551.220
## 28084 -37.28541 -8.393194 551.773
## 28085 -37.28513 -8.393194 552.352
## 28086 -37.28486 -8.393194 552.362
## 28087 -37.28458 -8.393194 552.064
## 28088 -37.28430 -8.393194 551.809
## 28089 -37.28402 -8.393194 551.629
## 28090 -37.28375 -8.393194 551.608
## 28091 -37.28347 -8.393194 551.385
## 28092 -37.28319 -8.393194 551.381
## 28093 -37.28291 -8.393194 551.368
## 28094 -37.28263 -8.393194 551.291
## 28095 -37.28236 -8.393194 550.762
## 28096 -37.28208 -8.393194 550.242
## 28097 -37.28180 -8.393194 549.950
## 28098 -37.28152 -8.393194 550.506
## 28099 -37.28125 -8.393194 551.235
## 28100 -37.28097 -8.393194 552.053
## 28101 -37.28069 -8.393194 552.478
## 28102 -37.28041 -8.393194 552.755
## 28103 -37.28013 -8.393194 553.057
## 28104 -37.27986 -8.393194 553.800
## 28105 -37.27958 -8.393194 554.398
## 28106 -37.27930 -8.393194 554.620
## 28107 -37.27902 -8.393194 554.581
## 28108 -37.27875 -8.393194 554.244
## 28109 -37.27847 -8.393194 553.814
## 28110 -37.27819 -8.393194 552.591
## 28111 -37.27791 -8.393194 551.325
## 28112 -37.27763 -8.393194 550.140
## 28113 -37.27736 -8.393194 549.045
## 28114 -37.27708 -8.393194 548.159
## 28115 -37.27680 -8.393194 547.116
## 28116 -37.27652 -8.393194 546.346
## 28117 -37.27625 -8.393194 545.948
## 28118 -37.27597 -8.393194 545.403
## 28119 -37.27569 -8.393194 545.062
## 28120 -37.27541 -8.393194 544.793
## 28121 -37.27513 -8.393194 545.011
## 28122 -37.27486 -8.393194 545.877
## 28123 -37.27458 -8.393194 546.554
## 28124 -37.27430 -8.393194 546.969
## 28125 -37.27402 -8.393194 547.041
## 28126 -37.27375 -8.393194 547.112
## 28127 -37.27347 -8.393194 547.411
## 28128 -37.27319 -8.393194 548.739
## 28129 -37.27291 -8.393194 549.997
## 28130 -37.27263 -8.393194 551.328
## 28131 -37.27236 -8.393194 551.679
## 28132 -37.27208 -8.393194 551.259
## 28133 -37.27180 -8.393194 550.304
## 28134 -37.27152 -8.393194 549.011
## 28135 -37.27125 -8.393194 547.972
## 28136 -37.27097 -8.393194 546.705
## 28137 -37.27069 -8.393194 546.609
## 28138 -37.27041 -8.393194 547.011
## 28139 -37.27013 -8.393194 547.629
## 28188 -37.25652 -8.393194 553.784
## 28189 -37.25625 -8.393194 553.155
## 28190 -37.25597 -8.393194 552.880
## 28191 -37.25569 -8.393194 552.703
## 28192 -37.25541 -8.393194 552.610
## 28193 -37.25513 -8.393194 552.780
## 28194 -37.25486 -8.393194 553.549
## 28195 -37.25458 -8.393194 554.514
## 28196 -37.25430 -8.393194 555.656
## 28197 -37.25402 -8.393194 556.532
## 28198 -37.25375 -8.393194 556.958
## 28199 -37.25347 -8.393194 557.180
## 28200 -37.25319 -8.393194 557.224
## 28201 -37.25291 -8.393194 557.263
## 28202 -37.25263 -8.393194 557.143
## 28203 -37.25236 -8.393194 556.632
## 28204 -37.25208 -8.393194 556.418
## 28205 -37.25180 -8.393194 556.561
## 28206 -37.25152 -8.393194 557.137
## 28207 -37.25125 -8.393194 557.878
## 28208 -37.25097 -8.393194 558.352
## 28209 -37.25069 -8.393194 558.758
## 28210 -37.25041 -8.393194 559.026
## 28211 -37.25013 -8.393194 559.092
## 28212 -37.24986 -8.393194 559.197
## 28213 -37.24958 -8.393194 559.231
## 28214 -37.24930 -8.393194 559.426
## 28215 -37.24902 -8.393194 559.820
## 28216 -37.24875 -8.393194 560.161
## 28217 -37.24847 -8.393194 560.703
## 28218 -37.24819 -8.393194 561.310
## 28219 -37.24791 -8.393194 561.799
## 28220 -37.24763 -8.393194 561.901
## 28221 -37.24736 -8.393194 561.499
## 28222 -37.24708 -8.393194 560.825
## 28223 -37.24680 -8.393194 560.236
## 28224 -37.24652 -8.393194 559.237
## 28225 -37.24625 -8.393194 558.082
## 28226 -37.24597 -8.393194 556.619
## 28227 -37.24569 -8.393194 555.480
## 28228 -37.24541 -8.393194 554.359
## 29409 -37.29375 -8.393472 541.277
## 29410 -37.29347 -8.393472 539.853
## 29411 -37.29319 -8.393472 538.680
## 29412 -37.29291 -8.393472 537.890
## 29413 -37.29263 -8.393472 537.768
## 29414 -37.29236 -8.393472 538.824
## 29415 -37.29208 -8.393472 539.932
## 29416 -37.29180 -8.393472 541.109
## 29417 -37.29152 -8.393472 541.791
## 29418 -37.29125 -8.393472 542.339
## 29419 -37.29097 -8.393472 542.951
## 29420 -37.29069 -8.393472 544.060
## 29421 -37.29041 -8.393472 545.192
## 29422 -37.29013 -8.393472 546.286
## 29423 -37.28986 -8.393472 547.043
## 29424 -37.28958 -8.393472 547.580
## 29425 -37.28930 -8.393472 547.792
## 29426 -37.28902 -8.393472 547.509
## 29427 -37.28875 -8.393472 547.487
## 29428 -37.28847 -8.393472 547.860
## 29429 -37.28819 -8.393472 548.644
## 29430 -37.28791 -8.393472 549.510
## 29431 -37.28763 -8.393472 550.492
## 29432 -37.28736 -8.393472 551.066
## 29433 -37.28708 -8.393472 551.408
## 29434 -37.28680 -8.393472 551.349
## 29435 -37.28652 -8.393472 551.322
## 29436 -37.28625 -8.393472 551.392
## 29437 -37.28597 -8.393472 551.302
## 29438 -37.28569 -8.393472 551.504
## 29439 -37.28541 -8.393472 551.631
## 29440 -37.28513 -8.393472 551.912
## 29441 -37.28486 -8.393472 551.928
## 29442 -37.28458 -8.393472 551.600
## 29443 -37.28430 -8.393472 551.285
## 29444 -37.28402 -8.393472 551.185
## 29445 -37.28375 -8.393472 551.160
## 29446 -37.28347 -8.393472 550.947
## 29447 -37.28319 -8.393472 550.771
## 29448 -37.28291 -8.393472 550.647
## 29449 -37.28263 -8.393472 550.489
## 29450 -37.28236 -8.393472 550.252
## 29451 -37.28208 -8.393472 549.963
## 29452 -37.28180 -8.393472 550.100
## 29453 -37.28152 -8.393472 550.417
## 29454 -37.28125 -8.393472 551.048
## 29455 -37.28097 -8.393472 551.904
## 29456 -37.28069 -8.393472 552.895
## 29457 -37.28041 -8.393472 553.947
## 29458 -37.28013 -8.393472 554.667
## 29459 -37.27986 -8.393472 555.056
## 29460 -37.27958 -8.393472 555.277
## 29461 -37.27930 -8.393472 555.398
## 29462 -37.27902 -8.393472 555.083
## 29463 -37.27875 -8.393472 554.326
## 29464 -37.27847 -8.393472 553.815
## 29465 -37.27819 -8.393472 552.943
## 29466 -37.27791 -8.393472 552.159
## 29467 -37.27763 -8.393472 551.114
## 29468 -37.27736 -8.393472 550.136
## 29469 -37.27708 -8.393472 549.430
## 29470 -37.27680 -8.393472 548.423
## 29471 -37.27652 -8.393472 547.080
## 29472 -37.27625 -8.393472 546.036
## 29473 -37.27597 -8.393472 545.151
## 29474 -37.27569 -8.393472 544.918
## 29475 -37.27541 -8.393472 544.898
## 29476 -37.27513 -8.393472 545.395
## 29477 -37.27486 -8.393472 545.924
## 29478 -37.27458 -8.393472 546.516
## 29479 -37.27430 -8.393472 546.776
## 29480 -37.27402 -8.393472 547.294
## 29481 -37.27375 -8.393472 547.919
## 29482 -37.27347 -8.393472 548.538
## 29483 -37.27319 -8.393472 549.933
## 29484 -37.27291 -8.393472 551.255
## 29485 -37.27263 -8.393472 552.718
## 29486 -37.27236 -8.393472 552.999
## 29487 -37.27208 -8.393472 552.675
## 29488 -37.27180 -8.393472 551.331
## 29489 -37.27152 -8.393472 550.092
## 29490 -37.27125 -8.393472 549.128
## 29491 -37.27097 -8.393472 547.716
## 29492 -37.27069 -8.393472 546.969
## 29493 -37.27041 -8.393472 546.360
## 29494 -37.27013 -8.393472 546.375
## 29495 -37.26986 -8.393472 546.590
## 29542 -37.25680 -8.393472 552.954
## 29543 -37.25652 -8.393472 552.589
## 29544 -37.25625 -8.393472 552.656
## 29545 -37.25597 -8.393472 552.908
## 29546 -37.25569 -8.393472 552.852
## 29547 -37.25541 -8.393472 552.916
## 29548 -37.25513 -8.393472 553.205
## 29549 -37.25486 -8.393472 554.065
## 29550 -37.25458 -8.393472 555.169
## 29551 -37.25430 -8.393472 556.247
## 29552 -37.25402 -8.393472 557.161
## 29553 -37.25375 -8.393472 557.630
## 29554 -37.25347 -8.393472 557.854
## 29555 -37.25319 -8.393472 557.830
## 29556 -37.25291 -8.393472 557.693
## 29557 -37.25263 -8.393472 557.314
## 29558 -37.25236 -8.393472 557.137
## 29559 -37.25208 -8.393472 557.096
## 29560 -37.25180 -8.393472 557.379
## 29561 -37.25152 -8.393472 557.441
## 29562 -37.25125 -8.393472 557.652
## 29563 -37.25097 -8.393472 557.901
## 29564 -37.25069 -8.393472 558.418
## 29565 -37.25041 -8.393472 558.961
## 29566 -37.25013 -8.393472 559.194
## 29567 -37.24986 -8.393472 559.095
## 29568 -37.24958 -8.393472 559.053
## 29569 -37.24930 -8.393472 559.229
## 29570 -37.24902 -8.393472 559.807
## 29571 -37.24875 -8.393472 560.367
## 29572 -37.24847 -8.393472 561.103
## 29573 -37.24819 -8.393472 561.680
## 29574 -37.24791 -8.393472 562.059
## 29575 -37.24763 -8.393472 562.227
## 29576 -37.24736 -8.393472 562.101
## 29577 -37.24708 -8.393472 561.708
## 29578 -37.24680 -8.393472 561.290
## 29579 -37.24652 -8.393472 560.645
## 29580 -37.24625 -8.393472 559.873
## 29581 -37.24597 -8.393472 558.555
## 29582 -37.24569 -8.393472 557.206
## 29583 -37.24541 -8.393472 556.089
## 29584 -37.24513 -8.393472 554.974
## 30763 -37.29402 -8.393750 542.406
## 30764 -37.29375 -8.393750 541.190
## 30765 -37.29347 -8.393750 539.872
## 30766 -37.29319 -8.393750 538.572
## 30767 -37.29291 -8.393750 537.766
## 30768 -37.29263 -8.393750 537.738
## 30769 -37.29236 -8.393750 538.823
## 30770 -37.29208 -8.393750 540.271
## 30771 -37.29180 -8.393750 541.373
## 30772 -37.29152 -8.393750 541.951
## 30773 -37.29125 -8.393750 542.271
## 30774 -37.29097 -8.393750 542.792
## 30775 -37.29069 -8.393750 544.018
## 30776 -37.29041 -8.393750 545.471
## 30777 -37.29013 -8.393750 546.857
## 30778 -37.28986 -8.393750 547.848
## 30779 -37.28958 -8.393750 548.532
## 30780 -37.28930 -8.393750 548.846
## 30781 -37.28902 -8.393750 548.897
## 30782 -37.28875 -8.393750 548.843
## 30783 -37.28847 -8.393750 549.071
## 30784 -37.28819 -8.393750 549.620
## 30785 -37.28791 -8.393750 550.427
## 30786 -37.28763 -8.393750 551.145
## 30787 -37.28736 -8.393750 551.627
## 30788 -37.28708 -8.393750 551.872
## 30789 -37.28680 -8.393750 551.802
## 30790 -37.28652 -8.393750 552.009
## 30791 -37.28625 -8.393750 551.964
## 30792 -37.28597 -8.393750 551.845
## 30793 -37.28569 -8.393750 551.656
## 30794 -37.28541 -8.393750 551.441
## 30795 -37.28513 -8.393750 551.229
## 30796 -37.28486 -8.393750 550.941
## 30797 -37.28458 -8.393750 550.681
## 30798 -37.28430 -8.393750 550.397
## 30799 -37.28402 -8.393750 550.407
## 30800 -37.28375 -8.393750 550.377
## 30801 -37.28347 -8.393750 550.382
## 30802 -37.28319 -8.393750 550.311
## 30803 -37.28291 -8.393750 550.228
## 30804 -37.28263 -8.393750 550.070
## 30805 -37.28236 -8.393750 549.857
## 30806 -37.28208 -8.393750 549.723
## 30807 -37.28180 -8.393750 549.798
## 30808 -37.28152 -8.393750 550.212
## 30809 -37.28125 -8.393750 550.923
## 30810 -37.28097 -8.393750 551.820
## 30811 -37.28069 -8.393750 553.205
## 30812 -37.28041 -8.393750 554.480
## 30813 -37.28013 -8.393750 555.469
## 30814 -37.27986 -8.393750 555.902
## 30815 -37.27958 -8.393750 555.919
## 30816 -37.27930 -8.393750 555.695
## 30817 -37.27902 -8.393750 554.842
## 30818 -37.27875 -8.393750 553.958
## 30819 -37.27847 -8.393750 553.086
## 30820 -37.27819 -8.393750 552.488
## 30821 -37.27791 -8.393750 551.981
## 30822 -37.27763 -8.393750 551.498
## 30823 -37.27736 -8.393750 551.047
## 30824 -37.27708 -8.393750 550.492
## 30825 -37.27680 -8.393750 549.533
## 30826 -37.27652 -8.393750 548.508
## 30827 -37.27625 -8.393750 547.343
## 30828 -37.27597 -8.393750 546.450
## 30829 -37.27569 -8.393750 545.985
## 30830 -37.27541 -8.393750 545.905
## 30831 -37.27513 -8.393750 546.091
## 30832 -37.27486 -8.393750 546.379
## 30833 -37.27458 -8.393750 546.788
## 30834 -37.27430 -8.393750 547.206
## 30835 -37.27402 -8.393750 547.771
## 30836 -37.27375 -8.393750 548.444
## 30837 -37.27347 -8.393750 549.507
## 30838 -37.27319 -8.393750 550.651
## 30839 -37.27291 -8.393750 551.879
## 30840 -37.27263 -8.393750 552.728
## 30841 -37.27236 -8.393750 552.714
## 30842 -37.27208 -8.393750 552.212
## 30843 -37.27180 -8.393750 551.133
## 30844 -37.27152 -8.393750 550.508
## 30845 -37.27125 -8.393750 549.550
## 30846 -37.27097 -8.393750 548.481
## 30847 -37.27069 -8.393750 547.492
## 30848 -37.27041 -8.393750 546.593
## 30849 -37.27013 -8.393750 545.991
## 30850 -37.26986 -8.393750 545.747
## 30851 -37.26958 -8.393750 545.904
## 30852 -37.26930 -8.393750 546.457
## 30896 -37.25708 -8.393750 553.384
## 30897 -37.25680 -8.393750 551.902
## 30898 -37.25652 -8.393750 551.691
## 30899 -37.25625 -8.393750 552.091
## 30900 -37.25597 -8.393750 552.815
## 30901 -37.25569 -8.393750 553.015
## 30902 -37.25541 -8.393750 553.323
## 30903 -37.25513 -8.393750 553.789
## 30904 -37.25486 -8.393750 554.657
## 30905 -37.25458 -8.393750 555.614
## 30906 -37.25430 -8.393750 556.410
## 30907 -37.25402 -8.393750 557.264
## 30908 -37.25375 -8.393750 557.773
## 30909 -37.25347 -8.393750 557.967
## 30910 -37.25319 -8.393750 558.079
## 30911 -37.25291 -8.393750 557.961
## 30912 -37.25263 -8.393750 557.740
## 30913 -37.25236 -8.393750 557.803
## 30914 -37.25208 -8.393750 557.839
## 30915 -37.25180 -8.393750 557.853
## 30916 -37.25152 -8.393750 557.829
## 30917 -37.25125 -8.393750 557.889
## 30918 -37.25097 -8.393750 557.969
## 30919 -37.25069 -8.393750 558.727
## 30920 -37.25041 -8.393750 559.343
## 30921 -37.25013 -8.393750 559.749
## 30922 -37.24986 -8.393750 559.758
## 30923 -37.24958 -8.393750 559.695
## 30924 -37.24930 -8.393750 559.928
## 30925 -37.24902 -8.393750 560.248
## 30926 -37.24875 -8.393750 560.839
## 30927 -37.24847 -8.393750 561.538
## 30928 -37.24819 -8.393750 561.971
## 30929 -37.24791 -8.393750 562.339
## 30930 -37.24763 -8.393750 562.537
## 30931 -37.24736 -8.393750 562.526
## 30932 -37.24708 -8.393750 562.360
## 30933 -37.24680 -8.393750 561.944
## 30934 -37.24652 -8.393750 561.808
## 30935 -37.24625 -8.393750 561.361
## 30936 -37.24597 -8.393750 560.428
## 30937 -37.24569 -8.393750 559.601
## 30938 -37.24541 -8.393750 558.544
## 30939 -37.24513 -8.393750 557.704
## 30940 -37.24486 -8.393750 557.354
## 32117 -37.29430 -8.394028 542.963
## 32118 -37.29402 -8.394028 542.344
## 32119 -37.29375 -8.394028 541.270
## 32120 -37.29347 -8.394028 539.947
## 32121 -37.29319 -8.394028 538.675
## 32122 -37.29291 -8.394028 537.946
## 32123 -37.29263 -8.394028 537.924
## 32124 -37.29236 -8.394028 539.122
## 32125 -37.29208 -8.394028 540.798
## 32126 -37.29180 -8.394028 542.116
## 32127 -37.29152 -8.394028 542.347
## 32128 -37.29125 -8.394028 542.476
## 32129 -37.29097 -8.394028 542.728
## 32130 -37.29069 -8.394028 544.109
## 32131 -37.29041 -8.394028 545.717
## 32132 -37.29013 -8.394028 547.306
## 32133 -37.28986 -8.394028 548.369
## 32134 -37.28958 -8.394028 549.162
## 32135 -37.28930 -8.394028 549.686
## 32136 -37.28902 -8.394028 549.875
## 32137 -37.28875 -8.394028 549.704
## 32138 -37.28847 -8.394028 549.651
## 32139 -37.28819 -8.394028 550.092
## 32140 -37.28791 -8.394028 550.782
## 32141 -37.28763 -8.394028 551.383
## 32142 -37.28736 -8.394028 551.598
## 32143 -37.28708 -8.394028 551.849
## 32144 -37.28680 -8.394028 552.100
## 32145 -37.28652 -8.394028 552.315
## 32146 -37.28625 -8.394028 552.247
## 32147 -37.28597 -8.394028 552.094
## 32148 -37.28569 -8.394028 551.508
## 32149 -37.28541 -8.394028 550.979
## 32150 -37.28513 -8.394028 550.300
## 32151 -37.28486 -8.394028 549.776
## 32152 -37.28458 -8.394028 549.734
## 32153 -37.28430 -8.394028 549.631
## 32154 -37.28402 -8.394028 549.662
## 32155 -37.28375 -8.394028 549.733
## 32156 -37.28347 -8.394028 549.864
## 32157 -37.28319 -8.394028 550.089
## 32158 -37.28291 -8.394028 550.125
## 32159 -37.28263 -8.394028 549.973
## 32160 -37.28236 -8.394028 549.808
## 32161 -37.28208 -8.394028 549.692
## 32162 -37.28180 -8.394028 549.816
## 32163 -37.28152 -8.394028 550.231
## 32164 -37.28125 -8.394028 550.960
## 32165 -37.28097 -8.394028 552.071
## 32166 -37.28069 -8.394028 553.464
## 32167 -37.28041 -8.394028 554.779
## 32168 -37.28013 -8.394028 556.065
## 32169 -37.27986 -8.394028 556.439
## 32170 -37.27958 -8.394028 556.452
## 32171 -37.27930 -8.394028 555.468
## 32172 -37.27902 -8.394028 554.432
## 32173 -37.27875 -8.394028 553.377
## 32174 -37.27847 -8.394028 552.305
## 32175 -37.27819 -8.394028 551.909
## 32176 -37.27791 -8.394028 551.694
## 32177 -37.27763 -8.394028 551.783
## 32178 -37.27736 -8.394028 551.914
## 32179 -37.27708 -8.394028 551.558
## 32180 -37.27680 -8.394028 551.128
## 32181 -37.27652 -8.394028 550.208
## 32182 -37.27625 -8.394028 549.095
## 32183 -37.27597 -8.394028 548.116
## 32184 -37.27569 -8.394028 547.625
## 32185 -37.27541 -8.394028 547.428
## 32186 -37.27513 -8.394028 547.325
## 32187 -37.27486 -8.394028 547.257
## 32188 -37.27458 -8.394028 547.488
## 32189 -37.27430 -8.394028 547.935
## 32190 -37.27402 -8.394028 548.371
## 32191 -37.27375 -8.394028 548.918
## 32192 -37.27347 -8.394028 549.902
## 32193 -37.27319 -8.394028 550.946
## 32194 -37.27291 -8.394028 551.960
## 32195 -37.27263 -8.394028 552.100
## 32196 -37.27236 -8.394028 551.732
## 32197 -37.27208 -8.394028 551.104
## 32198 -37.27180 -8.394028 550.886
## 32199 -37.27152 -8.394028 550.284
## 32200 -37.27125 -8.394028 549.711
## 32201 -37.27097 -8.394028 549.149
## 32202 -37.27069 -8.394028 548.154
## 32203 -37.27041 -8.394028 547.144
## 32204 -37.27013 -8.394028 546.016
## 32205 -37.26986 -8.394028 545.373
## 32206 -37.26958 -8.394028 545.522
## 32207 -37.26930 -8.394028 545.815
## 32208 -37.26902 -8.394028 546.957
## 32251 -37.25708 -8.394028 552.427
## 32252 -37.25680 -8.394028 551.066
## 32253 -37.25652 -8.394028 551.157
## 32254 -37.25625 -8.394028 551.844
## 32255 -37.25597 -8.394028 552.810
## 32256 -37.25569 -8.394028 553.481
## 32257 -37.25541 -8.394028 554.060
## 32258 -37.25513 -8.394028 554.603
## 32259 -37.25486 -8.394028 555.433
## 32260 -37.25458 -8.394028 555.949
## 32261 -37.25430 -8.394028 556.716
## 32262 -37.25402 -8.394028 557.249
## 32263 -37.25375 -8.394028 557.809
## 32264 -37.25347 -8.394028 558.176
## 32265 -37.25319 -8.394028 558.357
## 32266 -37.25291 -8.394028 558.346
## 32267 -37.25263 -8.394028 558.395
## 32268 -37.25236 -8.394028 558.633
## 32269 -37.25208 -8.394028 558.713
## 32270 -37.25180 -8.394028 558.619
## 32271 -37.25152 -8.394028 558.442
## 32272 -37.25125 -8.394028 558.446
## 32273 -37.25097 -8.394028 558.656
## 32274 -37.25069 -8.394028 559.398
## 32275 -37.25041 -8.394028 560.030
## 32276 -37.25013 -8.394028 560.674
## 32277 -37.24986 -8.394028 560.705
## 32278 -37.24958 -8.394028 560.637
## 32279 -37.24930 -8.394028 560.566
## 32280 -37.24902 -8.394028 560.897
## 32281 -37.24875 -8.394028 561.394
## 32282 -37.24847 -8.394028 561.927
## 32283 -37.24819 -8.394028 562.286
## 32284 -37.24791 -8.394028 562.623
## 32285 -37.24763 -8.394028 562.793
## 32286 -37.24736 -8.394028 562.882
## 32287 -37.24708 -8.394028 562.862
## 32288 -37.24680 -8.394028 562.712
## 32289 -37.24652 -8.394028 562.747
## 32290 -37.24625 -8.394028 562.787
## 32291 -37.24597 -8.394028 562.614
## 32292 -37.24569 -8.394028 561.929
## 32293 -37.24541 -8.394028 561.087
## 32294 -37.24513 -8.394028 560.570
## 32295 -37.24486 -8.394028 560.402
## 32296 -37.24458 -8.394028 560.376
## 33471 -37.29458 -8.394306 542.522
## 33472 -37.29430 -8.394306 542.910
## 33473 -37.29402 -8.394306 542.207
## 33474 -37.29375 -8.394306 541.011
## 33475 -37.29347 -8.394306 539.840
## 33476 -37.29319 -8.394306 538.809
## 33477 -37.29291 -8.394306 538.247
## 33478 -37.29263 -8.394306 538.251
## 33479 -37.29236 -8.394306 539.706
## 33480 -37.29208 -8.394306 541.545
## 33481 -37.29180 -8.394306 542.926
## 33482 -37.29152 -8.394306 543.003
## 33483 -37.29125 -8.394306 542.758
## 33484 -37.29097 -8.394306 542.842
## 33485 -37.29069 -8.394306 544.185
## 33486 -37.29041 -8.394306 545.684
## 33487 -37.29013 -8.394306 547.251
## 33488 -37.28986 -8.394306 548.469
## 33489 -37.28958 -8.394306 549.393
## 33490 -37.28930 -8.394306 550.018
## 33491 -37.28902 -8.394306 550.171
## 33492 -37.28875 -8.394306 550.078
## 33493 -37.28847 -8.394306 550.006
## 33494 -37.28819 -8.394306 550.108
## 33495 -37.28791 -8.394306 550.562
## 33496 -37.28763 -8.394306 550.745
## 33497 -37.28736 -8.394306 551.273
## 33498 -37.28708 -8.394306 551.756
## 33499 -37.28680 -8.394306 552.067
## 33500 -37.28652 -8.394306 552.173
## 33501 -37.28625 -8.394306 551.990
## 33502 -37.28597 -8.394306 551.917
## 33503 -37.28569 -8.394306 550.884
## 33504 -37.28541 -8.394306 549.803
## 33505 -37.28513 -8.394306 548.782
## 33506 -37.28486 -8.394306 548.685
## 33507 -37.28458 -8.394306 548.862
## 33508 -37.28430 -8.394306 549.268
## 33509 -37.28402 -8.394306 549.336
## 33510 -37.28375 -8.394306 549.507
## 33511 -37.28347 -8.394306 549.817
## 33512 -37.28319 -8.394306 550.340
## 33513 -37.28291 -8.394306 550.664
## 33514 -37.28263 -8.394306 550.745
## 33515 -37.28236 -8.394306 550.544
## 33516 -37.28208 -8.394306 550.301
## 33517 -37.28180 -8.394306 550.201
## 33518 -37.28152 -8.394306 550.812
## 33519 -37.28125 -8.394306 551.613
## 33520 -37.28097 -8.394306 552.716
## 33521 -37.28069 -8.394306 553.833
## 33522 -37.28041 -8.394306 554.827
## 33523 -37.28013 -8.394306 555.954
## 33524 -37.27986 -8.394306 556.488
## 33525 -37.27958 -8.394306 556.642
## 33526 -37.27930 -8.394306 555.838
## 33527 -37.27902 -8.394306 554.483
## 33528 -37.27875 -8.394306 553.195
## 33529 -37.27847 -8.394306 551.944
## 33530 -37.27819 -8.394306 551.951
## 33531 -37.27791 -8.394306 552.198
## 33532 -37.27763 -8.394306 552.699
## 33533 -37.27736 -8.394306 552.854
## 33534 -37.27708 -8.394306 552.747
## 33535 -37.27680 -8.394306 552.367
## 33536 -37.27652 -8.394306 551.639
## 33537 -37.27625 -8.394306 550.853
## 33538 -37.27597 -8.394306 550.066
## 33539 -37.27569 -8.394306 549.295
## 33540 -37.27541 -8.394306 548.892
## 33541 -37.27513 -8.394306 548.440
## 33542 -37.27486 -8.394306 548.511
## 33543 -37.27458 -8.394306 548.626
## 33544 -37.27430 -8.394306 549.002
## 33545 -37.27402 -8.394306 549.078
## 33546 -37.27375 -8.394306 549.146
## 33547 -37.27347 -8.394306 549.854
## 33548 -37.27319 -8.394306 550.717
## 33549 -37.27291 -8.394306 551.456
## 33550 -37.27263 -8.394306 551.448
## 33551 -37.27236 -8.394306 550.862
## 33552 -37.27208 -8.394306 550.162
## 33553 -37.27180 -8.394306 549.910
## 33554 -37.27152 -8.394306 550.165
## 33555 -37.27125 -8.394306 550.117
## 33556 -37.27097 -8.394306 550.075
## 33557 -37.27069 -8.394306 548.850
## 33558 -37.27041 -8.394306 547.630
## 33559 -37.27013 -8.394306 546.195
## 33560 -37.26986 -8.394306 545.829
## 33561 -37.26958 -8.394306 545.752
## 33562 -37.26930 -8.394306 546.350
## 33563 -37.26902 -8.394306 547.058
## 33564 -37.26875 -8.394306 547.574
## 33565 -37.26847 -8.394306 548.633
## 33605 -37.25736 -8.394306 553.342
## 33606 -37.25708 -8.394306 551.778
## 33607 -37.25680 -8.394306 551.169
## 33608 -37.25652 -8.394306 551.115
## 33609 -37.25625 -8.394306 552.179
## 33610 -37.25597 -8.394306 553.237
## 33611 -37.25569 -8.394306 554.507
## 33612 -37.25541 -8.394306 555.795
## 33613 -37.25513 -8.394306 556.716
## 33614 -37.25486 -8.394306 556.890
## 33615 -37.25458 -8.394306 556.921
## 33616 -37.25430 -8.394306 556.831
## 33617 -37.25402 -8.394306 557.455
## 33618 -37.25375 -8.394306 558.104
## 33619 -37.25347 -8.394306 558.505
## 33620 -37.25319 -8.394306 558.952
## 33621 -37.25291 -8.394306 559.270
## 33622 -37.25263 -8.394306 559.730
## 33623 -37.25236 -8.394306 559.763
## 33624 -37.25208 -8.394306 559.688
## 33625 -37.25180 -8.394306 559.390
## 33626 -37.25152 -8.394306 559.404
## 33627 -37.25125 -8.394306 559.574
## 33628 -37.25097 -8.394306 559.787
## 33629 -37.25069 -8.394306 560.298
## 33630 -37.25041 -8.394306 560.813
## 33631 -37.25013 -8.394306 561.422
## 33632 -37.24986 -8.394306 561.453
## 33633 -37.24958 -8.394306 561.351
## 33634 -37.24930 -8.394306 561.274
## 33635 -37.24902 -8.394306 561.530
## 33636 -37.24875 -8.394306 561.926
## 33637 -37.24847 -8.394306 562.343
## 33638 -37.24819 -8.394306 562.673
## 33639 -37.24791 -8.394306 563.003
## 33640 -37.24763 -8.394306 563.137
## 33641 -37.24736 -8.394306 563.341
## 33642 -37.24708 -8.394306 563.397
## 33643 -37.24680 -8.394306 563.361
## 33644 -37.24652 -8.394306 563.516
## 33645 -37.24625 -8.394306 563.537
## 33646 -37.24597 -8.394306 563.695
## 33647 -37.24569 -8.394306 563.495
## 33648 -37.24541 -8.394306 562.916
## 33649 -37.24513 -8.394306 562.640
## 33650 -37.24486 -8.394306 562.635
## 33651 -37.24458 -8.394306 562.776
## 33652 -37.24430 -8.394306 562.017
## 33653 -37.24402 -8.394306 560.872
## 34826 -37.29458 -8.394583 542.436
## 34827 -37.29430 -8.394583 542.684
## 34828 -37.29402 -8.394583 541.968
## 34829 -37.29375 -8.394583 540.841
## 34830 -37.29347 -8.394583 539.640
## 34831 -37.29319 -8.394583 538.798
## 34832 -37.29291 -8.394583 538.492
## 34833 -37.29263 -8.394583 538.956
## 34834 -37.29236 -8.394583 540.556
## 34835 -37.29208 -8.394583 542.351
## 34836 -37.29180 -8.394583 543.572
## 34837 -37.29152 -8.394583 543.516
## 34838 -37.29125 -8.394583 543.186
## 34839 -37.29097 -8.394583 543.078
## 34840 -37.29069 -8.394583 544.120
## 34841 -37.29041 -8.394583 545.528
## 34842 -37.29013 -8.394583 547.005
## 34843 -37.28986 -8.394583 548.197
## 34844 -37.28958 -8.394583 549.108
## 34845 -37.28930 -8.394583 549.721
## 34846 -37.28902 -8.394583 549.785
## 34847 -37.28875 -8.394583 549.693
## 34848 -37.28847 -8.394583 549.601
## 34849 -37.28819 -8.394583 549.712
## 34850 -37.28791 -8.394583 549.962
## 34851 -37.28763 -8.394583 550.322
## 34852 -37.28736 -8.394583 550.831
## 34853 -37.28708 -8.394583 551.285
## 34854 -37.28680 -8.394583 551.581
## 34855 -37.28652 -8.394583 551.614
## 34856 -37.28625 -8.394583 551.367
## 34857 -37.28597 -8.394583 550.825
## 34858 -37.28569 -8.394583 549.716
## 34859 -37.28541 -8.394583 548.639
## 34860 -37.28513 -8.394583 547.931
## 34861 -37.28486 -8.394583 548.072
## 34862 -37.28458 -8.394583 548.552
## 34863 -37.28430 -8.394583 549.100
## 34864 -37.28402 -8.394583 549.489
## 34865 -37.28375 -8.394583 549.878
## 34866 -37.28347 -8.394583 550.321
## 34867 -37.28319 -8.394583 550.950
## 34868 -37.28291 -8.394583 551.523
## 34869 -37.28263 -8.394583 551.875
## 34870 -37.28236 -8.394583 551.809
## 34871 -37.28208 -8.394583 551.656
## 34872 -37.28180 -8.394583 551.647
## 34873 -37.28152 -8.394583 552.002
## 34874 -37.28125 -8.394583 552.592
## 34875 -37.28097 -8.394583 553.395
## 34876 -37.28069 -8.394583 554.269
## 34877 -37.28041 -8.394583 555.140
## 34878 -37.28013 -8.394583 555.904
## 34879 -37.27986 -8.394583 556.436
## 34880 -37.27958 -8.394583 556.561
## 34881 -37.27930 -8.394583 556.080
## 34882 -37.27902 -8.394583 554.929
## 34883 -37.27875 -8.394583 553.710
## 34884 -37.27847 -8.394583 552.797
## 34885 -37.27819 -8.394583 552.882
## 34886 -37.27791 -8.394583 553.290
## 34887 -37.27763 -8.394583 553.743
## 34888 -37.27736 -8.394583 553.869
## 34889 -37.27708 -8.394583 553.773
## 34890 -37.27680 -8.394583 553.434
## 34891 -37.27652 -8.394583 552.852
## 34892 -37.27625 -8.394583 552.173
## 34893 -37.27597 -8.394583 551.496
## 34894 -37.27569 -8.394583 550.910
## 34895 -37.27541 -8.394583 550.462
## 34896 -37.27513 -8.394583 550.194
## 34897 -37.27486 -8.394583 550.131
## 34898 -37.27458 -8.394583 550.138
## 34899 -37.27430 -8.394583 550.080
## 34900 -37.27402 -8.394583 549.819
## 34901 -37.27375 -8.394583 549.621
## 34902 -37.27347 -8.394583 549.632
## 34903 -37.27319 -8.394583 550.142
## 34904 -37.27291 -8.394583 550.625
## 34905 -37.27263 -8.394583 550.760
## 34906 -37.27236 -8.394583 550.224
## 34907 -37.27208 -8.394583 549.580
## 34908 -37.27180 -8.394583 549.292
## 34909 -37.27152 -8.394583 549.715
## 34910 -37.27125 -8.394583 550.167
## 34911 -37.27097 -8.394583 550.295
## 34912 -37.27069 -8.394583 549.336
## 34913 -37.27041 -8.394583 548.188
## 34914 -37.27013 -8.394583 547.245
## 34915 -37.26986 -8.394583 547.099
## 34916 -37.26958 -8.394583 547.269
## 34917 -37.26930 -8.394583 547.578
## 34918 -37.26902 -8.394583 547.666
## 34919 -37.26875 -8.394583 547.780
## 34920 -37.26847 -8.394583 548.081
## 34921 -37.26819 -8.394583 548.760
## 34922 -37.26791 -8.394583 549.563
## 34960 -37.25736 -8.394583 552.468
## 34961 -37.25708 -8.394583 551.526
## 34962 -37.25680 -8.394583 551.347
## 34963 -37.25652 -8.394583 552.002
## 34964 -37.25625 -8.394583 553.184
## 34965 -37.25597 -8.394583 554.656
## 34966 -37.25569 -8.394583 556.210
## 34967 -37.25541 -8.394583 557.540
## 34968 -37.25513 -8.394583 558.360
## 34969 -37.25486 -8.394583 558.228
## 34970 -37.25458 -8.394583 557.858
## 34971 -37.25430 -8.394583 557.829
## 34972 -37.25402 -8.394583 557.957
## 34973 -37.25375 -8.394583 558.598
## 34974 -37.25347 -8.394583 559.325
## 34975 -37.25319 -8.394583 560.021
## 34976 -37.25291 -8.394583 560.586
## 34977 -37.25263 -8.394583 560.949
## 34978 -37.25236 -8.394583 561.002
## 34979 -37.25208 -8.394583 560.911
## 34980 -37.25180 -8.394583 560.785
## 34981 -37.25152 -8.394583 560.763
## 34982 -37.25125 -8.394583 560.835
## 34983 -37.25097 -8.394583 561.039
## 34984 -37.25069 -8.394583 561.392
## 34985 -37.25041 -8.394583 561.756
## 34986 -37.25013 -8.394583 562.009
## 34987 -37.24986 -8.394583 561.977
## 34988 -37.24958 -8.394583 561.881
## 34989 -37.24930 -8.394583 561.871
## 34990 -37.24902 -8.394583 562.086
## 34991 -37.24875 -8.394583 562.418
## 34992 -37.24847 -8.394583 562.812
## 34993 -37.24819 -8.394583 563.196
## 34994 -37.24791 -8.394583 563.538
## 34995 -37.24763 -8.394583 563.801
## 34996 -37.24736 -8.394583 563.964
## 34997 -37.24708 -8.394583 564.036
## 34998 -37.24680 -8.394583 564.055
## 34999 -37.24652 -8.394583 564.077
## 35000 -37.24625 -8.394583 564.056
## 35001 -37.24597 -8.394583 564.010
## 35002 -37.24569 -8.394583 563.827
## 35003 -37.24541 -8.394583 563.687
## 35004 -37.24513 -8.394583 563.671
## 35005 -37.24486 -8.394583 563.889
## 35006 -37.24458 -8.394583 563.970
## 35007 -37.24430 -8.394583 563.595
## 35008 -37.24402 -8.394583 562.586
## 35009 -37.24375 -8.394583 561.179
## 36180 -37.29486 -8.394861 541.744
## 36181 -37.29458 -8.394861 542.545
## 36182 -37.29430 -8.394861 542.666
## 36183 -37.29402 -8.394861 541.928
## 36184 -37.29375 -8.394861 540.831
## 36185 -37.29347 -8.394861 539.622
## 36186 -37.29319 -8.394861 538.967
## 36187 -37.29291 -8.394861 538.930
## 36188 -37.29263 -8.394861 539.774
## 36189 -37.29236 -8.394861 541.333
## 36190 -37.29208 -8.394861 542.838
## 36191 -37.29180 -8.394861 544.033
## 36192 -37.29152 -8.394861 543.692
## 36193 -37.29125 -8.394861 543.458
## 36194 -37.29097 -8.394861 543.057
## 36195 -37.29069 -8.394861 543.967
## 36196 -37.29041 -8.394861 545.216
## 36197 -37.29013 -8.394861 546.599
## 36198 -37.28986 -8.394861 547.577
## 36199 -37.28958 -8.394861 548.320
## 36200 -37.28930 -8.394861 548.818
## 36201 -37.28902 -8.394861 548.867
## 36202 -37.28875 -8.394861 548.809
## 36203 -37.28847 -8.394861 548.663
## 36204 -37.28819 -8.394861 548.861
## 36205 -37.28791 -8.394861 549.156
## 36206 -37.28763 -8.394861 549.671
## 36207 -37.28736 -8.394861 550.141
## 36208 -37.28708 -8.394861 550.535
## 36209 -37.28680 -8.394861 550.847
## 36210 -37.28652 -8.394861 550.683
## 36211 -37.28625 -8.394861 550.419
## 36212 -37.28597 -8.394861 549.507
## 36213 -37.28569 -8.394861 548.464
## 36214 -37.28541 -8.394861 547.729
## 36215 -37.28513 -8.394861 547.291
## 36216 -37.28486 -8.394861 547.926
## 36217 -37.28458 -8.394861 548.576
## 36218 -37.28430 -8.394861 549.392
## 36219 -37.28402 -8.394861 549.938
## 36220 -37.28375 -8.394861 550.462
## 36221 -37.28347 -8.394861 551.039
## 36222 -37.28319 -8.394861 551.717
## 36223 -37.28291 -8.394861 552.457
## 36224 -37.28263 -8.394861 553.063
## 36225 -37.28236 -8.394861 553.227
## 36226 -37.28208 -8.394861 553.298
## 36227 -37.28180 -8.394861 553.365
## 36228 -37.28152 -8.394861 553.403
## 36229 -37.28125 -8.394861 553.719
## 36230 -37.28097 -8.394861 554.107
## 36231 -37.28069 -8.394861 554.728
## 36232 -37.28041 -8.394861 555.592
## 36233 -37.28013 -8.394861 556.034
## 36234 -37.27986 -8.394861 556.497
## 36235 -37.27958 -8.394861 556.489
## 36236 -37.27930 -8.394861 556.466
## 36237 -37.27902 -8.394861 555.655
## 36238 -37.27875 -8.394861 554.640
## 36239 -37.27847 -8.394861 554.017
## 36240 -37.27819 -8.394861 554.226
## 36241 -37.27791 -8.394861 554.689
## 36242 -37.27763 -8.394861 555.057
## 36243 -37.27736 -8.394861 554.946
## 36244 -37.27708 -8.394861 554.752
## 36245 -37.27680 -8.394861 554.502
## 36246 -37.27652 -8.394861 553.949
## 36247 -37.27625 -8.394861 553.385
## 36248 -37.27597 -8.394861 552.823
## 36249 -37.27569 -8.394861 552.499
## 36250 -37.27541 -8.394861 552.121
## 36251 -37.27513 -8.394861 552.084
## 36252 -37.27486 -8.394861 551.942
## 36253 -37.27458 -8.394861 551.835
## 36254 -37.27430 -8.394861 551.352
## 36255 -37.27402 -8.394861 550.821
## 36256 -37.27375 -8.394861 550.379
## 36257 -37.27347 -8.394861 549.679
## 36258 -37.27319 -8.394861 549.817
## 36259 -37.27291 -8.394861 549.973
## 36260 -37.27263 -8.394861 550.224
## 36261 -37.27236 -8.394861 549.783
## 36262 -37.27208 -8.394861 549.254
## 36263 -37.27180 -8.394861 548.827
## 36264 -37.27152 -8.394861 549.430
## 36265 -37.27125 -8.394861 550.072
## 36266 -37.27097 -8.394861 550.406
## 36267 -37.27069 -8.394861 549.662
## 36268 -37.27041 -8.394861 548.727
## 36269 -37.27013 -8.394861 548.328
## 36270 -37.26986 -8.394861 548.558
## 36271 -37.26958 -8.394861 548.983
## 36272 -37.26930 -8.394861 549.088
## 36273 -37.26902 -8.394861 548.581
## 36274 -37.26875 -8.394861 548.329
## 36275 -37.26847 -8.394861 547.831
## 36276 -37.26819 -8.394861 548.065
## 36277 -37.26791 -8.394861 548.750
## 36278 -37.26763 -8.394861 549.618
## 36314 -37.25763 -8.394861 552.801
## 36315 -37.25736 -8.394861 551.763
## 36316 -37.25708 -8.394861 551.381
## 36317 -37.25680 -8.394861 551.519
## 36318 -37.25652 -8.394861 552.869
## 36319 -37.25625 -8.394861 554.206
## 36320 -37.25597 -8.394861 556.099
## 36321 -37.25569 -8.394861 557.574
## 36322 -37.25541 -8.394861 558.941
## 36323 -37.25513 -8.394861 559.507
## 36324 -37.25486 -8.394861 559.063
## 36325 -37.25458 -8.394861 558.767
## 36326 -37.25430 -8.394861 558.326
## 36327 -37.25402 -8.394861 558.478
## 36328 -37.25375 -8.394861 559.182
## 36329 -37.25347 -8.394861 560.313
## 36330 -37.25319 -8.394861 561.243
## 36331 -37.25291 -8.394861 561.867
## 36332 -37.25263 -8.394861 562.195
## 36333 -37.25236 -8.394861 562.291
## 36334 -37.25208 -8.394861 562.245
## 36335 -37.25180 -8.394861 562.307
## 36336 -37.25152 -8.394861 562.168
## 36337 -37.25125 -8.394861 562.089
## 36338 -37.25097 -8.394861 562.231
## 36339 -37.25069 -8.394861 562.415
## 36340 -37.25041 -8.394861 562.658
## 36341 -37.25013 -8.394861 562.508
## 36342 -37.24986 -8.394861 562.519
## 36343 -37.24958 -8.394861 562.452
## 36344 -37.24930 -8.394861 562.511
## 36345 -37.24902 -8.394861 562.760
## 36346 -37.24875 -8.394861 563.038
## 36347 -37.24847 -8.394861 563.403
## 36348 -37.24819 -8.394861 563.836
## 36349 -37.24791 -8.394861 564.240
## 36350 -37.24763 -8.394861 564.533
## 36351 -37.24736 -8.394861 564.671
## 36352 -37.24708 -8.394861 564.637
## 36353 -37.24680 -8.394861 564.699
## 36354 -37.24652 -8.394861 564.430
## 36355 -37.24625 -8.394861 564.262
## 36356 -37.24597 -8.394861 563.960
## 36357 -37.24569 -8.394861 563.694
## 36358 -37.24541 -8.394861 563.944
## 36359 -37.24513 -8.394861 564.310
## 36360 -37.24486 -8.394861 564.514
## 36361 -37.24458 -8.394861 564.493
## 36362 -37.24430 -8.394861 564.665
## 36363 -37.24402 -8.394861 563.793
## 36364 -37.24375 -8.394861 562.275
## 36365 -37.24347 -8.394861 560.071
## 37531 -37.29597 -8.395139 540.821
## 37532 -37.29569 -8.395139 540.749
## 37533 -37.29541 -8.395139 540.855
## 37534 -37.29513 -8.395139 541.104
## 37535 -37.29486 -8.395139 541.975
## 37536 -37.29458 -8.395139 542.809
## 37537 -37.29430 -8.395139 542.976
## 37538 -37.29402 -8.395139 542.319
## 37539 -37.29375 -8.395139 541.303
## 37540 -37.29347 -8.395139 540.157
## 37541 -37.29319 -8.395139 539.813
## 37542 -37.29291 -8.395139 539.834
## 37543 -37.29263 -8.395139 540.837
## 37544 -37.29236 -8.395139 541.819
## 37545 -37.29208 -8.395139 542.858
## 37546 -37.29180 -8.395139 543.206
## 37547 -37.29152 -8.395139 543.618
## 37548 -37.29125 -8.395139 543.523
## 37549 -37.29097 -8.395139 543.279
## 37550 -37.29069 -8.395139 543.827
## 37551 -37.29041 -8.395139 544.714
## 37552 -37.29013 -8.395139 545.970
## 37553 -37.28986 -8.395139 546.707
## 37554 -37.28958 -8.395139 547.129
## 37555 -37.28930 -8.395139 547.361
## 37556 -37.28902 -8.395139 547.504
## 37557 -37.28875 -8.395139 547.570
## 37558 -37.28847 -8.395139 547.544
## 37559 -37.28819 -8.395139 547.892
## 37560 -37.28791 -8.395139 548.313
## 37561 -37.28763 -8.395139 549.058
## 37562 -37.28736 -8.395139 549.258
## 37563 -37.28708 -8.395139 549.221
## 37564 -37.28680 -8.395139 549.367
## 37565 -37.28652 -8.395139 549.365
## 37566 -37.28625 -8.395139 549.066
## 37567 -37.28597 -8.395139 548.363
## 37568 -37.28569 -8.395139 547.771
## 37569 -37.28541 -8.395139 547.560
## 37570 -37.28513 -8.395139 547.553
## 37571 -37.28486 -8.395139 548.345
## 37572 -37.28458 -8.395139 549.246
## 37573 -37.28430 -8.395139 550.215
## 37574 -37.28402 -8.395139 550.563
## 37575 -37.28375 -8.395139 550.854
## 37576 -37.28347 -8.395139 551.338
## 37577 -37.28319 -8.395139 552.177
## 37578 -37.28291 -8.395139 553.167
## 37579 -37.28263 -8.395139 553.907
## 37580 -37.28236 -8.395139 554.345
## 37581 -37.28208 -8.395139 554.650
## 37582 -37.28180 -8.395139 554.978
## 37583 -37.28152 -8.395139 554.772
## 37584 -37.28125 -8.395139 554.521
## 37585 -37.28097 -8.395139 554.666
## 37586 -37.28069 -8.395139 555.420
## 37587 -37.28041 -8.395139 556.343
## 37588 -37.28013 -8.395139 556.854
## 37589 -37.27986 -8.395139 557.062
## 37590 -37.27958 -8.395139 556.953
## 37591 -37.27930 -8.395139 556.906
## 37592 -37.27902 -8.395139 556.470
## 37593 -37.27875 -8.395139 555.979
## 37594 -37.27847 -8.395139 555.538
## 37595 -37.27819 -8.395139 555.741
## 37596 -37.27791 -8.395139 556.081
## 37597 -37.27763 -8.395139 556.389
## 37598 -37.27736 -8.395139 556.123
## 37599 -37.27708 -8.395139 555.724
## 37600 -37.27680 -8.395139 555.234
## 37601 -37.27652 -8.395139 554.979
## 37602 -37.27625 -8.395139 554.722
## 37603 -37.27597 -8.395139 554.386
## 37604 -37.27569 -8.395139 554.111
## 37605 -37.27541 -8.395139 553.917
## 37606 -37.27513 -8.395139 553.958
## 37607 -37.27486 -8.395139 553.823
## 37608 -37.27458 -8.395139 553.620
## 37609 -37.27430 -8.395139 552.918
## 37610 -37.27402 -8.395139 552.247
## 37611 -37.27375 -8.395139 551.575
## 37612 -37.27347 -8.395139 550.728
## 37613 -37.27319 -8.395139 550.311
## 37614 -37.27291 -8.395139 549.910
## 37615 -37.27263 -8.395139 549.931
## 37616 -37.27236 -8.395139 549.526
## 37617 -37.27208 -8.395139 548.981
## 37618 -37.27180 -8.395139 548.806
## 37619 -37.27152 -8.395139 549.064
## 37620 -37.27125 -8.395139 549.722
## 37621 -37.27097 -8.395139 550.011
## 37622 -37.27069 -8.395139 549.685
## 37623 -37.27041 -8.395139 549.308
## 37624 -37.27013 -8.395139 549.319
## 37625 -37.26986 -8.395139 549.667
## 37626 -37.26958 -8.395139 550.137
## 37627 -37.26930 -8.395139 550.295
## 37628 -37.26902 -8.395139 549.585
## 37629 -37.26875 -8.395139 548.768
## 37630 -37.26847 -8.395139 548.020
## 37631 -37.26819 -8.395139 548.074
## 37632 -37.26791 -8.395139 548.366
## 37633 -37.26763 -8.395139 549.137
## 37634 -37.26736 -8.395139 549.683
## 37635 -37.26708 -8.395139 550.136
## 37668 -37.25791 -8.395139 553.413
## 37669 -37.25763 -8.395139 551.718
## 37670 -37.25736 -8.395139 551.148
## 37671 -37.25708 -8.395139 551.161
## 37672 -37.25680 -8.395139 551.883
## 37673 -37.25652 -8.395139 553.287
## 37674 -37.25625 -8.395139 554.789
## 37675 -37.25597 -8.395139 556.833
## 37676 -37.25569 -8.395139 557.902
## 37677 -37.25541 -8.395139 558.399
## 37678 -37.25513 -8.395139 558.805
## 37679 -37.25486 -8.395139 558.690
## 37680 -37.25458 -8.395139 558.490
## 37681 -37.25430 -8.395139 558.552
## 37682 -37.25402 -8.395139 558.781
## 37683 -37.25375 -8.395139 559.888
## 37684 -37.25347 -8.395139 561.372
## 37685 -37.25319 -8.395139 562.273
## 37686 -37.25291 -8.395139 562.943
## 37687 -37.25263 -8.395139 563.226
## 37688 -37.25236 -8.395139 563.509
## 37689 -37.25208 -8.395139 563.575
## 37690 -37.25180 -8.395139 563.684
## 37691 -37.25152 -8.395139 563.371
## 37692 -37.25125 -8.395139 562.995
## 37693 -37.25097 -8.395139 562.893
## 37694 -37.25069 -8.395139 563.076
## 37695 -37.25041 -8.395139 563.378
## 37696 -37.25013 -8.395139 563.359
## 37697 -37.24986 -8.395139 563.267
## 37698 -37.24958 -8.395139 563.197
## 37699 -37.24930 -8.395139 563.452
## 37700 -37.24902 -8.395139 563.701
## 37701 -37.24875 -8.395139 563.884
## 37702 -37.24847 -8.395139 564.201
## 37703 -37.24819 -8.395139 564.700
## 37704 -37.24791 -8.395139 565.199
## 37705 -37.24763 -8.395139 565.447
## 37706 -37.24736 -8.395139 565.448
## 37707 -37.24708 -8.395139 565.245
## 37708 -37.24680 -8.395139 565.096
## 37709 -37.24652 -8.395139 564.633
## 37710 -37.24625 -8.395139 564.047
## 37711 -37.24597 -8.395139 563.540
## 37712 -37.24569 -8.395139 563.746
## 37713 -37.24541 -8.395139 564.188
## 37714 -37.24513 -8.395139 564.626
## 37715 -37.24486 -8.395139 564.829
## 37716 -37.24458 -8.395139 564.825
## 37717 -37.24430 -8.395139 564.783
## 37718 -37.24402 -8.395139 564.184
## 37719 -37.24375 -8.395139 563.068
## 37720 -37.24347 -8.395139 560.907
## 37721 -37.24319 -8.395139 558.069
## 38881 -37.29736 -8.395417 539.652
## 38882 -37.29708 -8.395417 539.274
## 38883 -37.29680 -8.395417 539.064
## 38884 -37.29652 -8.395417 539.203
## 38885 -37.29625 -8.395417 539.671
## 38886 -37.29597 -8.395417 540.301
## 38887 -37.29569 -8.395417 540.403
## 38888 -37.29541 -8.395417 540.703
## 38889 -37.29513 -8.395417 541.400
## 38890 -37.29486 -8.395417 542.295
## 38891 -37.29458 -8.395417 543.257
## 38892 -37.29430 -8.395417 543.767
## 38893 -37.29402 -8.395417 543.216
## 38894 -37.29375 -8.395417 542.396
## 38895 -37.29347 -8.395417 541.326
## 38896 -37.29319 -8.395417 541.148
## 38897 -37.29291 -8.395417 541.035
## 38898 -37.29263 -8.395417 541.203
## 38899 -37.29236 -8.395417 541.542
## 38900 -37.29208 -8.395417 541.953
## 38901 -37.29180 -8.395417 542.481
## 38902 -37.29152 -8.395417 542.479
## 38903 -37.29125 -8.395417 542.674
## 38904 -37.29097 -8.395417 543.120
## 38905 -37.29069 -8.395417 543.649
## 38906 -37.29041 -8.395417 544.410
## 38907 -37.29013 -8.395417 545.115
## 38908 -37.28986 -8.395417 545.514
## 38909 -37.28958 -8.395417 545.755
## 38910 -37.28930 -8.395417 545.964
## 38911 -37.28902 -8.395417 546.013
## 38912 -37.28875 -8.395417 546.184
## 38913 -37.28847 -8.395417 546.492
## 38914 -37.28819 -8.395417 547.000
## 38915 -37.28791 -8.395417 547.562
## 38916 -37.28763 -8.395417 547.872
## 38917 -37.28736 -8.395417 548.048
## 38918 -37.28708 -8.395417 547.944
## 38919 -37.28680 -8.395417 547.915
## 38920 -37.28652 -8.395417 547.746
## 38921 -37.28625 -8.395417 547.729
## 38922 -37.28597 -8.395417 547.878
## 38923 -37.28569 -8.395417 547.817
## 38924 -37.28541 -8.395417 548.042
## 38925 -37.28513 -8.395417 548.518
## 38926 -37.28486 -8.395417 549.394
## 38927 -37.28458 -8.395417 550.287
## 38928 -37.28430 -8.395417 550.864
## 38929 -37.28402 -8.395417 551.062
## 38930 -37.28375 -8.395417 551.149
## 38931 -37.28347 -8.395417 551.353
## 38932 -37.28319 -8.395417 552.298
## 38933 -37.28291 -8.395417 553.341
## 38934 -37.28263 -8.395417 554.340
## 38935 -37.28236 -8.395417 555.076
## 38936 -37.28208 -8.395417 555.579
## 38937 -37.28180 -8.395417 555.836
## 38938 -37.28152 -8.395417 555.659
## 38939 -37.28125 -8.395417 555.535
## 38940 -37.28097 -8.395417 555.786
## 38941 -37.28069 -8.395417 556.273
## 38942 -37.28041 -8.395417 557.062
## 38943 -37.28013 -8.395417 557.739
## 38944 -37.27986 -8.395417 558.018
## 38945 -37.27958 -8.395417 558.040
## 38946 -37.27930 -8.395417 557.637
## 38947 -37.27902 -8.395417 557.459
## 38948 -37.27875 -8.395417 557.084
## 38949 -37.27847 -8.395417 556.901
## 38950 -37.27819 -8.395417 557.092
## 38951 -37.27791 -8.395417 557.379
## 38952 -37.27763 -8.395417 557.504
## 38953 -37.27736 -8.395417 557.182
## 38954 -37.27708 -8.395417 556.720
## 38955 -37.27680 -8.395417 556.290
## 38956 -37.27652 -8.395417 556.116
## 38957 -37.27625 -8.395417 556.027
## 38958 -37.27597 -8.395417 555.972
## 38959 -37.27569 -8.395417 555.911
## 38960 -37.27541 -8.395417 555.836
## 38961 -37.27513 -8.395417 555.757
## 38962 -37.27486 -8.395417 555.650
## 38963 -37.27458 -8.395417 555.407
## 38964 -37.27430 -8.395417 555.134
## 38965 -37.27402 -8.395417 554.209
## 38966 -37.27375 -8.395417 553.351
## 38967 -37.27347 -8.395417 552.421
## 38968 -37.27319 -8.395417 551.689
## 38969 -37.27291 -8.395417 550.979
## 38970 -37.27263 -8.395417 550.325
## 38971 -37.27236 -8.395417 549.659
## 38972 -37.27208 -8.395417 549.159
## 38973 -37.27180 -8.395417 549.044
## 38974 -37.27152 -8.395417 549.211
## 38975 -37.27125 -8.395417 549.559
## 38976 -37.27097 -8.395417 549.734
## 38977 -37.27069 -8.395417 549.689
## 38978 -37.27041 -8.395417 549.538
## 38979 -37.27013 -8.395417 549.604
## 38980 -37.26986 -8.395417 550.174
## 38981 -37.26958 -8.395417 550.727
## 38982 -37.26930 -8.395417 550.983
## 38983 -37.26902 -8.395417 550.353
## 38984 -37.26875 -8.395417 549.458
## 38985 -37.26847 -8.395417 548.674
## 38986 -37.26819 -8.395417 548.454
## 38987 -37.26791 -8.395417 548.549
## 38988 -37.26763 -8.395417 548.673
## 38989 -37.26736 -8.395417 549.055
## 38990 -37.26708 -8.395417 549.335
## 38991 -37.26680 -8.395417 549.631
## 39023 -37.25791 -8.395417 552.563
## 39024 -37.25763 -8.395417 551.119
## 39025 -37.25736 -8.395417 550.798
## 39026 -37.25708 -8.395417 551.239
## 39027 -37.25680 -8.395417 552.069
## 39028 -37.25652 -8.395417 553.390
## 39029 -37.25625 -8.395417 554.650
## 39030 -37.25597 -8.395417 555.527
## 39031 -37.25569 -8.395417 556.481
## 39032 -37.25541 -8.395417 556.904
## 39033 -37.25513 -8.395417 557.114
## 39034 -37.25486 -8.395417 557.203
## 39035 -37.25458 -8.395417 557.390
## 39036 -37.25430 -8.395417 557.867
## 39037 -37.25402 -8.395417 558.988
## 39038 -37.25375 -8.395417 560.410
## 39039 -37.25347 -8.395417 561.895
## 39040 -37.25319 -8.395417 562.920
## 39041 -37.25291 -8.395417 563.745
## 39042 -37.25263 -8.395417 564.248
## 39043 -37.25236 -8.395417 564.622
## 39044 -37.25208 -8.395417 564.685
## 39045 -37.25180 -8.395417 564.377
## 39046 -37.25152 -8.395417 564.106
## 39047 -37.25125 -8.395417 563.688
## 39048 -37.25097 -8.395417 563.555
## 39049 -37.25069 -8.395417 563.487
## 39050 -37.25041 -8.395417 563.737
## 39051 -37.25013 -8.395417 564.054
## 39052 -37.24986 -8.395417 564.326
## 39053 -37.24958 -8.395417 564.583
## 39054 -37.24930 -8.395417 564.735
## 39055 -37.24902 -8.395417 564.925
## 39056 -37.24875 -8.395417 565.073
## 39057 -37.24847 -8.395417 565.312
## 39058 -37.24819 -8.395417 565.772
## 39059 -37.24791 -8.395417 566.193
## 39060 -37.24763 -8.395417 566.402
## 39061 -37.24736 -8.395417 566.233
## 39062 -37.24708 -8.395417 565.830
## 39063 -37.24680 -8.395417 565.195
## 39064 -37.24652 -8.395417 564.549
## 39065 -37.24625 -8.395417 563.979
## 39066 -37.24597 -8.395417 563.719
## 39067 -37.24569 -8.395417 563.992
## 39068 -37.24541 -8.395417 564.463
## 39069 -37.24513 -8.395417 564.878
## 39070 -37.24486 -8.395417 564.981
## 39071 -37.24458 -8.395417 564.835
## 39072 -37.24430 -8.395417 564.486
## 39073 -37.24402 -8.395417 563.963
## 39074 -37.24375 -8.395417 562.965
## 39075 -37.24347 -8.395417 561.487
## 39076 -37.24319 -8.395417 558.720
## 39077 -37.24291 -8.395417 556.194
## 39078 -37.24263 -8.395417 554.484
## 40231 -37.29875 -8.395694 536.895
## 40232 -37.29847 -8.395694 537.126
## 40233 -37.29819 -8.395694 537.846
## 40234 -37.29791 -8.395694 538.643
## 40235 -37.29763 -8.395694 539.304
## 40236 -37.29736 -8.395694 539.164
## 40237 -37.29708 -8.395694 538.930
## 40238 -37.29680 -8.395694 538.685
## 40239 -37.29652 -8.395694 538.930
## 40240 -37.29625 -8.395694 539.421
## 40241 -37.29597 -8.395694 539.927
## 40242 -37.29569 -8.395694 540.374
## 40243 -37.29541 -8.395694 540.856
## 40244 -37.29513 -8.395694 541.561
## 40245 -37.29486 -8.395694 542.892
## 40246 -37.29458 -8.395694 543.936
## 40247 -37.29430 -8.395694 544.608
## 40248 -37.29402 -8.395694 544.350
## 40249 -37.29375 -8.395694 543.700
## 40250 -37.29347 -8.395694 543.251
## 40251 -37.29319 -8.395694 542.760
## 40252 -37.29291 -8.395694 542.486
## 40253 -37.29263 -8.395694 541.863
## 40254 -37.29236 -8.395694 541.528
## 40255 -37.29208 -8.395694 541.631
## 40256 -37.29180 -8.395694 541.633
## 40257 -37.29152 -8.395694 541.852
## 40258 -37.29125 -8.395694 541.941
## 40259 -37.29097 -8.395694 542.643
## 40260 -37.29069 -8.395694 543.487
## 40261 -37.29041 -8.395694 544.125
## 40262 -37.29013 -8.395694 544.350
## 40263 -37.28986 -8.395694 544.424
## 40264 -37.28958 -8.395694 544.557
## 40265 -37.28930 -8.395694 544.609
## 40266 -37.28902 -8.395694 544.727
## 40267 -37.28875 -8.395694 544.926
## 40268 -37.28847 -8.395694 545.611
## 40269 -37.28819 -8.395694 546.235
## 40270 -37.28791 -8.395694 546.827
## 40271 -37.28763 -8.395694 547.097
## 40272 -37.28736 -8.395694 547.022
## 40273 -37.28708 -8.395694 546.914
## 40274 -37.28680 -8.395694 546.427
## 40275 -37.28652 -8.395694 546.418
## 40276 -37.28625 -8.395694 546.587
## 40277 -37.28597 -8.395694 547.437
## 40278 -37.28569 -8.395694 548.238
## 40279 -37.28541 -8.395694 548.973
## 40280 -37.28513 -8.395694 549.743
## 40281 -37.28486 -8.395694 550.773
## 40282 -37.28458 -8.395694 551.577
## 40283 -37.28430 -8.395694 551.906
## 40284 -37.28402 -8.395694 551.619
## 40285 -37.28375 -8.395694 551.521
## 40286 -37.28347 -8.395694 551.492
## 40287 -37.28319 -8.395694 552.314
## 40288 -37.28291 -8.395694 553.370
## 40289 -37.28263 -8.395694 554.594
## 40290 -37.28236 -8.395694 555.366
## 40291 -37.28208 -8.395694 556.050
## 40292 -37.28180 -8.395694 556.255
## 40293 -37.28152 -8.395694 556.256
## 40294 -37.28125 -8.395694 556.226
## 40295 -37.28097 -8.395694 556.364
## 40296 -37.28069 -8.395694 556.942
## 40297 -37.28041 -8.395694 557.567
## 40298 -37.28013 -8.395694 558.436
## 40299 -37.27986 -8.395694 558.828
## 40300 -37.27958 -8.395694 559.061
## 40301 -37.27930 -8.395694 558.879
## 40302 -37.27902 -8.395694 558.469
## 40303 -37.27875 -8.395694 558.227
## 40304 -37.27847 -8.395694 558.196
## 40305 -37.27819 -8.395694 558.380
## 40306 -37.27791 -8.395694 558.560
## 40307 -37.27763 -8.395694 558.547
## 40308 -37.27736 -8.395694 558.153
## 40309 -37.27708 -8.395694 557.693
## 40310 -37.27680 -8.395694 557.263
## 40311 -37.27652 -8.395694 557.204
## 40312 -37.27625 -8.395694 557.229
## 40313 -37.27597 -8.395694 557.529
## 40314 -37.27569 -8.395694 557.610
## 40315 -37.27541 -8.395694 557.718
## 40316 -37.27513 -8.395694 557.603
## 40317 -37.27486 -8.395694 557.563
## 40318 -37.27458 -8.395694 557.436
## 40319 -37.27430 -8.395694 557.083
## 40320 -37.27402 -8.395694 556.396
## 40321 -37.27375 -8.395694 555.339
## 40322 -37.27347 -8.395694 554.554
## 40323 -37.27319 -8.395694 553.446
## 40324 -37.27291 -8.395694 552.484
## 40325 -37.27263 -8.395694 551.354
## 40326 -37.27236 -8.395694 550.296
## 40327 -37.27208 -8.395694 549.718
## 40328 -37.27180 -8.395694 549.532
## 40329 -37.27152 -8.395694 549.521
## 40330 -37.27125 -8.395694 549.656
## 40331 -37.27097 -8.395694 549.917
## 40332 -37.27069 -8.395694 549.751
## 40333 -37.27041 -8.395694 549.745
## 40334 -37.27013 -8.395694 549.878
## 40335 -37.26986 -8.395694 550.579
## 40336 -37.26958 -8.395694 551.283
## 40337 -37.26930 -8.395694 551.689
## 40338 -37.26902 -8.395694 551.159
## 40339 -37.26875 -8.395694 550.204
## 40340 -37.26847 -8.395694 549.437
## 40341 -37.26819 -8.395694 549.113
## 40342 -37.26791 -8.395694 548.926
## 40343 -37.26763 -8.395694 548.760
## 40344 -37.26736 -8.395694 548.589
## 40345 -37.26708 -8.395694 548.622
## 40346 -37.26680 -8.395694 548.578
## 40347 -37.26652 -8.395694 548.680
## 40348 -37.26625 -8.395694 549.024
## 40377 -37.25819 -8.395694 554.048
## 40378 -37.25791 -8.395694 551.943
## 40379 -37.25763 -8.395694 550.781
## 40380 -37.25736 -8.395694 550.678
## 40381 -37.25708 -8.395694 551.370
## 40382 -37.25680 -8.395694 552.716
## 40383 -37.25652 -8.395694 553.475
## 40384 -37.25625 -8.395694 554.367
## 40385 -37.25597 -8.395694 554.712
## 40386 -37.25569 -8.395694 554.923
## 40387 -37.25541 -8.395694 555.355
## 40388 -37.25513 -8.395694 555.511
## 40389 -37.25486 -8.395694 555.799
## 40390 -37.25458 -8.395694 556.166
## 40391 -37.25430 -8.395694 557.091
## 40392 -37.25402 -8.395694 559.173
## 40393 -37.25375 -8.395694 560.747
## 40394 -37.25347 -8.395694 562.101
## 40395 -37.25319 -8.395694 563.231
## 40396 -37.25291 -8.395694 564.216
## 40397 -37.25263 -8.395694 565.058
## 40398 -37.25236 -8.395694 565.470
## 40399 -37.25208 -8.395694 565.568
## 40400 -37.25180 -8.395694 565.253
## 40401 -37.25152 -8.395694 564.742
## 40402 -37.25125 -8.395694 564.345
## 40403 -37.25097 -8.395694 563.916
## 40404 -37.25069 -8.395694 563.887
## 40405 -37.25041 -8.395694 564.047
## 40406 -37.25013 -8.395694 564.768
## 40407 -37.24986 -8.395694 565.380
## 40408 -37.24958 -8.395694 565.903
## 40409 -37.24930 -8.395694 566.146
## 40410 -37.24902 -8.395694 566.274
## 40411 -37.24875 -8.395694 566.381
## 40412 -37.24847 -8.395694 566.550
## 40413 -37.24819 -8.395694 566.906
## 40414 -37.24791 -8.395694 567.210
## 40415 -37.24763 -8.395694 567.354
## 40416 -37.24736 -8.395694 567.001
## 40417 -37.24708 -8.395694 566.423
## 40418 -37.24680 -8.395694 565.501
## 40419 -37.24652 -8.395694 564.620
## 40420 -37.24625 -8.395694 564.049
## 40421 -37.24597 -8.395694 564.039
## 40422 -37.24569 -8.395694 564.472
## 40423 -37.24541 -8.395694 564.906
## 40424 -37.24513 -8.395694 565.205
## 40425 -37.24486 -8.395694 565.152
## 40426 -37.24458 -8.395694 564.904
## 40427 -37.24430 -8.395694 564.208
## 40428 -37.24402 -8.395694 563.572
## 40429 -37.24375 -8.395694 562.767
## 40430 -37.24347 -8.395694 561.729
## 40431 -37.24319 -8.395694 559.628
## 40432 -37.24291 -8.395694 557.332
## 40433 -37.24263 -8.395694 555.426
## 40434 -37.24236 -8.395694 555.192
## 41581 -37.30013 -8.395972 538.432
## 41582 -37.29986 -8.395972 537.783
## 41583 -37.29958 -8.395972 537.075
## 41584 -37.29930 -8.395972 536.546
## 41585 -37.29902 -8.395972 536.475
## 41586 -37.29875 -8.395972 536.858
## 41587 -37.29847 -8.395972 537.499
## 41588 -37.29819 -8.395972 537.984
## 41589 -37.29791 -8.395972 538.521
## 41590 -37.29763 -8.395972 538.887
## 41591 -37.29736 -8.395972 539.376
## 41592 -37.29708 -8.395972 539.787
## 41593 -37.29680 -8.395972 539.958
## 41594 -37.29652 -8.395972 539.942
## 41595 -37.29625 -8.395972 540.005
## 41596 -37.29597 -8.395972 540.340
## 41597 -37.29569 -8.395972 541.068
## 41598 -37.29541 -8.395972 541.871
## 41599 -37.29513 -8.395972 542.885
## 41600 -37.29486 -8.395972 543.949
## 41601 -37.29458 -8.395972 544.824
## 41602 -37.29430 -8.395972 545.414
## 41603 -37.29402 -8.395972 545.463
## 41604 -37.29375 -8.395972 545.159
## 41605 -37.29347 -8.395972 544.857
## 41606 -37.29319 -8.395972 544.430
## 41607 -37.29291 -8.395972 544.109
## 41608 -37.29263 -8.395972 543.380
## 41609 -37.29236 -8.395972 542.618
## 41610 -37.29208 -8.395972 542.120
## 41611 -37.29180 -8.395972 541.914
## 41612 -37.29152 -8.395972 542.009
## 41613 -37.29125 -8.395972 542.060
## 41614 -37.29097 -8.395972 542.896
## 41615 -37.29069 -8.395972 543.345
## 41616 -37.29041 -8.395972 543.697
## 41617 -37.29013 -8.395972 543.661
## 41618 -37.28986 -8.395972 543.720
## 41619 -37.28958 -8.395972 543.883
## 41620 -37.28930 -8.395972 543.980
## 41621 -37.28902 -8.395972 544.046
## 41622 -37.28875 -8.395972 544.291
## 41623 -37.28847 -8.395972 544.959
## 41624 -37.28819 -8.395972 545.645
## 41625 -37.28791 -8.395972 546.285
## 41626 -37.28763 -8.395972 546.557
## 41627 -37.28736 -8.395972 546.533
## 41628 -37.28708 -8.395972 546.478
## 41629 -37.28680 -8.395972 546.264
## 41630 -37.28652 -8.395972 545.952
## 41631 -37.28625 -8.395972 546.028
## 41632 -37.28597 -8.395972 546.912
## 41633 -37.28569 -8.395972 548.631
## 41634 -37.28541 -8.395972 550.542
## 41635 -37.28513 -8.395972 552.148
## 41636 -37.28486 -8.395972 552.440
## 41637 -37.28458 -8.395972 552.666
## 41638 -37.28430 -8.395972 552.240
## 41639 -37.28402 -8.395972 552.233
## 41640 -37.28375 -8.395972 552.187
## 41641 -37.28347 -8.395972 552.099
## 41642 -37.28319 -8.395972 552.674
## 41643 -37.28291 -8.395972 553.451
## 41644 -37.28263 -8.395972 554.508
## 41645 -37.28236 -8.395972 555.587
## 41646 -37.28208 -8.395972 556.356
## 41647 -37.28180 -8.395972 556.590
## 41648 -37.28152 -8.395972 556.604
## 41649 -37.28125 -8.395972 556.602
## 41650 -37.28097 -8.395972 556.760
## 41651 -37.28069 -8.395972 557.124
## 41652 -37.28041 -8.395972 557.502
## 41653 -37.28013 -8.395972 558.260
## 41654 -37.27986 -8.395972 558.917
## 41655 -37.27958 -8.395972 559.435
## 41656 -37.27930 -8.395972 559.390
## 41657 -37.27902 -8.395972 559.368
## 41658 -37.27875 -8.395972 559.486
## 41659 -37.27847 -8.395972 559.661
## 41660 -37.27819 -8.395972 559.619
## 41661 -37.27791 -8.395972 559.404
## 41662 -37.27763 -8.395972 559.128
## 41663 -37.27736 -8.395972 558.940
## 41664 -37.27708 -8.395972 558.544
## 41665 -37.27680 -8.395972 558.445
## 41666 -37.27652 -8.395972 558.200
## 41667 -37.27625 -8.395972 558.174
## 41668 -37.27597 -8.395972 558.433
## 41669 -37.27569 -8.395972 558.916
## 41670 -37.27541 -8.395972 559.517
## 41671 -37.27513 -8.395972 559.704
## 41672 -37.27486 -8.395972 559.675
## 41673 -37.27458 -8.395972 559.537
## 41674 -37.27430 -8.395972 559.261
## 41675 -37.27402 -8.395972 558.554
## 41676 -37.27375 -8.395972 557.457
## 41677 -37.27347 -8.395972 556.602
## 41678 -37.27319 -8.395972 555.179
## 41679 -37.27291 -8.395972 553.791
## 41680 -37.27263 -8.395972 552.204
## 41681 -37.27236 -8.395972 551.471
## 41682 -37.27208 -8.395972 550.999
## 41683 -37.27180 -8.395972 550.914
## 41684 -37.27152 -8.395972 550.472
## 41685 -37.27125 -8.395972 550.059
## 41686 -37.27097 -8.395972 549.988
## 41687 -37.27069 -8.395972 549.969
## 41688 -37.27041 -8.395972 550.081
## 41689 -37.27013 -8.395972 550.460
## 41690 -37.26986 -8.395972 551.235
## 41691 -37.26958 -8.395972 552.066
## 41692 -37.26930 -8.395972 552.543
## 41693 -37.26902 -8.395972 552.132
## 41694 -37.26875 -8.395972 551.291
## 41695 -37.26847 -8.395972 550.479
## 41696 -37.26819 -8.395972 549.915
## 41697 -37.26791 -8.395972 549.388
## 41698 -37.26763 -8.395972 548.952
## 41699 -37.26736 -8.395972 548.419
## 41700 -37.26708 -8.395972 548.017
## 41701 -37.26680 -8.395972 547.724
## 41702 -37.26652 -8.395972 547.746
## 41703 -37.26625 -8.395972 548.044
## 41704 -37.26597 -8.395972 548.738
## 41705 -37.26569 -8.395972 549.727
## 41731 -37.25847 -8.395972 555.564
## 41732 -37.25819 -8.395972 553.216
## 41733 -37.25791 -8.395972 551.487
## 41734 -37.25763 -8.395972 550.549
## 41735 -37.25736 -8.395972 550.802
## 41736 -37.25708 -8.395972 551.642
## 41737 -37.25680 -8.395972 553.144
## 41738 -37.25652 -8.395972 553.727
## 41739 -37.25625 -8.395972 554.157
## 41740 -37.25597 -8.395972 554.041
## 41741 -37.25569 -8.395972 554.364
## 41742 -37.25541 -8.395972 554.851
## 41743 -37.25513 -8.395972 554.792
## 41744 -37.25486 -8.395972 555.532
## 41745 -37.25458 -8.395972 556.230
## 41746 -37.25430 -8.395972 557.793
## 41747 -37.25402 -8.395972 559.590
## 41748 -37.25375 -8.395972 560.588
## 41749 -37.25347 -8.395972 561.744
## 41750 -37.25319 -8.395972 563.083
## 41751 -37.25291 -8.395972 564.287
## 41752 -37.25263 -8.395972 565.265
## 41753 -37.25236 -8.395972 565.846
## 41754 -37.25208 -8.395972 566.183
## 41755 -37.25180 -8.395972 565.961
## 41756 -37.25152 -8.395972 565.538
## 41757 -37.25125 -8.395972 565.261
## 41758 -37.25097 -8.395972 564.921
## 41759 -37.25069 -8.395972 564.598
## 41760 -37.25041 -8.395972 564.354
## 41761 -37.25013 -8.395972 564.822
## 41762 -37.24986 -8.395972 566.067
## 41763 -37.24958 -8.395972 567.162
## 41764 -37.24930 -8.395972 567.807
## 41765 -37.24902 -8.395972 567.710
## 41766 -37.24875 -8.395972 567.609
## 41767 -37.24847 -8.395972 567.698
## 41768 -37.24819 -8.395972 567.975
## 41769 -37.24791 -8.395972 568.120
## 41770 -37.24763 -8.395972 568.209
## 41771 -37.24736 -8.395972 567.666
## 41772 -37.24708 -8.395972 566.986
## 41773 -37.24680 -8.395972 565.785
## 41774 -37.24652 -8.395972 565.022
## 41775 -37.24625 -8.395972 564.745
## 41776 -37.24597 -8.395972 564.828
## 41777 -37.24569 -8.395972 565.286
## 41778 -37.24541 -8.395972 565.776
## 41779 -37.24513 -8.395972 566.138
## 41780 -37.24486 -8.395972 565.680
## 41781 -37.24458 -8.395972 564.967
## 41782 -37.24430 -8.395972 564.220
## 41783 -37.24402 -8.395972 563.595
## 41784 -37.24375 -8.395972 562.795
## 41785 -37.24347 -8.395972 561.754
## 41786 -37.24319 -8.395972 560.608
## 41787 -37.24291 -8.395972 559.514
## 41788 -37.24263 -8.395972 558.216
## 41789 -37.24236 -8.395972 556.828
## 41790 -37.24208 -8.395972 556.101
## 42931 -37.30152 -8.396250 539.235
## 42932 -37.30125 -8.396250 539.270
## 42933 -37.30097 -8.396250 539.268
## 42934 -37.30069 -8.396250 538.901
## 42935 -37.30041 -8.396250 538.420
## 42936 -37.30013 -8.396250 537.836
## 42937 -37.29986 -8.396250 537.178
## 42938 -37.29958 -8.396250 536.647
## 42939 -37.29930 -8.396250 536.320
## 42940 -37.29902 -8.396250 536.737
## 42941 -37.29875 -8.396250 537.336
## 42942 -37.29847 -8.396250 538.024
## 42943 -37.29819 -8.396250 538.768
## 42944 -37.29791 -8.396250 539.432
## 42945 -37.29763 -8.396250 540.069
## 42946 -37.29736 -8.396250 540.769
## 42947 -37.29708 -8.396250 541.357
## 42948 -37.29680 -8.396250 541.702
## 42949 -37.29652 -8.396250 541.872
## 42950 -37.29625 -8.396250 541.927
## 42951 -37.29597 -8.396250 542.279
## 42952 -37.29569 -8.396250 542.733
## 42953 -37.29541 -8.396250 543.523
## 42954 -37.29513 -8.396250 544.485
## 42955 -37.29486 -8.396250 545.320
## 42956 -37.29458 -8.396250 546.070
## 42957 -37.29430 -8.396250 546.570
## 42958 -37.29402 -8.396250 546.573
## 42959 -37.29375 -8.396250 546.401
## 42960 -37.29347 -8.396250 545.991
## 42961 -37.29319 -8.396250 546.002
## 42962 -37.29291 -8.396250 545.803
## 42963 -37.29263 -8.396250 545.405
## 42964 -37.29236 -8.396250 544.737
## 42965 -37.29208 -8.396250 544.024
## 42966 -37.29180 -8.396250 543.725
## 42967 -37.29152 -8.396250 543.178
## 42968 -37.29125 -8.396250 543.073
## 42969 -37.29097 -8.396250 543.283
## 42970 -37.29069 -8.396250 543.233
## 42971 -37.29041 -8.396250 543.368
## 42972 -37.29013 -8.396250 543.498
## 42973 -37.28986 -8.396250 543.680
## 42974 -37.28958 -8.396250 543.846
## 42975 -37.28930 -8.396250 543.963
## 42976 -37.28902 -8.396250 544.057
## 42977 -37.28875 -8.396250 544.219
## 42978 -37.28847 -8.396250 544.661
## 42979 -37.28819 -8.396250 545.307
## 42980 -37.28791 -8.396250 546.048
## 42981 -37.28763 -8.396250 546.590
## 42982 -37.28736 -8.396250 546.741
## 42983 -37.28708 -8.396250 546.674
## 42984 -37.28680 -8.396250 546.504
## 42985 -37.28652 -8.396250 546.272
## 42986 -37.28625 -8.396250 546.450
## 42987 -37.28597 -8.396250 547.283
## 42988 -37.28569 -8.396250 549.312
## 42989 -37.28541 -8.396250 551.509
## 42990 -37.28513 -8.396250 553.221
## 42991 -37.28486 -8.396250 553.649
## 42992 -37.28458 -8.396250 553.514
## 42993 -37.28430 -8.396250 553.197
## 42994 -37.28402 -8.396250 552.983
## 42995 -37.28375 -8.396250 552.899
## 42996 -37.28347 -8.396250 552.948
## 42997 -37.28319 -8.396250 553.340
## 42998 -37.28291 -8.396250 553.898
## 42999 -37.28263 -8.396250 554.645
## 43000 -37.28236 -8.396250 555.511
## 43001 -37.28208 -8.396250 556.287
## 43002 -37.28180 -8.396250 556.795
## 43003 -37.28152 -8.396250 556.781
## 43004 -37.28125 -8.396250 556.656
## 43005 -37.28097 -8.396250 556.700
## 43006 -37.28069 -8.396250 556.733
## 43007 -37.28041 -8.396250 557.086
## 43008 -37.28013 -8.396250 557.638
## 43009 -37.27986 -8.396250 558.327
## 43010 -37.27958 -8.396250 559.057
## 43011 -37.27930 -8.396250 559.485
## 43012 -37.27902 -8.396250 560.234
## 43013 -37.27875 -8.396250 560.595
## 43014 -37.27847 -8.396250 560.819
## 43015 -37.27819 -8.396250 560.592
## 43016 -37.27791 -8.396250 560.294
## 43017 -37.27763 -8.396250 559.962
## 43018 -37.27736 -8.396250 559.699
## 43019 -37.27708 -8.396250 559.465
## 43020 -37.27680 -8.396250 559.284
## 43021 -37.27652 -8.396250 559.036
## 43022 -37.27625 -8.396250 559.007
## 43023 -37.27597 -8.396250 559.179
## 43024 -37.27569 -8.396250 560.040
## 43025 -37.27541 -8.396250 560.910
## 43026 -37.27513 -8.396250 561.611
## 43027 -37.27486 -8.396250 561.943
## 43028 -37.27458 -8.396250 561.900
## 43029 -37.27430 -8.396250 561.580
## 43030 -37.27402 -8.396250 560.599
## 43031 -37.27375 -8.396250 559.439
## 43032 -37.27347 -8.396250 558.172
## 43033 -37.27319 -8.396250 556.562
## 43034 -37.27291 -8.396250 555.122
## 43035 -37.27263 -8.396250 553.951
## 43036 -37.27236 -8.396250 553.371
## 43037 -37.27208 -8.396250 552.978
## 43038 -37.27180 -8.396250 552.605
## 43039 -37.27152 -8.396250 551.853
## 43040 -37.27125 -8.396250 551.182
## 43041 -37.27097 -8.396250 550.598
## 43042 -37.27069 -8.396250 550.519
## 43043 -37.27041 -8.396250 550.678
## 43044 -37.27013 -8.396250 551.199
## 43045 -37.26986 -8.396250 552.173
## 43046 -37.26958 -8.396250 553.107
## 43047 -37.26930 -8.396250 553.662
## 43048 -37.26902 -8.396250 553.334
## 43049 -37.26875 -8.396250 552.521
## 43050 -37.26847 -8.396250 551.575
## 43051 -37.26819 -8.396250 550.707
## 43052 -37.26791 -8.396250 549.943
## 43053 -37.26763 -8.396250 549.131
## 43054 -37.26736 -8.396250 548.465
## 43055 -37.26708 -8.396250 547.844
## 43056 -37.26680 -8.396250 547.419
## 43057 -37.26652 -8.396250 547.335
## 43058 -37.26625 -8.396250 547.571
## 43059 -37.26597 -8.396250 548.159
## 43060 -37.26569 -8.396250 549.344
## 43061 -37.26541 -8.396250 550.642
## 43086 -37.25847 -8.396250 554.216
## 43087 -37.25819 -8.396250 552.358
## 43088 -37.25791 -8.396250 551.093
## 43089 -37.25763 -8.396250 550.647
## 43090 -37.25736 -8.396250 551.236
## 43091 -37.25708 -8.396250 552.309
## 43092 -37.25680 -8.396250 553.386
## 43093 -37.25652 -8.396250 554.116
## 43094 -37.25625 -8.396250 554.599
## 43095 -37.25597 -8.396250 554.501
## 43096 -37.25569 -8.396250 555.232
## 43097 -37.25541 -8.396250 555.605
## 43098 -37.25513 -8.396250 556.100
## 43099 -37.25486 -8.396250 556.977
## 43100 -37.25458 -8.396250 557.983
## 43101 -37.25430 -8.396250 558.878
## 43102 -37.25402 -8.396250 559.819
## 43103 -37.25375 -8.396250 560.565
## 43104 -37.25347 -8.396250 561.538
## 43105 -37.25319 -8.396250 562.692
## 43106 -37.25291 -8.396250 563.949
## 43107 -37.25263 -8.396250 564.904
## 43108 -37.25236 -8.396250 565.895
## 43109 -37.25208 -8.396250 566.433
## 43110 -37.25180 -8.396250 566.468
## 43111 -37.25152 -8.396250 566.594
## 43112 -37.25125 -8.396250 566.356
## 43113 -37.25097 -8.396250 566.177
## 43114 -37.25069 -8.396250 565.476
## 43115 -37.25041 -8.396250 565.203
## 43116 -37.25013 -8.396250 565.498
## 43117 -37.24986 -8.396250 566.652
## 43118 -37.24958 -8.396250 567.966
## 43119 -37.24930 -8.396250 568.834
## 43120 -37.24902 -8.396250 569.011
## 43121 -37.24875 -8.396250 568.865
## 43122 -37.24847 -8.396250 568.820
## 43123 -37.24819 -8.396250 568.880
## 43124 -37.24791 -8.396250 568.995
## 43125 -37.24763 -8.396250 568.846
## 43126 -37.24736 -8.396250 568.194
## 43127 -37.24708 -8.396250 567.362
## 43128 -37.24680 -8.396250 566.367
## 43129 -37.24652 -8.396250 566.046
## 43130 -37.24625 -8.396250 565.821
## 43131 -37.24597 -8.396250 565.921
## 43132 -37.24569 -8.396250 566.426
## 43133 -37.24541 -8.396250 566.910
## 43134 -37.24513 -8.396250 567.034
## 43135 -37.24486 -8.396250 566.384
## 43136 -37.24458 -8.396250 565.455
## 43137 -37.24430 -8.396250 564.569
## 43138 -37.24402 -8.396250 563.963
## 43139 -37.24375 -8.396250 563.395
## 43140 -37.24347 -8.396250 562.708
## 43141 -37.24319 -8.396250 562.103
## 43142 -37.24291 -8.396250 561.253
## 43143 -37.24263 -8.396250 560.114
## 43144 -37.24236 -8.396250 558.580
## 43145 -37.24208 -8.396250 557.142
## 43146 -37.24180 -8.396250 556.351
## 44281 -37.30291 -8.396528 540.477
## 44282 -37.30263 -8.396528 540.041
## 44283 -37.30236 -8.396528 539.394
## 44284 -37.30208 -8.396528 538.847
## 44285 -37.30180 -8.396528 538.457
## 44286 -37.30152 -8.396528 538.548
## 44287 -37.30125 -8.396528 538.736
## 44288 -37.30097 -8.396528 538.938
## 44289 -37.30069 -8.396528 538.749
## 44290 -37.30041 -8.396528 538.340
## 44291 -37.30013 -8.396528 537.686
## 44292 -37.29986 -8.396528 537.148
## 44293 -37.29958 -8.396528 536.742
## 44294 -37.29930 -8.396528 536.885
## 44295 -37.29902 -8.396528 537.508
## 44296 -37.29875 -8.396528 538.277
## 44297 -37.29847 -8.396528 539.137
## 44298 -37.29819 -8.396528 540.016
## 44299 -37.29791 -8.396528 540.844
## 44300 -37.29763 -8.396528 541.681
## 44301 -37.29736 -8.396528 542.573
## 44302 -37.29708 -8.396528 543.319
## 44303 -37.29680 -8.396528 543.895
## 44304 -37.29652 -8.396528 544.060
## 44305 -37.29625 -8.396528 544.107
## 44306 -37.29597 -8.396528 544.217
## 44307 -37.29569 -8.396528 544.739
## 44308 -37.29541 -8.396528 545.458
## 44309 -37.29513 -8.396528 546.259
## 44310 -37.29486 -8.396528 546.841
## 44311 -37.29458 -8.396528 547.405
## 44312 -37.29430 -8.396528 547.643
## 44313 -37.29402 -8.396528 547.641
## 44314 -37.29375 -8.396528 547.534
## 44315 -37.29347 -8.396528 547.354
## 44316 -37.29319 -8.396528 547.460
## 44317 -37.29291 -8.396528 547.422
## 44318 -37.29263 -8.396528 547.548
## 44319 -37.29236 -8.396528 547.055
## 44320 -37.29208 -8.396528 546.323
## 44321 -37.29180 -8.396528 545.359
## 44322 -37.29152 -8.396528 544.794
## 44323 -37.29125 -8.396528 544.496
## 44324 -37.29097 -8.396528 543.826
## 44325 -37.29069 -8.396528 543.508
## 44326 -37.29041 -8.396528 543.483
## 44327 -37.29013 -8.396528 543.863
## 44328 -37.28986 -8.396528 544.160
## 44329 -37.28958 -8.396528 544.264
## 44330 -37.28930 -8.396528 544.454
## 44331 -37.28902 -8.396528 544.546
## 44332 -37.28875 -8.396528 544.619
## 44333 -37.28847 -8.396528 544.684
## 44334 -37.28819 -8.396528 545.381
## 44335 -37.28791 -8.396528 546.228
## 44336 -37.28763 -8.396528 547.054
## 44337 -37.28736 -8.396528 547.397
## 44338 -37.28708 -8.396528 547.320
## 44339 -37.28680 -8.396528 547.175
## 44340 -37.28652 -8.396528 547.024
## 44341 -37.28625 -8.396528 547.135
## 44342 -37.28597 -8.396528 547.947
## 44343 -37.28569 -8.396528 549.953
## 44344 -37.28541 -8.396528 552.124
## 44345 -37.28513 -8.396528 554.018
## 44346 -37.28486 -8.396528 554.380
## 44347 -37.28458 -8.396528 554.233
## 44348 -37.28430 -8.396528 553.786
## 44349 -37.28402 -8.396528 553.625
## 44350 -37.28375 -8.396528 553.588
## 44351 -37.28347 -8.396528 553.850
## 44352 -37.28319 -8.396528 554.048
## 44353 -37.28291 -8.396528 554.383
## 44354 -37.28263 -8.396528 554.720
## 44355 -37.28236 -8.396528 555.345
## 44356 -37.28208 -8.396528 556.029
## 44357 -37.28180 -8.396528 556.816
## 44358 -37.28152 -8.396528 556.808
## 44359 -37.28125 -8.396528 556.521
## 44360 -37.28097 -8.396528 556.322
## 44361 -37.28069 -8.396528 556.305
## 44362 -37.28041 -8.396528 556.628
## 44363 -37.28013 -8.396528 556.976
## 44364 -37.27986 -8.396528 557.692
## 44365 -37.27958 -8.396528 558.680
## 44366 -37.27930 -8.396528 559.892
## 44367 -37.27902 -8.396528 561.001
## 44368 -37.27875 -8.396528 561.599
## 44369 -37.27847 -8.396528 561.665
## 44370 -37.27819 -8.396528 561.396
## 44371 -37.27791 -8.396528 561.106
## 44372 -37.27763 -8.396528 560.771
## 44373 -37.27736 -8.396528 560.540
## 44374 -37.27708 -8.396528 560.510
## 44375 -37.27680 -8.396528 560.267
## 44376 -37.27652 -8.396528 560.112
## 44377 -37.27625 -8.396528 560.127
## 44378 -37.27597 -8.396528 560.355
## 44379 -37.27569 -8.396528 561.320
## 44380 -37.27541 -8.396528 562.352
## 44381 -37.27513 -8.396528 563.561
## 44382 -37.27486 -8.396528 564.157
## 44383 -37.27458 -8.396528 564.210
## 44384 -37.27430 -8.396528 563.497
## 44385 -37.27402 -8.396528 562.500
## 44386 -37.27375 -8.396528 561.238
## 44387 -37.27347 -8.396528 559.484
## 44388 -37.27319 -8.396528 557.989
## 44389 -37.27291 -8.396528 556.707
## 44390 -37.27263 -8.396528 555.937
## 44391 -37.27236 -8.396528 555.678
## 44392 -37.27208 -8.396528 555.178
## 44393 -37.27180 -8.396528 554.547
## 44394 -37.27152 -8.396528 553.545
## 44395 -37.27125 -8.396528 552.628
## 44396 -37.27097 -8.396528 551.622
## 44397 -37.27069 -8.396528 551.236
## 44398 -37.27041 -8.396528 551.226
## 44399 -37.27013 -8.396528 551.919
## 44400 -37.26986 -8.396528 552.986
## 44401 -37.26958 -8.396528 554.026
## 44402 -37.26930 -8.396528 554.693
## 44403 -37.26902 -8.396528 554.385
## 44404 -37.26875 -8.396528 553.577
## 44405 -37.26847 -8.396528 552.536
## 44406 -37.26819 -8.396528 551.516
## 44407 -37.26791 -8.396528 550.582
## 44408 -37.26763 -8.396528 549.690
## 44409 -37.26736 -8.396528 548.795
## 44410 -37.26708 -8.396528 548.070
## 44411 -37.26680 -8.396528 547.573
## 44412 -37.26652 -8.396528 547.388
## 44413 -37.26625 -8.396528 547.480
## 44414 -37.26597 -8.396528 548.007
## 44415 -37.26569 -8.396528 549.110
## 44416 -37.26541 -8.396528 550.283
## 44417 -37.26513 -8.396528 551.367
## 44418 -37.26486 -8.396528 551.887
## 44440 -37.25875 -8.396528 554.826
## 44441 -37.25847 -8.396528 553.033
## 44442 -37.25819 -8.396528 551.749
## 44443 -37.25791 -8.396528 551.016
## 44444 -37.25763 -8.396528 551.043
## 44445 -37.25736 -8.396528 552.034
## 44446 -37.25708 -8.396528 553.324
## 44447 -37.25680 -8.396528 554.111
## 44448 -37.25652 -8.396528 554.923
## 44449 -37.25625 -8.396528 555.539
## 44450 -37.25597 -8.396528 556.204
## 44451 -37.25569 -8.396528 556.700
## 44452 -37.25541 -8.396528 556.931
## 44453 -37.25513 -8.396528 557.795
## 44454 -37.25486 -8.396528 558.736
## 44455 -37.25458 -8.396528 559.747
## 44456 -37.25430 -8.396528 560.213
## 44457 -37.25402 -8.396528 559.961
## 44458 -37.25375 -8.396528 560.387
## 44459 -37.25347 -8.396528 561.156
## 44460 -37.25319 -8.396528 562.419
## 44461 -37.25291 -8.396528 563.730
## 44462 -37.25263 -8.396528 564.913
## 44463 -37.25236 -8.396528 565.956
## 44464 -37.25208 -8.396528 566.608
## 44465 -37.25180 -8.396528 567.284
## 44466 -37.25152 -8.396528 567.568
## 44467 -37.25125 -8.396528 567.440
## 44468 -37.25097 -8.396528 566.997
## 44469 -37.25069 -8.396528 566.431
## 44470 -37.25041 -8.396528 566.195
## 44471 -37.25013 -8.396528 566.163
## 44472 -37.24986 -8.396528 567.229
## 44473 -37.24958 -8.396528 568.505
## 44474 -37.24930 -8.396528 569.823
## 44475 -37.24902 -8.396528 570.073
## 44476 -37.24875 -8.396528 569.884
## 44477 -37.24847 -8.396528 569.500
## 44478 -37.24819 -8.396528 569.704
## 44479 -37.24791 -8.396528 569.880
## 44480 -37.24763 -8.396528 569.564
## 44481 -37.24736 -8.396528 568.867
## 44482 -37.24708 -8.396528 567.907
## 44483 -37.24680 -8.396528 567.539
## 44484 -37.24652 -8.396528 567.292
## 44485 -37.24625 -8.396528 567.096
## 44486 -37.24597 -8.396528 567.189
## 44487 -37.24569 -8.396528 567.598
## 44488 -37.24541 -8.396528 567.993
## 44489 -37.24513 -8.396528 567.978
## 44490 -37.24486 -8.396528 567.117
## 44491 -37.24458 -8.396528 566.209
## 44492 -37.24430 -8.396528 565.084
## 44493 -37.24402 -8.396528 564.583
## 44494 -37.24375 -8.396528 564.212
## 44495 -37.24347 -8.396528 564.030
## 44496 -37.24319 -8.396528 563.554
## 44497 -37.24291 -8.396528 562.748
## 44498 -37.24263 -8.396528 561.938
## 44499 -37.24236 -8.396528 560.160
## 44500 -37.24208 -8.396528 558.396
## 44501 -37.24180 -8.396528 556.220
## 44502 -37.24152 -8.396528 554.876
## 44503 -37.24125 -8.396528 554.333
## 45632 -37.30402 -8.396806 538.629
## 45633 -37.30375 -8.396806 539.073
## 45634 -37.30347 -8.396806 539.660
## 45635 -37.30319 -8.396806 539.808
## 45636 -37.30291 -8.396806 539.645
## 45637 -37.30263 -8.396806 539.026
## 45638 -37.30236 -8.396806 538.517
## 45639 -37.30208 -8.396806 538.223
## 45640 -37.30180 -8.396806 538.069
## 45641 -37.30152 -8.396806 538.127
## 45642 -37.30125 -8.396806 538.355
## 45643 -37.30097 -8.396806 538.802
## 45644 -37.30069 -8.396806 538.950
## 45645 -37.30041 -8.396806 538.813
## 45646 -37.30013 -8.396806 538.324
## 45647 -37.29986 -8.396806 537.901
## 45648 -37.29958 -8.396806 537.679
## 45649 -37.29930 -8.396806 537.950
## 45650 -37.29902 -8.396806 538.646
## 45651 -37.29875 -8.396806 539.623
## 45652 -37.29847 -8.396806 540.546
## 45653 -37.29819 -8.396806 541.550
## 45654 -37.29791 -8.396806 542.416
## 45655 -37.29763 -8.396806 543.308
## 45656 -37.29736 -8.396806 544.176
## 45657 -37.29708 -8.396806 544.877
## 45658 -37.29680 -8.396806 545.348
## 45659 -37.29652 -8.396806 545.729
## 45660 -37.29625 -8.396806 545.914
## 45661 -37.29597 -8.396806 545.996
## 45662 -37.29569 -8.396806 546.498
## 45663 -37.29541 -8.396806 547.376
## 45664 -37.29513 -8.396806 548.125
## 45665 -37.29486 -8.396806 548.389
## 45666 -37.29458 -8.396806 548.508
## 45667 -37.29430 -8.396806 548.469
## 45668 -37.29402 -8.396806 548.620
## 45669 -37.29375 -8.396806 548.631
## 45670 -37.29347 -8.396806 548.554
## 45671 -37.29319 -8.396806 548.664
## 45672 -37.29291 -8.396806 548.742
## 45673 -37.29263 -8.396806 548.979
## 45674 -37.29236 -8.396806 548.614
## 45675 -37.29208 -8.396806 548.123
## 45676 -37.29180 -8.396806 547.449
## 45677 -37.29152 -8.396806 546.391
## 45678 -37.29125 -8.396806 545.719
## 45679 -37.29097 -8.396806 544.702
## 45680 -37.29069 -8.396806 544.506
## 45681 -37.29041 -8.396806 544.598
## 45682 -37.29013 -8.396806 544.991
## 45683 -37.28986 -8.396806 545.161
## 45684 -37.28958 -8.396806 545.164
## 45685 -37.28930 -8.396806 545.292
## 45686 -37.28902 -8.396806 545.312
## 45687 -37.28875 -8.396806 545.327
## 45688 -37.28847 -8.396806 545.263
## 45689 -37.28819 -8.396806 546.032
## 45690 -37.28791 -8.396806 546.888
## 45691 -37.28763 -8.396806 547.890
## 45692 -37.28736 -8.396806 548.273
## 45693 -37.28708 -8.396806 548.302
## 45694 -37.28680 -8.396806 548.136
## 45695 -37.28652 -8.396806 547.929
## 45696 -37.28625 -8.396806 548.071
## 45697 -37.28597 -8.396806 548.720
## 45698 -37.28569 -8.396806 550.157
## 45699 -37.28541 -8.396806 552.026
## 45700 -37.28513 -8.396806 553.746
## 45701 -37.28486 -8.396806 554.228
## 45702 -37.28458 -8.396806 554.296
## 45703 -37.28430 -8.396806 553.924
## 45704 -37.28402 -8.396806 554.008
## 45705 -37.28375 -8.396806 554.210
## 45706 -37.28347 -8.396806 554.578
## 45707 -37.28319 -8.396806 554.595
## 45708 -37.28291 -8.396806 554.608
## 45709 -37.28263 -8.396806 554.778
## 45710 -37.28236 -8.396806 555.221
## 45711 -37.28208 -8.396806 555.747
## 45712 -37.28180 -8.396806 556.322
## 45713 -37.28152 -8.396806 556.608
## 45714 -37.28125 -8.396806 556.877
## 45715 -37.28097 -8.396806 556.847
## 45716 -37.28069 -8.396806 556.363
## 45717 -37.28041 -8.396806 556.305
## 45718 -37.28013 -8.396806 556.294
## 45719 -37.27986 -8.396806 557.601
## 45720 -37.27958 -8.396806 558.992
## 45721 -37.27930 -8.396806 560.933
## 45722 -37.27902 -8.396806 561.718
## 45723 -37.27875 -8.396806 562.058
## 45724 -37.27847 -8.396806 562.177
## 45725 -37.27819 -8.396806 562.047
## 45726 -37.27791 -8.396806 561.859
## 45727 -37.27763 -8.396806 561.611
## 45728 -37.27736 -8.396806 561.641
## 45729 -37.27708 -8.396806 561.836
## 45730 -37.27680 -8.396806 561.905
## 45731 -37.27652 -8.396806 561.919
## 45732 -37.27625 -8.396806 562.017
## 45733 -37.27597 -8.396806 562.240
## 45734 -37.27569 -8.396806 563.146
## 45735 -37.27541 -8.396806 564.219
## 45736 -37.27513 -8.396806 565.434
## 45737 -37.27486 -8.396806 566.067
## 45738 -37.27458 -8.396806 566.137
## 45739 -37.27430 -8.396806 565.702
## 45740 -37.27402 -8.396806 564.242
## 45741 -37.27375 -8.396806 562.547
## 45742 -37.27347 -8.396806 560.529
## 45743 -37.27319 -8.396806 559.774
## 45744 -37.27291 -8.396806 559.233
## 45745 -37.27263 -8.396806 558.905
## 45746 -37.27236 -8.396806 558.297
## 45747 -37.27208 -8.396806 557.642
## 45748 -37.27180 -8.396806 556.607
## 45749 -37.27152 -8.396806 555.546
## 45750 -37.27125 -8.396806 554.150
## 45751 -37.27097 -8.396806 552.863
## 45752 -37.27069 -8.396806 552.131
## 45753 -37.27041 -8.396806 551.724
## 45754 -37.27013 -8.396806 552.180
## 45755 -37.26986 -8.396806 553.222
## 45756 -37.26958 -8.396806 554.331
## 45757 -37.26930 -8.396806 555.152
## 45758 -37.26902 -8.396806 554.896
## 45759 -37.26875 -8.396806 554.395
## 45760 -37.26847 -8.396806 553.449
## 45761 -37.26819 -8.396806 552.214
## 45762 -37.26791 -8.396806 551.282
## 45763 -37.26763 -8.396806 550.154
## 45764 -37.26736 -8.396806 549.384
## 45765 -37.26708 -8.396806 548.847
## 45766 -37.26680 -8.396806 548.274
## 45767 -37.26652 -8.396806 547.987
## 45768 -37.26625 -8.396806 547.969
## 45769 -37.26597 -8.396806 548.296
## 45770 -37.26569 -8.396806 549.042
## 45771 -37.26541 -8.396806 549.797
## 45772 -37.26513 -8.396806 550.624
## 45773 -37.26486 -8.396806 550.849
## 45774 -37.26458 -8.396806 550.956
## 45795 -37.25875 -8.396806 553.694
## 45796 -37.25847 -8.396806 552.363
## 45797 -37.25819 -8.396806 551.727
## 45798 -37.25791 -8.396806 551.533
## 45799 -37.25763 -8.396806 552.074
## 45800 -37.25736 -8.396806 553.255
## 45801 -37.25708 -8.396806 554.789
## 45802 -37.25680 -8.396806 555.594
## 45803 -37.25652 -8.396806 556.461
## 45804 -37.25625 -8.396806 557.050
## 45805 -37.25597 -8.396806 557.544
## 45806 -37.25569 -8.396806 558.073
## 45807 -37.25541 -8.396806 558.333
## 45808 -37.25513 -8.396806 559.398
## 45809 -37.25486 -8.396806 559.586
## 45810 -37.25458 -8.396806 560.117
## 45811 -37.25430 -8.396806 560.032
## 45812 -37.25402 -8.396806 559.848
## 45813 -37.25375 -8.396806 560.662
## 45814 -37.25347 -8.396806 561.320
## 45815 -37.25319 -8.396806 562.663
## 45816 -37.25291 -8.396806 564.251
## 45817 -37.25263 -8.396806 565.722
## 45818 -37.25236 -8.396806 566.550
## 45819 -37.25208 -8.396806 566.880
## 45820 -37.25180 -8.396806 567.633
## 45821 -37.25152 -8.396806 568.028
## 45822 -37.25125 -8.396806 568.114
## 45823 -37.25097 -8.396806 567.765
## 45824 -37.25069 -8.396806 567.354
## 45825 -37.25041 -8.396806 567.183
## 45826 -37.25013 -8.396806 567.189
## 45827 -37.24986 -8.396806 568.067
## 45828 -37.24958 -8.396806 569.118
## 45829 -37.24930 -8.396806 570.452
## 45830 -37.24902 -8.396806 570.628
## 45831 -37.24875 -8.396806 570.498
## 45832 -37.24847 -8.396806 570.152
## 45833 -37.24819 -8.396806 570.510
## 45834 -37.24791 -8.396806 570.973
## 45835 -37.24763 -8.396806 570.711
## 45836 -37.24736 -8.396806 570.072
## 45837 -37.24708 -8.396806 569.176
## 45838 -37.24680 -8.396806 568.721
## 45839 -37.24652 -8.396806 568.492
## 45840 -37.24625 -8.396806 568.266
## 45841 -37.24597 -8.396806 568.418
## 45842 -37.24569 -8.396806 568.413
## 45843 -37.24541 -8.396806 568.349
## 45844 -37.24513 -8.396806 568.014
## 45845 -37.24486 -8.396806 567.481
## 45846 -37.24458 -8.396806 566.877
## 45847 -37.24430 -8.396806 566.020
## 45848 -37.24402 -8.396806 565.485
## 45849 -37.24375 -8.396806 565.117
## 45850 -37.24347 -8.396806 564.968
## 45851 -37.24319 -8.396806 564.414
## 45852 -37.24291 -8.396806 563.635
## 45853 -37.24263 -8.396806 562.788
## 45854 -37.24236 -8.396806 560.911
## 45855 -37.24208 -8.396806 558.984
## 45856 -37.24180 -8.396806 556.462
## 45857 -37.24152 -8.396806 554.815
## 45858 -37.24125 -8.396806 553.947
## 45859 -37.24097 -8.396806 553.920
## 46982 -37.30541 -8.397083 535.938
## 46983 -37.30513 -8.397083 536.110
## 46984 -37.30486 -8.397083 536.591
## 46985 -37.30458 -8.397083 537.209
## 46986 -37.30430 -8.397083 537.975
## 46987 -37.30402 -8.397083 538.276
## 46988 -37.30375 -8.397083 538.562
## 46989 -37.30347 -8.397083 538.715
## 46990 -37.30319 -8.397083 538.686
## 46991 -37.30291 -8.397083 538.520
## 46992 -37.30263 -8.397083 538.247
## 46993 -37.30236 -8.397083 537.978
## 46994 -37.30208 -8.397083 537.778
## 46995 -37.30180 -8.397083 537.772
## 46996 -37.30152 -8.397083 538.072
## 46997 -37.30125 -8.397083 538.503
## 46998 -37.30097 -8.397083 538.966
## 46999 -37.30069 -8.397083 539.284
## 47000 -37.30041 -8.397083 539.459
## 47001 -37.30013 -8.397083 539.467
## 47002 -37.29986 -8.397083 539.300
## 47003 -37.29958 -8.397083 539.205
## 47004 -37.29930 -8.397083 539.424
## 47005 -37.29902 -8.397083 540.140
## 47006 -37.29875 -8.397083 541.133
## 47007 -37.29847 -8.397083 542.227
## 47008 -37.29819 -8.397083 543.131
## 47009 -37.29791 -8.397083 543.954
## 47010 -37.29763 -8.397083 544.685
## 47011 -37.29736 -8.397083 545.317
## 47012 -37.29708 -8.397083 545.824
## 47013 -37.29680 -8.397083 546.476
## 47014 -37.29652 -8.397083 546.537
## 47015 -37.29625 -8.397083 546.857
## 47016 -37.29597 -8.397083 547.302
## 47017 -37.29569 -8.397083 548.081
## 47018 -37.29541 -8.397083 548.888
## 47019 -37.29513 -8.397083 549.523
## 47020 -37.29486 -8.397083 549.676
## 47021 -37.29458 -8.397083 549.638
## 47022 -37.29430 -8.397083 549.544
## 47023 -37.29402 -8.397083 549.548
## 47024 -37.29375 -8.397083 549.565
## 47025 -37.29347 -8.397083 549.605
## 47026 -37.29319 -8.397083 549.704
## 47027 -37.29291 -8.397083 549.763
## 47028 -37.29263 -8.397083 549.735
## 47029 -37.29236 -8.397083 549.542
## 47030 -37.29208 -8.397083 549.182
## 47031 -37.29180 -8.397083 548.598
## 47032 -37.29152 -8.397083 547.776
## 47033 -37.29125 -8.397083 546.979
## 47034 -37.29097 -8.397083 546.335
## 47035 -37.29069 -8.397083 546.211
## 47036 -37.29041 -8.397083 546.279
## 47037 -37.29013 -8.397083 546.426
## 47038 -37.28986 -8.397083 546.454
## 47039 -37.28958 -8.397083 546.431
## 47040 -37.28930 -8.397083 546.570
## 47041 -37.28902 -8.397083 546.177
## 47042 -37.28875 -8.397083 546.119
## 47043 -37.28847 -8.397083 546.348
## 47044 -37.28819 -8.397083 547.190
## 47045 -37.28791 -8.397083 548.148
## 47046 -37.28763 -8.397083 548.952
## 47047 -37.28736 -8.397083 549.278
## 47048 -37.28708 -8.397083 549.302
## 47049 -37.28680 -8.397083 549.103
## 47050 -37.28652 -8.397083 548.798
## 47051 -37.28625 -8.397083 548.734
## 47052 -37.28597 -8.397083 549.124
## 47053 -37.28569 -8.397083 550.348
## 47054 -37.28541 -8.397083 551.752
## 47055 -37.28513 -8.397083 552.954
## 47056 -37.28486 -8.397083 553.480
## 47057 -37.28458 -8.397083 553.711
## 47058 -37.28430 -8.397083 553.856
## 47059 -37.28402 -8.397083 554.191
## 47060 -37.28375 -8.397083 554.527
## 47061 -37.28347 -8.397083 554.813
## 47062 -37.28319 -8.397083 554.825
## 47063 -37.28291 -8.397083 554.814
## 47064 -37.28263 -8.397083 554.870
## 47065 -37.28236 -8.397083 555.109
## 47066 -37.28208 -8.397083 555.451
## 47067 -37.28180 -8.397083 555.921
## 47068 -37.28152 -8.397083 556.533
## 47069 -37.28125 -8.397083 557.051
## 47070 -37.28097 -8.397083 557.338
## 47071 -37.28069 -8.397083 557.008
## 47072 -37.28041 -8.397083 556.779
## 47073 -37.28013 -8.397083 557.046
## 47074 -37.27986 -8.397083 558.401
## 47075 -37.27958 -8.397083 560.031
## 47076 -37.27930 -8.397083 561.463
## 47077 -37.27902 -8.397083 562.189
## 47078 -37.27875 -8.397083 562.547
## 47079 -37.27847 -8.397083 562.625
## 47080 -37.27819 -8.397083 562.563
## 47081 -37.27791 -8.397083 562.494
## 47082 -37.27763 -8.397083 562.576
## 47083 -37.27736 -8.397083 563.010
## 47084 -37.27708 -8.397083 563.555
## 47085 -37.27680 -8.397083 564.009
## 47086 -37.27652 -8.397083 564.220
## 47087 -37.27625 -8.397083 564.444
## 47088 -37.27597 -8.397083 564.822
## 47089 -37.27569 -8.397083 565.627
## 47090 -37.27541 -8.397083 566.491
## 47091 -37.27513 -8.397083 567.259
## 47092 -37.27486 -8.397083 567.715
## 47093 -37.27458 -8.397083 567.717
## 47094 -37.27430 -8.397083 567.044
## 47095 -37.27402 -8.397083 565.551
## 47096 -37.27375 -8.397083 563.873
## 47097 -37.27347 -8.397083 562.383
## 47098 -37.27319 -8.397083 561.881
## 47099 -37.27291 -8.397083 561.626
## 47100 -37.27263 -8.397083 561.389
## 47101 -37.27236 -8.397083 560.762
## 47102 -37.27208 -8.397083 559.878
## 47103 -37.27180 -8.397083 558.688
## 47104 -37.27152 -8.397083 557.171
## 47105 -37.27125 -8.397083 555.582
## 47106 -37.27097 -8.397083 554.108
## 47107 -37.27069 -8.397083 552.963
## 47108 -37.27041 -8.397083 552.279
## 47109 -37.27013 -8.397083 552.228
## 47110 -37.26986 -8.397083 552.950
## 47111 -37.26958 -8.397083 553.916
## 47112 -37.26930 -8.397083 554.886
## 47113 -37.26902 -8.397083 554.952
## 47114 -37.26875 -8.397083 554.677
## 47115 -37.26847 -8.397083 554.012
## 47116 -37.26819 -8.397083 553.057
## 47117 -37.26791 -8.397083 551.994
## 47118 -37.26763 -8.397083 551.020
## 47119 -37.26736 -8.397083 550.370
## 47120 -37.26708 -8.397083 549.875
## 47121 -37.26680 -8.397083 549.455
## 47122 -37.26652 -8.397083 549.046
## 47123 -37.26625 -8.397083 548.797
## 47124 -37.26597 -8.397083 548.784
## 47125 -37.26569 -8.397083 549.114
## 47126 -37.26541 -8.397083 549.509
## 47127 -37.26513 -8.397083 549.774
## 47128 -37.26486 -8.397083 549.616
## 47129 -37.26458 -8.397083 549.475
## 47130 -37.26430 -8.397083 549.672
## 47131 -37.26402 -8.397083 550.477
## 47149 -37.25902 -8.397083 554.378
## 47150 -37.25875 -8.397083 553.189
## 47151 -37.25847 -8.397083 552.359
## 47152 -37.25819 -8.397083 552.116
## 47153 -37.25791 -8.397083 552.434
## 47154 -37.25763 -8.397083 553.333
## 47155 -37.25736 -8.397083 554.805
## 47156 -37.25708 -8.397083 556.412
## 47157 -37.25680 -8.397083 557.741
## 47158 -37.25652 -8.397083 558.489
## 47159 -37.25625 -8.397083 558.883
## 47160 -37.25597 -8.397083 559.054
## 47161 -37.25569 -8.397083 559.256
## 47162 -37.25541 -8.397083 559.349
## 47163 -37.25513 -8.397083 559.355
## 47164 -37.25486 -8.397083 559.116
## 47165 -37.25458 -8.397083 558.981
## 47166 -37.25430 -8.397083 558.929
## 47167 -37.25402 -8.397083 559.677
## 47168 -37.25375 -8.397083 560.667
## 47169 -37.25347 -8.397083 561.991
## 47170 -37.25319 -8.397083 563.764
## 47171 -37.25291 -8.397083 565.484
## 47172 -37.25263 -8.397083 566.817
## 47173 -37.25236 -8.397083 567.365
## 47174 -37.25208 -8.397083 567.560
## 47175 -37.25180 -8.397083 567.739
## 47176 -37.25152 -8.397083 568.099
## 47177 -37.25125 -8.397083 568.389
## 47178 -37.25097 -8.397083 568.485
## 47179 -37.25069 -8.397083 568.191
## 47180 -37.25041 -8.397083 567.975
## 47181 -37.25013 -8.397083 568.130
## 47182 -37.24986 -8.397083 568.981
## 47183 -37.24958 -8.397083 570.000
## 47184 -37.24930 -8.397083 570.710
## 47185 -37.24902 -8.397083 570.760
## 47186 -37.24875 -8.397083 570.661
## 47187 -37.24847 -8.397083 570.664
## 47188 -37.24819 -8.397083 571.327
## 47189 -37.24791 -8.397083 571.953
## 47190 -37.24763 -8.397083 572.164
## 47191 -37.24736 -8.397083 571.609
## 47192 -37.24708 -8.397083 570.780
## 47193 -37.24680 -8.397083 570.012
## 47194 -37.24652 -8.397083 569.550
## 47195 -37.24625 -8.397083 569.256
## 47196 -37.24597 -8.397083 569.078
## 47197 -37.24569 -8.397083 568.833
## 47198 -37.24541 -8.397083 568.554
## 47199 -37.24513 -8.397083 568.195
## 47200 -37.24486 -8.397083 567.788
## 47201 -37.24458 -8.397083 567.336
## 47202 -37.24430 -8.397083 566.880
## 47203 -37.24402 -8.397083 566.491
## 47204 -37.24375 -8.397083 566.072
## 47205 -37.24347 -8.397083 565.566
## 47206 -37.24319 -8.397083 564.926
## 47207 -37.24291 -8.397083 564.012
## 47208 -37.24263 -8.397083 562.745
## 47209 -37.24236 -8.397083 560.959
## 47210 -37.24208 -8.397083 559.035
## 47211 -37.24180 -8.397083 557.128
## 47212 -37.24152 -8.397083 555.505
## 47213 -37.24125 -8.397083 554.349
## 47214 -37.24097 -8.397083 553.850
## 47215 -37.24069 -8.397083 554.292
## 48333 -37.30652 -8.397361 539.146
## 48334 -37.30625 -8.397361 538.088
## 48335 -37.30597 -8.397361 537.183
## 48336 -37.30569 -8.397361 536.874
## 48337 -37.30541 -8.397361 536.679
## 48338 -37.30513 -8.397361 536.789
## 48339 -37.30486 -8.397361 536.948
## 48340 -37.30458 -8.397361 537.350
## 48341 -37.30430 -8.397361 537.679
## 48342 -37.30402 -8.397361 538.031
## 48343 -37.30375 -8.397361 538.219
## 48344 -37.30347 -8.397361 537.966
## 48345 -37.30319 -8.397361 537.851
## 48346 -37.30291 -8.397361 537.871
## 48347 -37.30263 -8.397361 537.958
## 48348 -37.30236 -8.397361 538.031
## 48349 -37.30208 -8.397361 537.933
## 48350 -37.30180 -8.397361 538.078
## 48351 -37.30152 -8.397361 538.545
## 48352 -37.30125 -8.397361 539.116
## 48353 -37.30097 -8.397361 539.521
## 48354 -37.30069 -8.397361 539.957
## 48355 -37.30041 -8.397361 540.485
## 48356 -37.30013 -8.397361 540.917
## 48357 -37.29986 -8.397361 540.970
## 48358 -37.29958 -8.397361 540.871
## 48359 -37.29930 -8.397361 541.036
## 48360 -37.29902 -8.397361 541.690
## 48361 -37.29875 -8.397361 542.509
## 48362 -37.29847 -8.397361 543.754
## 48363 -37.29819 -8.397361 544.537
## 48364 -37.29791 -8.397361 545.358
## 48365 -37.29763 -8.397361 545.863
## 48366 -37.29736 -8.397361 546.303
## 48367 -37.29708 -8.397361 546.528
## 48368 -37.29680 -8.397361 546.885
## 48369 -37.29652 -8.397361 547.090
## 48370 -37.29625 -8.397361 547.546
## 48371 -37.29597 -8.397361 548.335
## 48372 -37.29569 -8.397361 549.415
## 48373 -37.29541 -8.397361 550.009
## 48374 -37.29513 -8.397361 550.599
## 48375 -37.29486 -8.397361 550.677
## 48376 -37.29458 -8.397361 550.610
## 48377 -37.29430 -8.397361 550.395
## 48378 -37.29402 -8.397361 550.411
## 48379 -37.29375 -8.397361 550.414
## 48380 -37.29347 -8.397361 550.559
## 48381 -37.29319 -8.397361 550.579
## 48382 -37.29291 -8.397361 550.589
## 48383 -37.29263 -8.397361 550.344
## 48384 -37.29236 -8.397361 550.201
## 48385 -37.29208 -8.397361 549.943
## 48386 -37.29180 -8.397361 549.440
## 48387 -37.29152 -8.397361 548.910
## 48388 -37.29125 -8.397361 548.198
## 48389 -37.29097 -8.397361 547.992
## 48390 -37.29069 -8.397361 547.982
## 48391 -37.29041 -8.397361 548.004
## 48392 -37.29013 -8.397361 547.948
## 48393 -37.28986 -8.397361 547.783
## 48394 -37.28958 -8.397361 547.784
## 48395 -37.28930 -8.397361 547.510
## 48396 -37.28902 -8.397361 547.120
## 48397 -37.28875 -8.397361 546.998
## 48398 -37.28847 -8.397361 547.439
## 48399 -37.28819 -8.397361 548.345
## 48400 -37.28791 -8.397361 549.501
## 48401 -37.28763 -8.397361 550.143
## 48402 -37.28736 -8.397361 550.242
## 48403 -37.28708 -8.397361 550.169
## 48404 -37.28680 -8.397361 549.959
## 48405 -37.28652 -8.397361 549.523
## 48406 -37.28625 -8.397361 549.290
## 48407 -37.28597 -8.397361 549.315
## 48408 -37.28569 -8.397361 550.360
## 48409 -37.28541 -8.397361 551.276
## 48410 -37.28513 -8.397361 552.041
## 48411 -37.28486 -8.397361 552.486
## 48412 -37.28458 -8.397361 552.861
## 48413 -37.28430 -8.397361 553.554
## 48414 -37.28402 -8.397361 554.142
## 48415 -37.28375 -8.397361 554.595
## 48416 -37.28347 -8.397361 554.819
## 48417 -37.28319 -8.397361 554.871
## 48418 -37.28291 -8.397361 555.030
## 48419 -37.28263 -8.397361 554.974
## 48420 -37.28236 -8.397361 555.165
## 48421 -37.28208 -8.397361 555.279
## 48422 -37.28180 -8.397361 555.775
## 48423 -37.28152 -8.397361 556.604
## 48424 -37.28125 -8.397361 557.335
## 48425 -37.28097 -8.397361 557.852
## 48426 -37.28069 -8.397361 557.724
## 48427 -37.28041 -8.397361 557.632
## 48428 -37.28013 -8.397361 558.146
## 48429 -37.27986 -8.397361 559.440
## 48430 -37.27958 -8.397361 560.887
## 48431 -37.27930 -8.397361 561.989
## 48432 -37.27902 -8.397361 562.482
## 48433 -37.27875 -8.397361 562.884
## 48434 -37.27847 -8.397361 562.949
## 48435 -37.27819 -8.397361 563.001
## 48436 -37.27791 -8.397361 563.058
## 48437 -37.27763 -8.397361 563.466
## 48438 -37.27736 -8.397361 564.345
## 48439 -37.27708 -8.397361 565.267
## 48440 -37.27680 -8.397361 566.091
## 48441 -37.27652 -8.397361 566.555
## 48442 -37.27625 -8.397361 566.944
## 48443 -37.27597 -8.397361 567.446
## 48444 -37.27569 -8.397361 568.122
## 48445 -37.27541 -8.397361 568.674
## 48446 -37.27513 -8.397361 568.994
## 48447 -37.27486 -8.397361 569.097
## 48448 -37.27458 -8.397361 568.989
## 48449 -37.27430 -8.397361 568.025
## 48450 -37.27402 -8.397361 566.655
## 48451 -37.27375 -8.397361 565.112
## 48452 -37.27347 -8.397361 564.172
## 48453 -37.27319 -8.397361 563.917
## 48454 -37.27291 -8.397361 563.741
## 48455 -37.27263 -8.397361 563.553
## 48456 -37.27236 -8.397361 562.727
## 48457 -37.27208 -8.397361 561.682
## 48458 -37.27180 -8.397361 560.316
## 48459 -37.27152 -8.397361 558.374
## 48460 -37.27125 -8.397361 556.739
## 48461 -37.27097 -8.397361 555.124
## 48462 -37.27069 -8.397361 553.663
## 48463 -37.27041 -8.397361 552.717
## 48464 -37.27013 -8.397361 552.149
## 48465 -37.26986 -8.397361 552.505
## 48466 -37.26958 -8.397361 553.292
## 48467 -37.26930 -8.397361 554.195
## 48468 -37.26902 -8.397361 554.805
## 48469 -37.26875 -8.397361 554.819
## 48470 -37.26847 -8.397361 554.483
## 48471 -37.26819 -8.397361 553.898
## 48472 -37.26791 -8.397361 552.862
## 48473 -37.26763 -8.397361 552.066
## 48474 -37.26736 -8.397361 551.620
## 48475 -37.26708 -8.397361 551.182
## 48476 -37.26680 -8.397361 550.944
## 48477 -37.26652 -8.397361 550.326
## 48478 -37.26625 -8.397361 549.820
## 48479 -37.26597 -8.397361 549.457
## 48480 -37.26569 -8.397361 549.312
## 48481 -37.26541 -8.397361 549.388
## 48482 -37.26513 -8.397361 549.145
## 48483 -37.26486 -8.397361 548.661
## 48484 -37.26458 -8.397361 548.377
## 48485 -37.26430 -8.397361 548.480
## 48486 -37.26402 -8.397361 549.364
## 48487 -37.26375 -8.397361 550.378
## 48488 -37.26347 -8.397361 551.126
## 48503 -37.25930 -8.397361 554.824
## 48504 -37.25902 -8.397361 553.858
## 48505 -37.25875 -8.397361 553.143
## 48506 -37.25847 -8.397361 552.793
## 48507 -37.25819 -8.397361 552.914
## 48508 -37.25791 -8.397361 553.666
## 48509 -37.25763 -8.397361 554.827
## 48510 -37.25736 -8.397361 556.485
## 48511 -37.25708 -8.397361 558.070
## 48512 -37.25680 -8.397361 559.897
## 48513 -37.25652 -8.397361 560.428
## 48514 -37.25625 -8.397361 560.658
## 48515 -37.25597 -8.397361 560.569
## 48516 -37.25569 -8.397361 560.274
## 48517 -37.25541 -8.397361 560.113
## 48518 -37.25513 -8.397361 559.018
## 48519 -37.25486 -8.397361 558.385
## 48520 -37.25458 -8.397361 557.822
## 48521 -37.25430 -8.397361 558.239
## 48522 -37.25402 -8.397361 559.486
## 48523 -37.25375 -8.397361 560.701
## 48524 -37.25347 -8.397361 562.677
## 48525 -37.25319 -8.397361 564.888
## 48526 -37.25291 -8.397361 566.570
## 48527 -37.25263 -8.397361 567.863
## 48528 -37.25236 -8.397361 568.039
## 48529 -37.25208 -8.397361 568.128
## 48530 -37.25180 -8.397361 567.719
## 48531 -37.25152 -8.397361 568.096
## 48532 -37.25125 -8.397361 568.609
## 48533 -37.25097 -8.397361 569.172
## 48534 -37.25069 -8.397361 569.003
## 48535 -37.25041 -8.397361 568.733
## 48536 -37.25013 -8.397361 569.011
## 48537 -37.24986 -8.397361 569.844
## 48538 -37.24958 -8.397361 570.774
## 48539 -37.24930 -8.397361 570.863
## 48540 -37.24902 -8.397361 570.769
## 48541 -37.24875 -8.397361 570.696
## 48542 -37.24847 -8.397361 571.019
## 48543 -37.24819 -8.397361 571.988
## 48544 -37.24791 -8.397361 572.741
## 48545 -37.24763 -8.397361 573.486
## 48546 -37.24736 -8.397361 572.951
## 48547 -37.24708 -8.397361 572.201
## 48548 -37.24680 -8.397361 571.152
## 48549 -37.24652 -8.397361 570.451
## 48550 -37.24625 -8.397361 570.115
## 48551 -37.24597 -8.397361 569.567
## 48552 -37.24569 -8.397361 569.147
## 48553 -37.24541 -8.397361 568.858
## 48554 -37.24513 -8.397361 568.497
## 48555 -37.24486 -8.397361 568.193
## 48556 -37.24458 -8.397361 567.691
## 48557 -37.24430 -8.397361 567.725
## 48558 -37.24402 -8.397361 567.447
## 48559 -37.24375 -8.397361 566.961
## 48560 -37.24347 -8.397361 566.105
## 48561 -37.24319 -8.397361 565.325
## 48562 -37.24291 -8.397361 564.017
## 48563 -37.24263 -8.397361 562.296
## 48564 -37.24236 -8.397361 560.786
## 48565 -37.24208 -8.397361 559.265
## 48566 -37.24180 -8.397361 557.972
## 48567 -37.24152 -8.397361 556.727
## 48568 -37.24125 -8.397361 555.494
## 48569 -37.24097 -8.397361 554.486
## 48570 -37.24069 -8.397361 554.656
## 48571 -37.24041 -8.397361 554.998
## 48572 -37.24013 -8.397361 555.465
## 48573 -37.23986 -8.397361 556.003
## 49688 -37.30652 -8.397639 539.388
## 49689 -37.30625 -8.397639 538.551
## 49690 -37.30597 -8.397639 537.953
## 49691 -37.30569 -8.397639 537.648
## 49692 -37.30541 -8.397639 537.577
## 49693 -37.30513 -8.397639 537.615
## 49694 -37.30486 -8.397639 537.627
## 49695 -37.30458 -8.397639 537.805
## 49696 -37.30430 -8.397639 537.845
## 49697 -37.30402 -8.397639 538.120
## 49698 -37.30375 -8.397639 538.177
## 49699 -37.30347 -8.397639 538.030
## 49700 -37.30319 -8.397639 538.200
## 49701 -37.30291 -8.397639 538.391
## 49702 -37.30263 -8.397639 538.792
## 49703 -37.30236 -8.397639 539.002
## 49704 -37.30208 -8.397639 539.066
## 49705 -37.30180 -8.397639 539.424
## 49706 -37.30152 -8.397639 539.739
## 49707 -37.30125 -8.397639 540.007
## 49708 -37.30097 -8.397639 540.320
## 49709 -37.30069 -8.397639 541.235
## 49710 -37.30041 -8.397639 542.046
## 49711 -37.30013 -8.397639 542.725
## 49712 -37.29986 -8.397639 542.580
## 49713 -37.29958 -8.397639 542.317
## 49714 -37.29930 -8.397639 542.305
## 49715 -37.29902 -8.397639 542.667
## 49716 -37.29875 -8.397639 543.304
## 49717 -37.29847 -8.397639 544.252
## 49718 -37.29819 -8.397639 545.395
## 49719 -37.29791 -8.397639 546.629
## 49720 -37.29763 -8.397639 547.243
## 49721 -37.29736 -8.397639 547.444
## 49722 -37.29708 -8.397639 547.596
## 49723 -37.29680 -8.397639 547.503
## 49724 -37.29652 -8.397639 547.880
## 49725 -37.29625 -8.397639 548.537
## 49726 -37.29597 -8.397639 549.421
## 49727 -37.29569 -8.397639 550.115
## 49728 -37.29541 -8.397639 550.710
## 49729 -37.29513 -8.397639 550.918
## 49730 -37.29486 -8.397639 551.177
## 49731 -37.29458 -8.397639 551.301
## 49732 -37.29430 -8.397639 551.341
## 49733 -37.29402 -8.397639 551.275
## 49734 -37.29375 -8.397639 551.259
## 49735 -37.29347 -8.397639 551.394
## 49736 -37.29319 -8.397639 551.357
## 49737 -37.29291 -8.397639 551.286
## 49738 -37.29263 -8.397639 550.993
## 49739 -37.29236 -8.397639 550.935
## 49740 -37.29208 -8.397639 550.741
## 49741 -37.29180 -8.397639 550.399
## 49742 -37.29152 -8.397639 550.004
## 49743 -37.29125 -8.397639 549.473
## 49744 -37.29097 -8.397639 549.455
## 49745 -37.29069 -8.397639 549.320
## 49746 -37.29041 -8.397639 549.150
## 49747 -37.29013 -8.397639 548.954
## 49748 -37.28986 -8.397639 548.832
## 49749 -37.28958 -8.397639 548.730
## 49750 -37.28930 -8.397639 548.553
## 49751 -37.28902 -8.397639 548.059
## 49752 -37.28875 -8.397639 547.833
## 49753 -37.28847 -8.397639 548.179
## 49754 -37.28819 -8.397639 549.332
## 49755 -37.28791 -8.397639 550.555
## 49756 -37.28763 -8.397639 551.453
## 49757 -37.28736 -8.397639 551.116
## 49758 -37.28708 -8.397639 550.446
## 49759 -37.28680 -8.397639 549.897
## 49760 -37.28652 -8.397639 549.824
## 49761 -37.28625 -8.397639 549.925
## 49762 -37.28597 -8.397639 549.959
## 49763 -37.28569 -8.397639 550.169
## 49764 -37.28541 -8.397639 550.553
## 49765 -37.28513 -8.397639 551.032
## 49766 -37.28486 -8.397639 551.576
## 49767 -37.28458 -8.397639 551.955
## 49768 -37.28430 -8.397639 553.121
## 49769 -37.28402 -8.397639 553.835
## 49770 -37.28375 -8.397639 554.281
## 49771 -37.28347 -8.397639 554.598
## 49772 -37.28319 -8.397639 554.983
## 49773 -37.28291 -8.397639 555.491
## 49774 -37.28263 -8.397639 555.675
## 49775 -37.28236 -8.397639 555.612
## 49776 -37.28208 -8.397639 555.624
## 49777 -37.28180 -8.397639 555.998
## 49778 -37.28152 -8.397639 556.905
## 49779 -37.28125 -8.397639 557.681
## 49780 -37.28097 -8.397639 558.220
## 49781 -37.28069 -8.397639 558.567
## 49782 -37.28041 -8.397639 558.938
## 49783 -37.28013 -8.397639 559.719
## 49784 -37.27986 -8.397639 560.427
## 49785 -37.27958 -8.397639 561.324
## 49786 -37.27930 -8.397639 561.749
## 49787 -37.27902 -8.397639 562.481
## 49788 -37.27875 -8.397639 563.097
## 49789 -37.27847 -8.397639 563.356
## 49790 -37.27819 -8.397639 563.399
## 49791 -37.27791 -8.397639 563.688
## 49792 -37.27763 -8.397639 564.180
## 49793 -37.27736 -8.397639 565.353
## 49794 -37.27708 -8.397639 566.627
## 49795 -37.27680 -8.397639 567.745
## 49796 -37.27652 -8.397639 568.483
## 49797 -37.27625 -8.397639 569.201
## 49798 -37.27597 -8.397639 569.754
## 49799 -37.27569 -8.397639 570.065
## 49800 -37.27541 -8.397639 570.218
## 49801 -37.27513 -8.397639 570.211
## 49802 -37.27486 -8.397639 570.216
## 49803 -37.27458 -8.397639 569.953
## 49804 -37.27430 -8.397639 568.895
## 49805 -37.27402 -8.397639 567.648
## 49806 -37.27375 -8.397639 566.549
## 49807 -37.27347 -8.397639 565.778
## 49808 -37.27319 -8.397639 565.487
## 49809 -37.27291 -8.397639 565.123
## 49810 -37.27263 -8.397639 564.808
## 49811 -37.27236 -8.397639 563.806
## 49812 -37.27208 -8.397639 562.555
## 49813 -37.27180 -8.397639 560.838
## 49814 -37.27152 -8.397639 559.215
## 49815 -37.27125 -8.397639 557.549
## 49816 -37.27097 -8.397639 555.992
## 49817 -37.27069 -8.397639 554.217
## 49818 -37.27041 -8.397639 552.816
## 49819 -37.27013 -8.397639 551.913
## 49820 -37.26986 -8.397639 552.184
## 49821 -37.26958 -8.397639 552.958
## 49822 -37.26930 -8.397639 553.775
## 49823 -37.26902 -8.397639 554.617
## 49824 -37.26875 -8.397639 555.157
## 49825 -37.26847 -8.397639 555.219
## 49826 -37.26819 -8.397639 554.760
## 49827 -37.26791 -8.397639 554.108
## 49828 -37.26763 -8.397639 553.415
## 49829 -37.26736 -8.397639 553.070
## 49830 -37.26708 -8.397639 552.739
## 49831 -37.26680 -8.397639 552.468
## 49832 -37.26652 -8.397639 551.668
## 49833 -37.26625 -8.397639 550.817
## 49834 -37.26597 -8.397639 550.122
## 49835 -37.26569 -8.397639 549.687
## 49836 -37.26541 -8.397639 549.396
## 49837 -37.26513 -8.397639 548.838
## 49838 -37.26486 -8.397639 548.371
## 49839 -37.26458 -8.397639 548.132
## 49840 -37.26430 -8.397639 548.339
## 49841 -37.26402 -8.397639 549.085
## 49842 -37.26375 -8.397639 550.167
## 49843 -37.26347 -8.397639 550.985
## 49844 -37.26319 -8.397639 551.088
## 49858 -37.25930 -8.397639 554.294
## 49859 -37.25902 -8.397639 553.698
## 49860 -37.25875 -8.397639 553.446
## 49861 -37.25847 -8.397639 553.585
## 49862 -37.25819 -8.397639 554.190
## 49863 -37.25791 -8.397639 555.165
## 49864 -37.25763 -8.397639 556.529
## 49865 -37.25736 -8.397639 558.135
## 49866 -37.25708 -8.397639 559.670
## 49867 -37.25680 -8.397639 561.173
## 49868 -37.25652 -8.397639 561.988
## 49869 -37.25625 -8.397639 562.070
## 49870 -37.25597 -8.397639 561.835
## 49871 -37.25569 -8.397639 561.211
## 49872 -37.25541 -8.397639 560.436
## 49873 -37.25513 -8.397639 559.002
## 49874 -37.25486 -8.397639 558.134
## 49875 -37.25458 -8.397639 557.558
## 49876 -37.25430 -8.397639 557.780
## 49877 -37.25402 -8.397639 559.290
## 49878 -37.25375 -8.397639 561.125
## 49879 -37.25347 -8.397639 563.288
## 49880 -37.25319 -8.397639 565.237
## 49881 -37.25291 -8.397639 566.985
## 49882 -37.25263 -8.397639 568.042
## 49883 -37.25236 -8.397639 568.213
## 49884 -37.25208 -8.397639 568.146
## 49885 -37.25180 -8.397639 567.687
## 49886 -37.25152 -8.397639 568.306
## 49887 -37.25125 -8.397639 569.132
## 49888 -37.25097 -8.397639 569.897
## 49889 -37.25069 -8.397639 569.849
## 49890 -37.25041 -8.397639 569.599
## 49891 -37.25013 -8.397639 569.938
## 49892 -37.24986 -8.397639 570.520
## 49893 -37.24958 -8.397639 571.177
## 49894 -37.24930 -8.397639 570.983
## 49895 -37.24902 -8.397639 570.911
## 49896 -37.24875 -8.397639 570.939
## 49897 -37.24847 -8.397639 571.344
## 49898 -37.24819 -8.397639 572.357
## 49899 -37.24791 -8.397639 573.218
## 49900 -37.24763 -8.397639 574.078
## 49901 -37.24736 -8.397639 573.594
## 49902 -37.24708 -8.397639 572.821
## 49903 -37.24680 -8.397639 571.682
## 49904 -37.24652 -8.397639 571.130
## 49905 -37.24625 -8.397639 570.716
## 49906 -37.24597 -8.397639 570.285
## 49907 -37.24569 -8.397639 569.962
## 49908 -37.24541 -8.397639 569.720
## 49909 -37.24513 -8.397639 569.439
## 49910 -37.24486 -8.397639 568.962
## 49911 -37.24458 -8.397639 568.346
## 49912 -37.24430 -8.397639 568.225
## 49913 -37.24402 -8.397639 568.125
## 49914 -37.24375 -8.397639 567.945
## 49915 -37.24347 -8.397639 567.090
## 49916 -37.24319 -8.397639 565.353
## 49917 -37.24291 -8.397639 563.418
## 49918 -37.24263 -8.397639 561.499
## 49919 -37.24236 -8.397639 560.625
## 49920 -37.24208 -8.397639 559.868
## 49921 -37.24180 -8.397639 559.488
## 49922 -37.24152 -8.397639 558.319
## 49923 -37.24125 -8.397639 557.349
## 49924 -37.24097 -8.397639 556.378
## 49925 -37.24069 -8.397639 555.812
## 49926 -37.24041 -8.397639 555.486
## 49927 -37.24013 -8.397639 555.452
## 49928 -37.23986 -8.397639 555.801
## 49929 -37.23958 -8.397639 556.234
## 49930 -37.23930 -8.397639 557.148
## 49931 -37.23902 -8.397639 557.967
## 49932 -37.23875 -8.397639 558.744
## 49933 -37.23847 -8.397639 559.046
## 49934 -37.23819 -8.397639 559.250
## 51042 -37.30680 -8.397917 539.479
## 51043 -37.30652 -8.397917 539.125
## 51044 -37.30625 -8.397917 538.804
## 51045 -37.30597 -8.397917 538.686
## 51046 -37.30569 -8.397917 538.514
## 51047 -37.30541 -8.397917 538.485
## 51048 -37.30513 -8.397917 538.472
## 51049 -37.30486 -8.397917 538.412
## 51050 -37.30458 -8.397917 538.384
## 51051 -37.30430 -8.397917 538.473
## 51052 -37.30402 -8.397917 538.593
## 51053 -37.30375 -8.397917 538.865
## 51054 -37.30347 -8.397917 539.351
## 51055 -37.30319 -8.397917 539.747
## 51056 -37.30291 -8.397917 540.267
## 51057 -37.30263 -8.397917 540.519
## 51058 -37.30236 -8.397917 540.952
## 51059 -37.30208 -8.397917 541.120
## 51060 -37.30180 -8.397917 541.134
## 51061 -37.30152 -8.397917 541.391
## 51062 -37.30125 -8.397917 541.634
## 51063 -37.30097 -8.397917 541.948
## 51064 -37.30069 -8.397917 542.866
## 51065 -37.30041 -8.397917 543.618
## 51066 -37.30013 -8.397917 544.037
## 51067 -37.29986 -8.397917 543.777
## 51068 -37.29958 -8.397917 543.355
## 51069 -37.29930 -8.397917 543.032
## 51070 -37.29902 -8.397917 543.186
## 51071 -37.29875 -8.397917 543.677
## 51072 -37.29847 -8.397917 544.651
## 51073 -37.29819 -8.397917 545.906
## 51074 -37.29791 -8.397917 547.276
## 51075 -37.29763 -8.397917 548.532
## 51076 -37.29736 -8.397917 548.574
## 51077 -37.29708 -8.397917 548.578
## 51078 -37.29680 -8.397917 548.609
## 51079 -37.29652 -8.397917 548.948
## 51080 -37.29625 -8.397917 549.499
## 51081 -37.29597 -8.397917 549.950
## 51082 -37.29569 -8.397917 550.461
## 51083 -37.29541 -8.397917 550.780
## 51084 -37.29513 -8.397917 551.178
## 51085 -37.29486 -8.397917 551.483
## 51086 -37.29458 -8.397917 551.829
## 51087 -37.29430 -8.397917 552.170
## 51088 -37.29402 -8.397917 552.134
## 51089 -37.29375 -8.397917 552.133
## 51090 -37.29347 -8.397917 552.121
## 51091 -37.29319 -8.397917 552.088
## 51092 -37.29291 -8.397917 552.061
## 51093 -37.29263 -8.397917 552.005
## 51094 -37.29236 -8.397917 551.932
## 51095 -37.29208 -8.397917 551.771
## 51096 -37.29180 -8.397917 551.280
## 51097 -37.29152 -8.397917 551.033
## 51098 -37.29125 -8.397917 550.553
## 51099 -37.29097 -8.397917 550.011
## 51100 -37.29069 -8.397917 549.823
## 51101 -37.29041 -8.397917 549.619
## 51102 -37.29013 -8.397917 549.500
## 51103 -37.28986 -8.397917 549.464
## 51104 -37.28958 -8.397917 549.416
## 51105 -37.28930 -8.397917 549.362
## 51106 -37.28902 -8.397917 548.965
## 51107 -37.28875 -8.397917 548.765
## 51108 -37.28847 -8.397917 548.915
## 51109 -37.28819 -8.397917 549.960
## 51110 -37.28791 -8.397917 551.072
## 51111 -37.28763 -8.397917 551.751
## 51112 -37.28736 -8.397917 551.430
## 51113 -37.28708 -8.397917 550.723
## 51114 -37.28680 -8.397917 550.043
## 51115 -37.28652 -8.397917 550.020
## 51116 -37.28625 -8.397917 550.103
## 51117 -37.28597 -8.397917 550.470
## 51118 -37.28569 -8.397917 550.238
## 51119 -37.28541 -8.397917 550.319
## 51120 -37.28513 -8.397917 550.602
## 51121 -37.28486 -8.397917 551.210
## 51122 -37.28458 -8.397917 551.936
## 51123 -37.28430 -8.397917 552.734
## 51124 -37.28402 -8.397917 553.339
## 51125 -37.28375 -8.397917 553.953
## 51126 -37.28347 -8.397917 554.754
## 51127 -37.28319 -8.397917 555.219
## 51128 -37.28291 -8.397917 555.819
## 51129 -37.28263 -8.397917 556.228
## 51130 -37.28236 -8.397917 556.283
## 51131 -37.28208 -8.397917 556.336
## 51132 -37.28180 -8.397917 556.541
## 51133 -37.28152 -8.397917 557.373
## 51134 -37.28125 -8.397917 558.216
## 51135 -37.28097 -8.397917 558.872
## 51136 -37.28069 -8.397917 559.482
## 51137 -37.28041 -8.397917 559.866
## 51138 -37.28013 -8.397917 560.241
## 51139 -37.27986 -8.397917 560.637
## 51140 -37.27958 -8.397917 561.103
## 51141 -37.27930 -8.397917 561.759
## 51142 -37.27902 -8.397917 562.355
## 51143 -37.27875 -8.397917 563.000
## 51144 -37.27847 -8.397917 563.531
## 51145 -37.27819 -8.397917 563.761
## 51146 -37.27791 -8.397917 564.090
## 51147 -37.27763 -8.397917 564.741
## 51148 -37.27736 -8.397917 565.965
## 51149 -37.27708 -8.397917 567.380
## 51150 -37.27680 -8.397917 568.732
## 51151 -37.27652 -8.397917 569.730
## 51152 -37.27625 -8.397917 570.504
## 51153 -37.27597 -8.397917 571.039
## 51154 -37.27569 -8.397917 571.272
## 51155 -37.27541 -8.397917 571.306
## 51156 -37.27513 -8.397917 571.188
## 51157 -37.27486 -8.397917 571.007
## 51158 -37.27458 -8.397917 570.604
## 51159 -37.27430 -8.397917 569.881
## 51160 -37.27402 -8.397917 568.829
## 51161 -37.27375 -8.397917 567.717
## 51162 -37.27347 -8.397917 566.550
## 51163 -37.27319 -8.397917 566.213
## 51164 -37.27291 -8.397917 565.707
## 51165 -37.27263 -8.397917 564.978
## 51166 -37.27236 -8.397917 563.700
## 51167 -37.27208 -8.397917 562.181
## 51168 -37.27180 -8.397917 560.610
## 51169 -37.27152 -8.397917 559.123
## 51170 -37.27125 -8.397917 557.645
## 51171 -37.27097 -8.397917 556.180
## 51172 -37.27069 -8.397917 554.398
## 51173 -37.27041 -8.397917 552.943
## 51174 -37.27013 -8.397917 552.075
## 51175 -37.26986 -8.397917 552.173
## 51176 -37.26958 -8.397917 552.802
## 51177 -37.26930 -8.397917 553.720
## 51178 -37.26902 -8.397917 554.727
## 51179 -37.26875 -8.397917 555.552
## 51180 -37.26847 -8.397917 556.068
## 51181 -37.26819 -8.397917 555.871
## 51182 -37.26791 -8.397917 555.432
## 51183 -37.26763 -8.397917 554.889
## 51184 -37.26736 -8.397917 554.673
## 51185 -37.26708 -8.397917 554.351
## 51186 -37.26680 -8.397917 553.676
## 51187 -37.26652 -8.397917 552.780
## 51188 -37.26625 -8.397917 551.706
## 51189 -37.26597 -8.397917 550.850
## 51190 -37.26569 -8.397917 550.158
## 51191 -37.26541 -8.397917 549.748
## 51192 -37.26513 -8.397917 549.414
## 51193 -37.26486 -8.397917 549.074
## 51194 -37.26458 -8.397917 548.930
## 51195 -37.26430 -8.397917 549.159
## 51196 -37.26402 -8.397917 549.939
## 51197 -37.26375 -8.397917 550.775
## 51198 -37.26347 -8.397917 551.254
## 51199 -37.26319 -8.397917 551.336
## 51200 -37.26291 -8.397917 551.074
## 51201 -37.26263 -8.397917 550.872
## 51212 -37.25958 -8.397917 554.254
## 51213 -37.25930 -8.397917 554.037
## 51214 -37.25902 -8.397917 553.826
## 51215 -37.25875 -8.397917 554.018
## 51216 -37.25847 -8.397917 554.495
## 51217 -37.25819 -8.397917 555.482
## 51218 -37.25791 -8.397917 556.684
## 51219 -37.25763 -8.397917 558.052
## 51220 -37.25736 -8.397917 559.444
## 51221 -37.25708 -8.397917 560.729
## 51222 -37.25680 -8.397917 561.617
## 51223 -37.25652 -8.397917 562.413
## 51224 -37.25625 -8.397917 562.645
## 51225 -37.25597 -8.397917 562.670
## 51226 -37.25569 -8.397917 561.745
## 51227 -37.25541 -8.397917 560.795
## 51228 -37.25513 -8.397917 559.745
## 51229 -37.25486 -8.397917 558.812
## 51230 -37.25458 -8.397917 558.269
## 51231 -37.25430 -8.397917 558.323
## 51232 -37.25402 -8.397917 559.463
## 51233 -37.25375 -8.397917 561.133
## 51234 -37.25347 -8.397917 562.978
## 51235 -37.25319 -8.397917 564.786
## 51236 -37.25291 -8.397917 566.255
## 51237 -37.25263 -8.397917 567.346
## 51238 -37.25236 -8.397917 567.531
## 51239 -37.25208 -8.397917 567.631
## 51240 -37.25180 -8.397917 568.157
## 51241 -37.25152 -8.397917 568.951
## 51242 -37.25125 -8.397917 569.953
## 51243 -37.25097 -8.397917 570.502
## 51244 -37.25069 -8.397917 570.654
## 51245 -37.25041 -8.397917 570.445
## 51246 -37.25013 -8.397917 570.378
## 51247 -37.24986 -8.397917 570.742
## 51248 -37.24958 -8.397917 571.201
## 51249 -37.24930 -8.397917 571.508
## 51250 -37.24902 -8.397917 571.411
## 51251 -37.24875 -8.397917 571.359
## 51252 -37.24847 -8.397917 571.347
## 51253 -37.24819 -8.397917 572.405
## 51254 -37.24791 -8.397917 573.249
## 51255 -37.24763 -8.397917 573.690
## 51256 -37.24736 -8.397917 573.270
## 51257 -37.24708 -8.397917 572.549
## 51258 -37.24680 -8.397917 572.157
## 51259 -37.24652 -8.397917 571.596
## 51260 -37.24625 -8.397917 571.473
## 51261 -37.24597 -8.397917 571.522
## 51262 -37.24569 -8.397917 571.321
## 51263 -37.24541 -8.397917 571.129
## 51264 -37.24513 -8.397917 570.752
## 51265 -37.24486 -8.397917 570.083
## 51266 -37.24458 -8.397917 569.365
## 51267 -37.24430 -8.397917 568.680
## 51268 -37.24402 -8.397917 568.622
## 51269 -37.24375 -8.397917 568.237
## 51270 -37.24347 -8.397917 567.556
## 51271 -37.24319 -8.397917 565.489
## 51272 -37.24291 -8.397917 563.457
## 51273 -37.24263 -8.397917 561.824
## 51274 -37.24236 -8.397917 561.250
## 51275 -37.24208 -8.397917 561.032
## 51276 -37.24180 -8.397917 560.832
## 51277 -37.24152 -8.397917 560.178
## 51278 -37.24125 -8.397917 559.449
## 51279 -37.24097 -8.397917 558.732
## 51280 -37.24069 -8.397917 557.820
## 51281 -37.24041 -8.397917 557.121
## 51282 -37.24013 -8.397917 556.680
## 51283 -37.23986 -8.397917 556.649
## 51284 -37.23958 -8.397917 556.930
## 51285 -37.23930 -8.397917 557.493
## 51286 -37.23902 -8.397917 558.400
## 51287 -37.23875 -8.397917 559.272
## 51288 -37.23847 -8.397917 560.045
## 51289 -37.23819 -8.397917 560.166
## 51290 -37.23791 -8.397917 560.065
## 51291 -37.23763 -8.397917 559.672
## 51292 -37.23736 -8.397917 559.048
## 51293 -37.23708 -8.397917 558.483
## 51294 -37.23680 -8.397917 558.114
## 51295 -37.23652 -8.397917 558.578
## 52397 -37.30680 -8.398194 539.025
## 52398 -37.30652 -8.398194 538.861
## 52399 -37.30625 -8.398194 538.894
## 52400 -37.30597 -8.398194 539.102
## 52401 -37.30569 -8.398194 539.255
## 52402 -37.30541 -8.398194 539.301
## 52403 -37.30513 -8.398194 539.203
## 52404 -37.30486 -8.398194 539.161
## 52405 -37.30458 -8.398194 539.080
## 52406 -37.30430 -8.398194 539.094
## 52407 -37.30402 -8.398194 539.143
## 52408 -37.30375 -8.398194 539.575
## 52409 -37.30347 -8.398194 540.601
## 52410 -37.30319 -8.398194 541.488
## 52411 -37.30291 -8.398194 542.219
## 52412 -37.30263 -8.398194 542.789
## 52413 -37.30236 -8.398194 543.044
## 52414 -37.30208 -8.398194 543.284
## 52415 -37.30180 -8.398194 543.339
## 52416 -37.30152 -8.398194 543.239
## 52417 -37.30125 -8.398194 543.478
## 52418 -37.30097 -8.398194 544.031
## 52419 -37.30069 -8.398194 544.639
## 52420 -37.30041 -8.398194 545.177
## 52421 -37.30013 -8.398194 545.351
## 52422 -37.29986 -8.398194 544.771
## 52423 -37.29958 -8.398194 544.216
## 52424 -37.29930 -8.398194 543.556
## 52425 -37.29902 -8.398194 543.570
## 52426 -37.29875 -8.398194 543.974
## 52427 -37.29847 -8.398194 544.750
## 52428 -37.29819 -8.398194 546.272
## 52429 -37.29791 -8.398194 547.682
## 52430 -37.29763 -8.398194 549.003
## 52431 -37.29736 -8.398194 549.440
## 52432 -37.29708 -8.398194 549.433
## 52433 -37.29680 -8.398194 549.514
## 52434 -37.29652 -8.398194 549.882
## 52435 -37.29625 -8.398194 550.438
## 52436 -37.29597 -8.398194 550.589
## 52437 -37.29569 -8.398194 550.695
## 52438 -37.29541 -8.398194 550.916
## 52439 -37.29513 -8.398194 551.234
## 52440 -37.29486 -8.398194 551.716
## 52441 -37.29458 -8.398194 552.269
## 52442 -37.29430 -8.398194 552.584
## 52443 -37.29402 -8.398194 552.868
## 52444 -37.29375 -8.398194 552.872
## 52445 -37.29347 -8.398194 552.640
## 52446 -37.29319 -8.398194 552.680
## 52447 -37.29291 -8.398194 552.683
## 52448 -37.29263 -8.398194 552.813
## 52449 -37.29236 -8.398194 552.813
## 52450 -37.29208 -8.398194 552.618
## 52451 -37.29180 -8.398194 552.467
## 52452 -37.29152 -8.398194 551.902
## 52453 -37.29125 -8.398194 551.418
## 52454 -37.29097 -8.398194 550.677
## 52455 -37.29069 -8.398194 550.153
## 52456 -37.29041 -8.398194 549.883
## 52457 -37.29013 -8.398194 549.973
## 52458 -37.28986 -8.398194 550.088
## 52459 -37.28958 -8.398194 550.117
## 52460 -37.28930 -8.398194 550.150
## 52461 -37.28902 -8.398194 549.955
## 52462 -37.28875 -8.398194 549.701
## 52463 -37.28847 -8.398194 549.765
## 52464 -37.28819 -8.398194 550.449
## 52465 -37.28791 -8.398194 551.341
## 52466 -37.28763 -8.398194 552.058
## 52467 -37.28736 -8.398194 551.636
## 52468 -37.28708 -8.398194 551.113
## 52469 -37.28680 -8.398194 550.448
## 52470 -37.28652 -8.398194 550.464
## 52471 -37.28625 -8.398194 550.525
## 52472 -37.28597 -8.398194 550.815
## 52473 -37.28569 -8.398194 550.584
## 52474 -37.28541 -8.398194 550.472
## 52475 -37.28513 -8.398194 550.697
## 52476 -37.28486 -8.398194 551.352
## 52477 -37.28458 -8.398194 552.195
## 52478 -37.28430 -8.398194 552.603
## 52479 -37.28402 -8.398194 553.152
## 52480 -37.28375 -8.398194 553.672
## 52481 -37.28347 -8.398194 554.568
## 52482 -37.28319 -8.398194 555.332
## 52483 -37.28291 -8.398194 555.950
## 52484 -37.28263 -8.398194 556.595
## 52485 -37.28236 -8.398194 556.796
## 52486 -37.28208 -8.398194 556.816
## 52487 -37.28180 -8.398194 557.170
## 52488 -37.28152 -8.398194 557.842
## 52489 -37.28125 -8.398194 558.713
## 52490 -37.28097 -8.398194 559.862
## 52491 -37.28069 -8.398194 560.273
## 52492 -37.28041 -8.398194 560.596
## 52493 -37.28013 -8.398194 560.600
## 52494 -37.27986 -8.398194 560.706
## 52495 -37.27958 -8.398194 560.900
## 52496 -37.27930 -8.398194 561.530
## 52497 -37.27902 -8.398194 562.249
## 52498 -37.27875 -8.398194 563.068
## 52499 -37.27847 -8.398194 563.676
## 52500 -37.27819 -8.398194 564.074
## 52501 -37.27791 -8.398194 564.539
## 52502 -37.27763 -8.398194 565.107
## 52503 -37.27736 -8.398194 566.324
## 52504 -37.27708 -8.398194 567.805
## 52505 -37.27680 -8.398194 569.293
## 52506 -37.27652 -8.398194 570.412
## 52507 -37.27625 -8.398194 571.253
## 52508 -37.27597 -8.398194 571.681
## 52509 -37.27569 -8.398194 571.970
## 52510 -37.27541 -8.398194 571.943
## 52511 -37.27513 -8.398194 571.733
## 52512 -37.27486 -8.398194 571.558
## 52513 -37.27458 -8.398194 571.094
## 52514 -37.27430 -8.398194 570.712
## 52515 -37.27402 -8.398194 569.756
## 52516 -37.27375 -8.398194 568.622
## 52517 -37.27347 -8.398194 567.344
## 52518 -37.27319 -8.398194 566.473
## 52519 -37.27291 -8.398194 565.718
## 52520 -37.27263 -8.398194 564.602
## 52521 -37.27236 -8.398194 562.988
## 52522 -37.27208 -8.398194 561.326
## 52523 -37.27180 -8.398194 559.935
## 52524 -37.27152 -8.398194 558.669
## 52525 -37.27125 -8.398194 557.359
## 52526 -37.27097 -8.398194 556.129
## 52527 -37.27069 -8.398194 554.556
## 52528 -37.27041 -8.398194 553.252
## 52529 -37.27013 -8.398194 552.326
## 52530 -37.26986 -8.398194 552.482
## 52531 -37.26958 -8.398194 552.984
## 52532 -37.26930 -8.398194 553.813
## 52533 -37.26902 -8.398194 554.928
## 52534 -37.26875 -8.398194 555.940
## 52535 -37.26847 -8.398194 556.794
## 52536 -37.26819 -8.398194 556.869
## 52537 -37.26791 -8.398194 556.633
## 52538 -37.26763 -8.398194 556.301
## 52539 -37.26736 -8.398194 556.128
## 52540 -37.26708 -8.398194 555.798
## 52541 -37.26680 -8.398194 555.042
## 52542 -37.26652 -8.398194 553.829
## 52543 -37.26625 -8.398194 552.674
## 52544 -37.26597 -8.398194 551.419
## 52545 -37.26569 -8.398194 550.884
## 52546 -37.26541 -8.398194 550.462
## 52547 -37.26513 -8.398194 550.353
## 52548 -37.26486 -8.398194 550.224
## 52549 -37.26458 -8.398194 550.162
## 52550 -37.26430 -8.398194 550.395
## 52551 -37.26402 -8.398194 550.910
## 52552 -37.26375 -8.398194 551.549
## 52553 -37.26347 -8.398194 552.073
## 52554 -37.26319 -8.398194 551.678
## 52555 -37.26291 -8.398194 551.288
## 52556 -37.26263 -8.398194 550.760
## 52557 -37.26236 -8.398194 550.506
## 52566 -37.25986 -8.398194 553.458
## 52567 -37.25958 -8.398194 553.385
## 52568 -37.25930 -8.398194 553.568
## 52569 -37.25902 -8.398194 553.978
## 52570 -37.25875 -8.398194 554.522
## 52571 -37.25847 -8.398194 555.414
## 52572 -37.25819 -8.398194 556.566
## 52573 -37.25791 -8.398194 557.739
## 52574 -37.25763 -8.398194 559.147
## 52575 -37.25736 -8.398194 560.263
## 52576 -37.25708 -8.398194 561.357
## 52577 -37.25680 -8.398194 561.865
## 52578 -37.25652 -8.398194 562.411
## 52579 -37.25625 -8.398194 562.683
## 52580 -37.25597 -8.398194 562.557
## 52581 -37.25569 -8.398194 561.971
## 52582 -37.25541 -8.398194 561.031
## 52583 -37.25513 -8.398194 560.327
## 52584 -37.25486 -8.398194 559.587
## 52585 -37.25458 -8.398194 558.986
## 52586 -37.25430 -8.398194 558.856
## 52587 -37.25402 -8.398194 559.590
## 52588 -37.25375 -8.398194 561.018
## 52589 -37.25347 -8.398194 562.519
## 52590 -37.25319 -8.398194 563.844
## 52591 -37.25291 -8.398194 565.130
## 52592 -37.25263 -8.398194 566.013
## 52593 -37.25236 -8.398194 566.427
## 52594 -37.25208 -8.398194 566.825
## 52595 -37.25180 -8.398194 567.859
## 52596 -37.25152 -8.398194 569.398
## 52597 -37.25125 -8.398194 570.550
## 52598 -37.25097 -8.398194 571.337
## 52599 -37.25069 -8.398194 571.167
## 52600 -37.25041 -8.398194 570.955
## 52601 -37.25013 -8.398194 570.611
## 52602 -37.24986 -8.398194 570.748
## 52603 -37.24958 -8.398194 571.198
## 52604 -37.24930 -8.398194 571.813
## 52605 -37.24902 -8.398194 571.917
## 52606 -37.24875 -8.398194 571.802
## 52607 -37.24847 -8.398194 571.773
## 52608 -37.24819 -8.398194 572.353
## 52609 -37.24791 -8.398194 573.116
## 52610 -37.24763 -8.398194 573.298
## 52611 -37.24736 -8.398194 572.805
## 52612 -37.24708 -8.398194 572.269
## 52613 -37.24680 -8.398194 571.873
## 52614 -37.24652 -8.398194 572.038
## 52615 -37.24625 -8.398194 572.079
## 52616 -37.24597 -8.398194 572.567
## 52617 -37.24569 -8.398194 572.675
## 52618 -37.24541 -8.398194 572.551
## 52619 -37.24513 -8.398194 572.066
## 52620 -37.24486 -8.398194 571.228
## 52621 -37.24458 -8.398194 570.396
## 52622 -37.24430 -8.398194 569.569
## 52623 -37.24402 -8.398194 569.086
## 52624 -37.24375 -8.398194 568.599
## 52625 -37.24347 -8.398194 567.549
## 52626 -37.24319 -8.398194 565.782
## 52627 -37.24291 -8.398194 563.840
## 52628 -37.24263 -8.398194 562.342
## 52629 -37.24236 -8.398194 562.135
## 52630 -37.24208 -8.398194 562.094
## 52631 -37.24180 -8.398194 562.296
## 52632 -37.24152 -8.398194 561.970
## 52633 -37.24125 -8.398194 561.545
## 52634 -37.24097 -8.398194 560.983
## 52635 -37.24069 -8.398194 560.110
## 52636 -37.24041 -8.398194 559.227
## 52637 -37.24013 -8.398194 558.405
## 52638 -37.23986 -8.398194 558.144
## 52639 -37.23958 -8.398194 558.252
## 52640 -37.23930 -8.398194 558.650
## 52641 -37.23902 -8.398194 559.385
## 52642 -37.23875 -8.398194 560.289
## 52643 -37.23847 -8.398194 561.348
## 52644 -37.23819 -8.398194 561.600
## 52645 -37.23791 -8.398194 561.419
## 52646 -37.23763 -8.398194 560.886
## 52647 -37.23736 -8.398194 559.997
## 52648 -37.23708 -8.398194 559.181
## 52649 -37.23680 -8.398194 558.509
## 52650 -37.23652 -8.398194 558.358
## 52651 -37.23625 -8.398194 558.648
## 52652 -37.23597 -8.398194 559.106
## 52653 -37.23569 -8.398194 559.632
## 52654 -37.23541 -8.398194 560.197
## 52655 -37.23513 -8.398194 560.713
## 52656 -37.23486 -8.398194 560.599
## 53751 -37.30708 -8.398472 538.917
## 53752 -37.30680 -8.398472 538.042
## 53753 -37.30652 -8.398472 538.389
## 53754 -37.30625 -8.398472 538.855
## 53755 -37.30597 -8.398472 539.451
## 53756 -37.30569 -8.398472 539.714
## 53757 -37.30541 -8.398472 539.915
## 53758 -37.30513 -8.398472 540.041
## 53759 -37.30486 -8.398472 539.740
## 53760 -37.30458 -8.398472 539.510
## 53761 -37.30430 -8.398472 539.252
## 53762 -37.30402 -8.398472 539.500
## 53763 -37.30375 -8.398472 540.241
## 53764 -37.30347 -8.398472 541.516
## 53765 -37.30319 -8.398472 542.591
## 53766 -37.30291 -8.398472 543.539
## 53767 -37.30263 -8.398472 544.386
## 53768 -37.30236 -8.398472 544.600
## 53769 -37.30208 -8.398472 544.743
## 53770 -37.30180 -8.398472 544.550
## 53771 -37.30152 -8.398472 544.957
## 53772 -37.30125 -8.398472 545.619
## 53773 -37.30097 -8.398472 546.331
## 53774 -37.30069 -8.398472 546.477
## 53775 -37.30041 -8.398472 546.328
## 53776 -37.30013 -8.398472 546.120
## 53777 -37.29986 -8.398472 545.615
## 53778 -37.29958 -8.398472 544.967
## 53779 -37.29930 -8.398472 544.172
## 53780 -37.29902 -8.398472 544.235
## 53781 -37.29875 -8.398472 544.721
## 53782 -37.29847 -8.398472 545.605
## 53783 -37.29819 -8.398472 546.860
## 53784 -37.29791 -8.398472 547.987
## 53785 -37.29763 -8.398472 549.159
## 53786 -37.29736 -8.398472 549.736
## 53787 -37.29708 -8.398472 549.852
## 53788 -37.29680 -8.398472 550.046
## 53789 -37.29652 -8.398472 550.380
## 53790 -37.29625 -8.398472 550.968
## 53791 -37.29597 -8.398472 551.089
## 53792 -37.29569 -8.398472 551.156
## 53793 -37.29541 -8.398472 551.265
## 53794 -37.29513 -8.398472 551.477
## 53795 -37.29486 -8.398472 552.097
## 53796 -37.29458 -8.398472 552.671
## 53797 -37.29430 -8.398472 553.290
## 53798 -37.29402 -8.398472 553.382
## 53799 -37.29375 -8.398472 553.240
## 53800 -37.29347 -8.398472 552.917
## 53801 -37.29319 -8.398472 553.055
## 53802 -37.29291 -8.398472 553.240
## 53803 -37.29263 -8.398472 553.456
## 53804 -37.29236 -8.398472 553.360
## 53805 -37.29208 -8.398472 553.143
## 53806 -37.29180 -8.398472 552.866
## 53807 -37.29152 -8.398472 552.409
## 53808 -37.29125 -8.398472 551.989
## 53809 -37.29097 -8.398472 551.258
## 53810 -37.29069 -8.398472 550.789
## 53811 -37.29041 -8.398472 550.593
## 53812 -37.29013 -8.398472 550.563
## 53813 -37.28986 -8.398472 550.985
## 53814 -37.28958 -8.398472 551.286
## 53815 -37.28930 -8.398472 551.516
## 53816 -37.28902 -8.398472 551.205
## 53817 -37.28875 -8.398472 550.807
## 53818 -37.28847 -8.398472 550.831
## 53819 -37.28819 -8.398472 551.034
## 53820 -37.28791 -8.398472 551.293
## 53821 -37.28763 -8.398472 551.466
## 53822 -37.28736 -8.398472 551.837
## 53823 -37.28708 -8.398472 552.186
## 53824 -37.28680 -8.398472 552.042
## 53825 -37.28652 -8.398472 551.721
## 53826 -37.28625 -8.398472 551.502
## 53827 -37.28597 -8.398472 551.703
## 53828 -37.28569 -8.398472 551.370
## 53829 -37.28541 -8.398472 551.107
## 53830 -37.28513 -8.398472 551.037
## 53831 -37.28486 -8.398472 552.089
## 53832 -37.28458 -8.398472 553.195
## 53833 -37.28430 -8.398472 553.981
## 53834 -37.28402 -8.398472 553.873
## 53835 -37.28375 -8.398472 553.675
## 53836 -37.28347 -8.398472 554.247
## 53837 -37.28319 -8.398472 554.933
## 53838 -37.28291 -8.398472 555.744
## 53839 -37.28263 -8.398472 556.379
## 53840 -37.28236 -8.398472 556.732
## 53841 -37.28208 -8.398472 557.154
## 53842 -37.28180 -8.398472 557.473
## 53843 -37.28152 -8.398472 558.208
## 53844 -37.28125 -8.398472 559.159
## 53845 -37.28097 -8.398472 560.390
## 53846 -37.28069 -8.398472 560.768
## 53847 -37.28041 -8.398472 560.946
## 53848 -37.28013 -8.398472 560.839
## 53849 -37.27986 -8.398472 560.942
## 53850 -37.27958 -8.398472 561.189
## 53851 -37.27930 -8.398472 561.715
## 53852 -37.27902 -8.398472 562.370
## 53853 -37.27875 -8.398472 563.013
## 53854 -37.27847 -8.398472 563.857
## 53855 -37.27819 -8.398472 564.331
## 53856 -37.27791 -8.398472 564.877
## 53857 -37.27763 -8.398472 565.486
## 53858 -37.27736 -8.398472 566.590
## 53859 -37.27708 -8.398472 567.961
## 53860 -37.27680 -8.398472 569.410
## 53861 -37.27652 -8.398472 570.537
## 53862 -37.27625 -8.398472 571.364
## 53863 -37.27597 -8.398472 571.751
## 53864 -37.27569 -8.398472 572.258
## 53865 -37.27541 -8.398472 572.557
## 53866 -37.27513 -8.398472 572.450
## 53867 -37.27486 -8.398472 572.012
## 53868 -37.27458 -8.398472 571.374
## 53869 -37.27430 -8.398472 570.779
## 53870 -37.27402 -8.398472 570.105
## 53871 -37.27375 -8.398472 569.087
## 53872 -37.27347 -8.398472 567.769
## 53873 -37.27319 -8.398472 566.498
## 53874 -37.27291 -8.398472 565.158
## 53875 -37.27263 -8.398472 563.652
## 53876 -37.27236 -8.398472 562.032
## 53877 -37.27208 -8.398472 560.436
## 53878 -37.27180 -8.398472 559.307
## 53879 -37.27152 -8.398472 558.068
## 53880 -37.27125 -8.398472 556.966
## 53881 -37.27097 -8.398472 555.676
## 53882 -37.27069 -8.398472 554.803
## 53883 -37.27041 -8.398472 554.192
## 53884 -37.27013 -8.398472 553.792
## 53885 -37.26986 -8.398472 553.349
## 53886 -37.26958 -8.398472 553.474
## 53887 -37.26930 -8.398472 553.803
## 53888 -37.26902 -8.398472 555.100
## 53889 -37.26875 -8.398472 556.271
## 53890 -37.26847 -8.398472 557.214
## 53891 -37.26819 -8.398472 557.507
## 53892 -37.26791 -8.398472 557.495
## 53893 -37.26763 -8.398472 557.422
## 53894 -37.26736 -8.398472 557.202
## 53895 -37.26708 -8.398472 556.724
## 53896 -37.26680 -8.398472 555.910
## 53897 -37.26652 -8.398472 554.811
## 53898 -37.26625 -8.398472 553.745
## 53899 -37.26597 -8.398472 552.510
## 53900 -37.26569 -8.398472 551.978
## 53901 -37.26541 -8.398472 551.673
## 53902 -37.26513 -8.398472 551.555
## 53903 -37.26486 -8.398472 551.450
## 53904 -37.26458 -8.398472 551.233
## 53905 -37.26430 -8.398472 551.472
## 53906 -37.26402 -8.398472 551.659
## 53907 -37.26375 -8.398472 551.758
## 53908 -37.26347 -8.398472 551.810
## 53909 -37.26319 -8.398472 551.648
## 53910 -37.26291 -8.398472 551.488
## 53911 -37.26263 -8.398472 551.158
## 53912 -37.26236 -8.398472 550.284
## 53913 -37.26208 -8.398472 549.854
## 53914 -37.26180 -8.398472 549.355
## 53921 -37.25986 -8.398472 552.478
## 53922 -37.25958 -8.398472 552.646
## 53923 -37.25930 -8.398472 553.031
## 53924 -37.25902 -8.398472 553.861
## 53925 -37.25875 -8.398472 554.864
## 53926 -37.25847 -8.398472 556.016
## 53927 -37.25819 -8.398472 557.199
## 53928 -37.25791 -8.398472 558.319
## 53929 -37.25763 -8.398472 559.518
## 53930 -37.25736 -8.398472 560.400
## 53931 -37.25708 -8.398472 561.188
## 53932 -37.25680 -8.398472 561.546
## 53933 -37.25652 -8.398472 562.100
## 53934 -37.25625 -8.398472 562.263
## 53935 -37.25597 -8.398472 562.088
## 53936 -37.25569 -8.398472 561.810
## 53937 -37.25541 -8.398472 561.357
## 53938 -37.25513 -8.398472 560.837
## 53939 -37.25486 -8.398472 560.021
## 53940 -37.25458 -8.398472 559.330
## 53941 -37.25430 -8.398472 559.117
## 53942 -37.25402 -8.398472 559.493
## 53943 -37.25375 -8.398472 560.406
## 53944 -37.25347 -8.398472 561.581
## 53945 -37.25319 -8.398472 562.635
## 53946 -37.25291 -8.398472 563.553
## 53947 -37.25263 -8.398472 564.168
## 53948 -37.25236 -8.398472 565.054
## 53949 -37.25208 -8.398472 566.097
## 53950 -37.25180 -8.398472 567.540
## 53951 -37.25152 -8.398472 569.110
## 53952 -37.25125 -8.398472 570.575
## 53953 -37.25097 -8.398472 571.570
## 53954 -37.25069 -8.398472 571.192
## 53955 -37.25041 -8.398472 570.635
## 53956 -37.25013 -8.398472 569.974
## 53957 -37.24986 -8.398472 570.578
## 53958 -37.24958 -8.398472 571.370
## 53959 -37.24930 -8.398472 572.345
## 53960 -37.24902 -8.398472 572.285
## 53961 -37.24875 -8.398472 572.037
## 53962 -37.24847 -8.398472 571.946
## 53963 -37.24819 -8.398472 572.400
## 53964 -37.24791 -8.398472 572.900
## 53965 -37.24763 -8.398472 572.914
## 53966 -37.24736 -8.398472 572.778
## 53967 -37.24708 -8.398472 572.448
## 53968 -37.24680 -8.398472 572.558
## 53969 -37.24652 -8.398472 572.668
## 53970 -37.24625 -8.398472 572.762
## 53971 -37.24597 -8.398472 573.314
## 53972 -37.24569 -8.398472 573.555
## 53973 -37.24541 -8.398472 573.551
## 53974 -37.24513 -8.398472 573.135
## 53975 -37.24486 -8.398472 572.151
## 53976 -37.24458 -8.398472 571.151
## 53977 -37.24430 -8.398472 570.221
## 53978 -37.24402 -8.398472 569.626
## 53979 -37.24375 -8.398472 569.038
## 53980 -37.24347 -8.398472 567.902
## 53981 -37.24319 -8.398472 566.398
## 53982 -37.24291 -8.398472 564.917
## 53983 -37.24263 -8.398472 563.849
## 53984 -37.24236 -8.398472 563.220
## 53985 -37.24208 -8.398472 562.996
## 53986 -37.24180 -8.398472 562.942
## 53987 -37.24152 -8.398472 563.204
## 53988 -37.24125 -8.398472 563.249
## 53989 -37.24097 -8.398472 562.898
## 53990 -37.24069 -8.398472 562.150
## 53991 -37.24041 -8.398472 561.407
## 53992 -37.24013 -8.398472 560.674
## 53993 -37.23986 -8.398472 560.007
## 53994 -37.23958 -8.398472 559.815
## 53995 -37.23930 -8.398472 559.912
## 53996 -37.23902 -8.398472 560.765
## 53997 -37.23875 -8.398472 561.751
## 53998 -37.23847 -8.398472 562.850
## 53999 -37.23819 -8.398472 563.125
## 54000 -37.23791 -8.398472 562.973
## 54001 -37.23763 -8.398472 562.380
## 54002 -37.23736 -8.398472 561.365
## 54003 -37.23708 -8.398472 560.356
## 54004 -37.23680 -8.398472 559.356
## 54005 -37.23652 -8.398472 559.032
## 54006 -37.23625 -8.398472 559.039
## 54007 -37.23597 -8.398472 559.288
## 54008 -37.23569 -8.398472 559.549
## 54009 -37.23541 -8.398472 559.792
## 54010 -37.23513 -8.398472 559.842
## 54011 -37.23486 -8.398472 560.136
## 54012 -37.23458 -8.398472 560.023
## 54013 -37.23430 -8.398472 560.130
## 55105 -37.30736 -8.398750 539.258
## 55106 -37.30708 -8.398750 538.008
## 55107 -37.30680 -8.398750 537.161
## 55108 -37.30652 -8.398750 537.600
## 55109 -37.30625 -8.398750 538.337
## 55110 -37.30597 -8.398750 539.268
## 55111 -37.30569 -8.398750 539.851
## 55112 -37.30541 -8.398750 540.234
## 55113 -37.30513 -8.398750 540.289
## 55114 -37.30486 -8.398750 539.917
## 55115 -37.30458 -8.398750 539.497
## 55116 -37.30430 -8.398750 539.260
## 55117 -37.30402 -8.398750 539.669
## 55118 -37.30375 -8.398750 540.469
## 55119 -37.30347 -8.398750 541.710
## 55120 -37.30319 -8.398750 542.737
## 55121 -37.30291 -8.398750 543.858
## 55122 -37.30263 -8.398750 544.706
## 55123 -37.30236 -8.398750 545.149
## 55124 -37.30208 -8.398750 545.418
## 55125 -37.30180 -8.398750 545.587
## 55126 -37.30152 -8.398750 546.525
## 55127 -37.30125 -8.398750 547.271
## 55128 -37.30097 -8.398750 547.860
## 55129 -37.30069 -8.398750 547.817
## 55130 -37.30041 -8.398750 547.497
## 55131 -37.30013 -8.398750 546.962
## 55132 -37.29986 -8.398750 546.292
## 55133 -37.29958 -8.398750 545.671
## 55134 -37.29930 -8.398750 545.160
## 55135 -37.29902 -8.398750 545.298
## 55136 -37.29875 -8.398750 545.696
## 55137 -37.29847 -8.398750 546.657
## 55138 -37.29819 -8.398750 547.457
## 55139 -37.29791 -8.398750 548.487
## 55140 -37.29763 -8.398750 549.305
## 55141 -37.29736 -8.398750 549.554
## 55142 -37.29708 -8.398750 549.634
## 55143 -37.29680 -8.398750 549.724
## 55144 -37.29652 -8.398750 550.352
## 55145 -37.29625 -8.398750 551.061
## 55146 -37.29597 -8.398750 551.488
## 55147 -37.29569 -8.398750 551.836
## 55148 -37.29541 -8.398750 551.936
## 55149 -37.29513 -8.398750 552.189
## 55150 -37.29486 -8.398750 552.733
## 55151 -37.29458 -8.398750 553.331
## 55152 -37.29430 -8.398750 553.800
## 55153 -37.29402 -8.398750 553.601
## 55154 -37.29375 -8.398750 553.362
## 55155 -37.29347 -8.398750 553.182
## 55156 -37.29319 -8.398750 553.277
## 55157 -37.29291 -8.398750 553.468
## 55158 -37.29263 -8.398750 553.600
## 55159 -37.29236 -8.398750 553.487
## 55160 -37.29208 -8.398750 553.266
## 55161 -37.29180 -8.398750 552.792
## 55162 -37.29152 -8.398750 552.604
## 55163 -37.29125 -8.398750 552.283
## 55164 -37.29097 -8.398750 551.880
## 55165 -37.29069 -8.398750 551.794
## 55166 -37.29041 -8.398750 551.750
## 55167 -37.29013 -8.398750 551.918
## 55168 -37.28986 -8.398750 552.415
## 55169 -37.28958 -8.398750 552.874
## 55170 -37.28930 -8.398750 553.021
## 55171 -37.28902 -8.398750 552.678
## 55172 -37.28875 -8.398750 552.076
## 55173 -37.28847 -8.398750 551.601
## 55174 -37.28819 -8.398750 551.420
## 55175 -37.28791 -8.398750 551.552
## 55176 -37.28763 -8.398750 551.972
## 55177 -37.28736 -8.398750 552.582
## 55178 -37.28708 -8.398750 553.216
## 55179 -37.28680 -8.398750 553.526
## 55180 -37.28652 -8.398750 553.604
## 55181 -37.28625 -8.398750 553.376
## 55182 -37.28597 -8.398750 553.186
## 55183 -37.28569 -8.398750 552.502
## 55184 -37.28541 -8.398750 552.212
## 55185 -37.28513 -8.398750 552.430
## 55186 -37.28486 -8.398750 553.543
## 55187 -37.28458 -8.398750 554.761
## 55188 -37.28430 -8.398750 555.679
## 55189 -37.28402 -8.398750 555.205
## 55190 -37.28375 -8.398750 554.637
## 55191 -37.28347 -8.398750 554.342
## 55192 -37.28319 -8.398750 554.486
## 55193 -37.28291 -8.398750 555.033
## 55194 -37.28263 -8.398750 555.659
## 55195 -37.28236 -8.398750 556.125
## 55196 -37.28208 -8.398750 556.676
## 55197 -37.28180 -8.398750 557.266
## 55198 -37.28152 -8.398750 558.419
## 55199 -37.28125 -8.398750 559.452
## 55200 -37.28097 -8.398750 560.345
## 55201 -37.28069 -8.398750 560.802
## 55202 -37.28041 -8.398750 561.062
## 55203 -37.28013 -8.398750 561.217
## 55204 -37.27986 -8.398750 561.436
## 55205 -37.27958 -8.398750 561.693
## 55206 -37.27930 -8.398750 562.191
## 55207 -37.27902 -8.398750 562.756
## 55208 -37.27875 -8.398750 563.429
## 55209 -37.27847 -8.398750 564.139
## 55210 -37.27819 -8.398750 564.547
## 55211 -37.27791 -8.398750 565.055
## 55212 -37.27763 -8.398750 565.734
## 55213 -37.27736 -8.398750 566.758
## 55214 -37.27708 -8.398750 567.925
## 55215 -37.27680 -8.398750 569.216
## 55216 -37.27652 -8.398750 570.135
## 55217 -37.27625 -8.398750 571.036
## 55218 -37.27597 -8.398750 571.692
## 55219 -37.27569 -8.398750 572.376
## 55220 -37.27541 -8.398750 572.722
## 55221 -37.27513 -8.398750 572.722
## 55222 -37.27486 -8.398750 572.290
## 55223 -37.27458 -8.398750 571.624
## 55224 -37.27430 -8.398750 570.964
## 55225 -37.27402 -8.398750 570.010
## 55226 -37.27375 -8.398750 569.030
## 55227 -37.27347 -8.398750 567.664
## 55228 -37.27319 -8.398750 566.334
## 55229 -37.27291 -8.398750 564.678
## 55230 -37.27263 -8.398750 562.944
## 55231 -37.27236 -8.398750 561.270
## 55232 -37.27208 -8.398750 559.736
## 55233 -37.27180 -8.398750 558.501
## 55234 -37.27152 -8.398750 557.466
## 55235 -37.27125 -8.398750 556.706
## 55236 -37.27097 -8.398750 555.973
## 55237 -37.27069 -8.398750 555.625
## 55238 -37.27041 -8.398750 555.233
## 55239 -37.27013 -8.398750 554.864
## 55240 -37.26986 -8.398750 554.425
## 55241 -37.26958 -8.398750 554.222
## 55242 -37.26930 -8.398750 554.375
## 55243 -37.26902 -8.398750 555.275
## 55244 -37.26875 -8.398750 556.353
## 55245 -37.26847 -8.398750 557.424
## 55246 -37.26819 -8.398750 557.736
## 55247 -37.26791 -8.398750 557.866
## 55248 -37.26763 -8.398750 557.727
## 55249 -37.26736 -8.398750 557.701
## 55250 -37.26708 -8.398750 557.378
## 55251 -37.26680 -8.398750 556.566
## 55252 -37.26652 -8.398750 555.823
## 55253 -37.26625 -8.398750 554.819
## 55254 -37.26597 -8.398750 553.935
## 55255 -37.26569 -8.398750 553.455
## 55256 -37.26541 -8.398750 553.165
## 55257 -37.26513 -8.398750 552.946
## 55258 -37.26486 -8.398750 552.620
## 55259 -37.26458 -8.398750 552.301
## 55260 -37.26430 -8.398750 552.103
## 55261 -37.26402 -8.398750 551.812
## 55262 -37.26375 -8.398750 551.630
## 55263 -37.26347 -8.398750 551.373
## 55264 -37.26319 -8.398750 551.406
## 55265 -37.26291 -8.398750 551.247
## 55266 -37.26263 -8.398750 550.865
## 55267 -37.26236 -8.398750 550.080
## 55268 -37.26208 -8.398750 549.388
## 55269 -37.26180 -8.398750 549.142
## 55270 -37.26152 -8.398750 549.633
## 55271 -37.26125 -8.398750 550.544
## 55275 -37.26013 -8.398750 551.708
## 55276 -37.25986 -8.398750 551.804
## 55277 -37.25958 -8.398750 552.048
## 55278 -37.25930 -8.398750 552.633
## 55279 -37.25902 -8.398750 553.542
## 55280 -37.25875 -8.398750 554.705
## 55281 -37.25847 -8.398750 555.993
## 55282 -37.25819 -8.398750 557.083
## 55283 -37.25791 -8.398750 558.132
## 55284 -37.25763 -8.398750 559.059
## 55285 -37.25736 -8.398750 559.797
## 55286 -37.25708 -8.398750 560.391
## 55287 -37.25680 -8.398750 560.753
## 55288 -37.25652 -8.398750 561.301
## 55289 -37.25625 -8.398750 561.572
## 55290 -37.25597 -8.398750 561.635
## 55291 -37.25569 -8.398750 561.576
## 55292 -37.25541 -8.398750 561.292
## 55293 -37.25513 -8.398750 560.757
## 55294 -37.25486 -8.398750 559.907
## 55295 -37.25458 -8.398750 559.160
## 55296 -37.25430 -8.398750 558.753
## 55297 -37.25402 -8.398750 559.001
## 55298 -37.25375 -8.398750 559.643
## 55299 -37.25347 -8.398750 560.484
## 55300 -37.25319 -8.398750 561.232
## 55301 -37.25291 -8.398750 562.020
## 55302 -37.25263 -8.398750 562.833
## 55303 -37.25236 -8.398750 563.902
## 55304 -37.25208 -8.398750 565.105
## 55305 -37.25180 -8.398750 566.725
## 55306 -37.25152 -8.398750 568.372
## 55307 -37.25125 -8.398750 569.902
## 55308 -37.25097 -8.398750 570.684
## 55309 -37.25069 -8.398750 570.508
## 55310 -37.25041 -8.398750 569.936
## 55311 -37.25013 -8.398750 569.693
## 55312 -37.24986 -8.398750 570.518
## 55313 -37.24958 -8.398750 571.578
## 55314 -37.24930 -8.398750 572.438
## 55315 -37.24902 -8.398750 572.350
## 55316 -37.24875 -8.398750 572.165
## 55317 -37.24847 -8.398750 571.932
## 55318 -37.24819 -8.398750 572.479
## 55319 -37.24791 -8.398750 572.987
## 55320 -37.24763 -8.398750 573.373
## 55321 -37.24736 -8.398750 573.498
## 55322 -37.24708 -8.398750 573.490
## 55323 -37.24680 -8.398750 573.635
## 55324 -37.24652 -8.398750 573.486
## 55325 -37.24625 -8.398750 573.558
## 55326 -37.24597 -8.398750 573.836
## 55327 -37.24569 -8.398750 573.885
## 55328 -37.24541 -8.398750 573.905
## 55329 -37.24513 -8.398750 573.573
## 55330 -37.24486 -8.398750 572.698
## 55331 -37.24458 -8.398750 571.650
## 55332 -37.24430 -8.398750 570.576
## 55333 -37.24402 -8.398750 570.238
## 55334 -37.24375 -8.398750 569.689
## 55335 -37.24347 -8.398750 568.922
## 55336 -37.24319 -8.398750 567.533
## 55337 -37.24291 -8.398750 566.103
## 55338 -37.24263 -8.398750 564.882
## 55339 -37.24236 -8.398750 564.089
## 55340 -37.24208 -8.398750 563.712
## 55341 -37.24180 -8.398750 563.733
## 55342 -37.24152 -8.398750 563.916
## 55343 -37.24125 -8.398750 564.179
## 55344 -37.24097 -8.398750 564.156
## 55345 -37.24069 -8.398750 563.826
## 55346 -37.24041 -8.398750 563.213
## 55347 -37.24013 -8.398750 562.510
## 55348 -37.23986 -8.398750 561.865
## 55349 -37.23958 -8.398750 561.496
## 55350 -37.23930 -8.398750 561.623
## 55351 -37.23902 -8.398750 562.397
## 55352 -37.23875 -8.398750 563.352
## 55353 -37.23847 -8.398750 564.285
## 55354 -37.23819 -8.398750 564.515
## 55355 -37.23791 -8.398750 564.416
## 55356 -37.23763 -8.398750 563.875
## 55357 -37.23736 -8.398750 562.908
## 55358 -37.23708 -8.398750 561.839
## 55359 -37.23680 -8.398750 560.854
## 55360 -37.23652 -8.398750 560.516
## 55361 -37.23625 -8.398750 560.359
## 55362 -37.23597 -8.398750 560.439
## 55363 -37.23569 -8.398750 560.496
## 55364 -37.23541 -8.398750 560.614
## 55365 -37.23513 -8.398750 560.724
## 55366 -37.23486 -8.398750 560.874
## 55367 -37.23458 -8.398750 560.782
## 55368 -37.23430 -8.398750 560.354
## 56460 -37.30736 -8.399028 538.448
## 56461 -37.30708 -8.399028 537.282
## 56462 -37.30680 -8.399028 536.523
## 56463 -37.30652 -8.399028 536.967
## 56464 -37.30625 -8.399028 537.747
## 56465 -37.30597 -8.399028 538.927
## 56466 -37.30569 -8.399028 539.719
## 56467 -37.30541 -8.399028 540.235
## 56468 -37.30513 -8.399028 540.250
## 56469 -37.30486 -8.399028 539.795
## 56470 -37.30458 -8.399028 539.223
## 56471 -37.30430 -8.399028 539.000
## 56472 -37.30402 -8.399028 539.508
## 56473 -37.30375 -8.399028 540.217
## 56474 -37.30347 -8.399028 541.133
## 56475 -37.30319 -8.399028 542.306
## 56476 -37.30291 -8.399028 543.560
## 56477 -37.30263 -8.399028 544.477
## 56478 -37.30236 -8.399028 545.069
## 56479 -37.30208 -8.399028 545.482
## 56480 -37.30180 -8.399028 546.299
## 56481 -37.30152 -8.399028 547.431
## 56482 -37.30125 -8.399028 548.245
## 56483 -37.30097 -8.399028 548.610
## 56484 -37.30069 -8.399028 548.444
## 56485 -37.30041 -8.399028 548.048
## 56486 -37.30013 -8.399028 547.166
## 56487 -37.29986 -8.399028 546.526
## 56488 -37.29958 -8.399028 545.997
## 56489 -37.29930 -8.399028 546.017
## 56490 -37.29902 -8.399028 546.041
## 56491 -37.29875 -8.399028 546.320
## 56492 -37.29847 -8.399028 546.881
## 56493 -37.29819 -8.399028 547.728
## 56494 -37.29791 -8.399028 548.725
## 56495 -37.29763 -8.399028 549.127
## 56496 -37.29736 -8.399028 549.123
## 56497 -37.29708 -8.399028 549.020
## 56498 -37.29680 -8.399028 549.182
## 56499 -37.29652 -8.399028 550.078
## 56500 -37.29625 -8.399028 551.050
## 56501 -37.29597 -8.399028 552.035
## 56502 -37.29569 -8.399028 552.416
## 56503 -37.29541 -8.399028 552.534
## 56504 -37.29513 -8.399028 552.703
## 56505 -37.29486 -8.399028 553.268
## 56506 -37.29458 -8.399028 553.850
## 56507 -37.29430 -8.399028 553.987
## 56508 -37.29402 -8.399028 553.626
## 56509 -37.29375 -8.399028 553.309
## 56510 -37.29347 -8.399028 553.209
## 56511 -37.29319 -8.399028 553.377
## 56512 -37.29291 -8.399028 553.595
## 56513 -37.29263 -8.399028 553.672
## 56514 -37.29236 -8.399028 553.563
## 56515 -37.29208 -8.399028 553.328
## 56516 -37.29180 -8.399028 552.990
## 56517 -37.29152 -8.399028 552.773
## 56518 -37.29125 -8.399028 552.551
## 56519 -37.29097 -8.399028 552.718
## 56520 -37.29069 -8.399028 552.868
## 56521 -37.29041 -8.399028 553.035
## 56522 -37.29013 -8.399028 553.351
## 56523 -37.28986 -8.399028 553.937
## 56524 -37.28958 -8.399028 554.397
## 56525 -37.28930 -8.399028 554.588
## 56526 -37.28902 -8.399028 554.071
## 56527 -37.28875 -8.399028 553.220
## 56528 -37.28847 -8.399028 552.233
## 56529 -37.28819 -8.399028 551.819
## 56530 -37.28791 -8.399028 551.894
## 56531 -37.28763 -8.399028 552.362
## 56532 -37.28736 -8.399028 553.404
## 56533 -37.28708 -8.399028 554.255
## 56534 -37.28680 -8.399028 555.172
## 56535 -37.28652 -8.399028 555.454
## 56536 -37.28625 -8.399028 555.199
## 56537 -37.28597 -8.399028 554.352
## 56538 -37.28569 -8.399028 553.681
## 56539 -37.28541 -8.399028 553.448
## 56540 -37.28513 -8.399028 553.876
## 56541 -37.28486 -8.399028 555.141
## 56542 -37.28458 -8.399028 556.365
## 56543 -37.28430 -8.399028 557.232
## 56544 -37.28402 -8.399028 556.722
## 56545 -37.28375 -8.399028 555.631
## 56546 -37.28347 -8.399028 554.432
## 56547 -37.28319 -8.399028 554.111
## 56548 -37.28291 -8.399028 554.336
## 56549 -37.28263 -8.399028 554.854
## 56550 -37.28236 -8.399028 555.381
## 56551 -37.28208 -8.399028 556.147
## 56552 -37.28180 -8.399028 557.102
## 56553 -37.28152 -8.399028 558.428
## 56554 -37.28125 -8.399028 559.478
## 56555 -37.28097 -8.399028 560.050
## 56556 -37.28069 -8.399028 560.537
## 56557 -37.28041 -8.399028 560.924
## 56558 -37.28013 -8.399028 561.435
## 56559 -37.27986 -8.399028 561.823
## 56560 -37.27958 -8.399028 562.215
## 56561 -37.27930 -8.399028 562.524
## 56562 -37.27902 -8.399028 563.156
## 56563 -37.27875 -8.399028 563.805
## 56564 -37.27847 -8.399028 564.270
## 56565 -37.27819 -8.399028 564.689
## 56566 -37.27791 -8.399028 565.157
## 56567 -37.27763 -8.399028 565.834
## 56568 -37.27736 -8.399028 566.762
## 56569 -37.27708 -8.399028 567.613
## 56570 -37.27680 -8.399028 568.569
## 56571 -37.27652 -8.399028 569.433
## 56572 -37.27625 -8.399028 570.438
## 56573 -37.27597 -8.399028 571.528
## 56574 -37.27569 -8.399028 572.244
## 56575 -37.27541 -8.399028 572.632
## 56576 -37.27513 -8.399028 572.811
## 56577 -37.27486 -8.399028 572.417
## 56578 -37.27458 -8.399028 571.815
## 56579 -37.27430 -8.399028 570.815
## 56580 -37.27402 -8.399028 569.933
## 56581 -37.27375 -8.399028 569.040
## 56582 -37.27347 -8.399028 567.943
## 56583 -37.27319 -8.399028 566.345
## 56584 -37.27291 -8.399028 564.432
## 56585 -37.27263 -8.399028 562.478
## 56586 -37.27236 -8.399028 560.762
## 56587 -37.27208 -8.399028 559.184
## 56588 -37.27180 -8.399028 557.825
## 56589 -37.27152 -8.399028 557.135
## 56590 -37.27125 -8.399028 556.774
## 56591 -37.27097 -8.399028 556.812
## 56592 -37.27069 -8.399028 556.720
## 56593 -37.27041 -8.399028 556.433
## 56594 -37.27013 -8.399028 556.144
## 56595 -37.26986 -8.399028 555.577
## 56596 -37.26958 -8.399028 555.117
## 56597 -37.26930 -8.399028 554.962
## 56598 -37.26902 -8.399028 555.404
## 56599 -37.26875 -8.399028 556.277
## 56600 -37.26847 -8.399028 557.243
## 56601 -37.26819 -8.399028 557.641
## 56602 -37.26791 -8.399028 557.911
## 56603 -37.26763 -8.399028 557.970
## 56604 -37.26736 -8.399028 558.012
## 56605 -37.26708 -8.399028 557.963
## 56606 -37.26680 -8.399028 557.560
## 56607 -37.26652 -8.399028 556.882
## 56608 -37.26625 -8.399028 556.050
## 56609 -37.26597 -8.399028 555.393
## 56610 -37.26569 -8.399028 554.990
## 56611 -37.26541 -8.399028 554.701
## 56612 -37.26513 -8.399028 554.325
## 56613 -37.26486 -8.399028 553.761
## 56614 -37.26458 -8.399028 553.305
## 56615 -37.26430 -8.399028 552.531
## 56616 -37.26402 -8.399028 551.900
## 56617 -37.26375 -8.399028 551.476
## 56618 -37.26347 -8.399028 551.177
## 56619 -37.26319 -8.399028 551.166
## 56620 -37.26291 -8.399028 551.002
## 56621 -37.26263 -8.399028 550.738
## 56622 -37.26236 -8.399028 550.054
## 56623 -37.26208 -8.399028 549.329
## 56624 -37.26180 -8.399028 549.068
## 56625 -37.26152 -8.399028 549.587
## 56626 -37.26125 -8.399028 550.347
## 56627 -37.26097 -8.399028 551.031
## 56630 -37.26013 -8.399028 551.348
## 56631 -37.25986 -8.399028 551.369
## 56632 -37.25958 -8.399028 551.633
## 56633 -37.25930 -8.399028 552.179
## 56634 -37.25902 -8.399028 553.138
## 56635 -37.25875 -8.399028 554.311
## 56636 -37.25847 -8.399028 555.547
## 56637 -37.25819 -8.399028 556.583
## 56638 -37.25791 -8.399028 557.526
## 56639 -37.25763 -8.399028 558.228
## 56640 -37.25736 -8.399028 558.847
## 56641 -37.25708 -8.399028 559.292
## 56642 -37.25680 -8.399028 559.846
## 56643 -37.25652 -8.399028 560.327
## 56644 -37.25625 -8.399028 560.728
## 56645 -37.25597 -8.399028 561.091
## 56646 -37.25569 -8.399028 561.114
## 56647 -37.25541 -8.399028 560.891
## 56648 -37.25513 -8.399028 560.359
## 56649 -37.25486 -8.399028 559.433
## 56650 -37.25458 -8.399028 558.785
## 56651 -37.25430 -8.399028 558.207
## 56652 -37.25402 -8.399028 558.339
## 56653 -37.25375 -8.399028 558.827
## 56654 -37.25347 -8.399028 559.368
## 56655 -37.25319 -8.399028 559.976
## 56656 -37.25291 -8.399028 560.708
## 56657 -37.25263 -8.399028 561.732
## 56658 -37.25236 -8.399028 562.911
## 56659 -37.25208 -8.399028 564.148
## 56660 -37.25180 -8.399028 565.581
## 56661 -37.25152 -8.399028 567.325
## 56662 -37.25125 -8.399028 568.951
## 56663 -37.25097 -8.399028 569.788
## 56664 -37.25069 -8.399028 569.557
## 56665 -37.25041 -8.399028 569.060
## 56666 -37.25013 -8.399028 569.166
## 56667 -37.24986 -8.399028 570.303
## 56668 -37.24958 -8.399028 571.495
## 56669 -37.24930 -8.399028 572.204
## 56670 -37.24902 -8.399028 572.217
## 56671 -37.24875 -8.399028 572.155
## 56672 -37.24847 -8.399028 572.064
## 56673 -37.24819 -8.399028 572.594
## 56674 -37.24791 -8.399028 573.180
## 56675 -37.24763 -8.399028 573.953
## 56676 -37.24736 -8.399028 574.360
## 56677 -37.24708 -8.399028 574.561
## 56678 -37.24680 -8.399028 574.411
## 56679 -37.24652 -8.399028 574.270
## 56680 -37.24625 -8.399028 574.139
## 56681 -37.24597 -8.399028 573.980
## 56682 -37.24569 -8.399028 574.009
## 56683 -37.24541 -8.399028 574.051
## 56684 -37.24513 -8.399028 573.885
## 56685 -37.24486 -8.399028 573.155
## 56686 -37.24458 -8.399028 572.214
## 56687 -37.24430 -8.399028 571.292
## 56688 -37.24402 -8.399028 570.915
## 56689 -37.24375 -8.399028 570.515
## 56690 -37.24347 -8.399028 569.934
## 56691 -37.24319 -8.399028 568.684
## 56692 -37.24291 -8.399028 567.284
## 56693 -37.24263 -8.399028 565.872
## 56694 -37.24236 -8.399028 564.914
## 56695 -37.24208 -8.399028 564.323
## 56696 -37.24180 -8.399028 564.227
## 56697 -37.24152 -8.399028 564.443
## 56698 -37.24125 -8.399028 564.921
## 56699 -37.24097 -8.399028 565.418
## 56700 -37.24069 -8.399028 565.299
## 56701 -37.24041 -8.399028 564.848
## 56702 -37.24013 -8.399028 564.238
## 56703 -37.23986 -8.399028 563.674
## 56704 -37.23958 -8.399028 563.234
## 56705 -37.23930 -8.399028 563.281
## 56706 -37.23902 -8.399028 564.002
## 56707 -37.23875 -8.399028 564.847
## 56708 -37.23847 -8.399028 565.503
## 56709 -37.23819 -8.399028 565.780
## 56710 -37.23791 -8.399028 565.784
## 56711 -37.23763 -8.399028 565.397
## 56712 -37.23736 -8.399028 564.581
## 56713 -37.23708 -8.399028 563.617
## 56714 -37.23680 -8.399028 562.913
## 56715 -37.23652 -8.399028 562.470
## 56716 -37.23625 -8.399028 562.219
## 56717 -37.23597 -8.399028 562.071
## 56718 -37.23569 -8.399028 562.127
## 56719 -37.23541 -8.399028 562.196
## 56720 -37.23513 -8.399028 562.326
## 56721 -37.23486 -8.399028 562.361
## 56722 -37.23458 -8.399028 562.137
## 56723 -37.23430 -8.399028 561.375
## 57814 -37.30763 -8.399306 538.803
## 57815 -37.30736 -8.399306 537.798
## 57816 -37.30708 -8.399306 536.760
## 57817 -37.30680 -8.399306 536.293
## 57818 -37.30652 -8.399306 536.391
## 57819 -37.30625 -8.399306 537.307
## 57820 -37.30597 -8.399306 538.448
## 57821 -37.30569 -8.399306 539.321
## 57822 -37.30541 -8.399306 539.876
## 57823 -37.30513 -8.399306 539.847
## 57824 -37.30486 -8.399306 539.409
## 57825 -37.30458 -8.399306 538.812
## 57826 -37.30430 -8.399306 538.543
## 57827 -37.30402 -8.399306 538.870
## 57828 -37.30375 -8.399306 539.462
## 57829 -37.30347 -8.399306 540.243
## 57830 -37.30319 -8.399306 541.472
## 57831 -37.30291 -8.399306 542.910
## 57832 -37.30263 -8.399306 543.990
## 57833 -37.30236 -8.399306 544.644
## 57834 -37.30208 -8.399306 545.184
## 57835 -37.30180 -8.399306 546.084
## 57836 -37.30152 -8.399306 547.169
## 57837 -37.30125 -8.399306 547.908
## 57838 -37.30097 -8.399306 548.348
## 57839 -37.30069 -8.399306 548.021
## 57840 -37.30041 -8.399306 547.379
## 57841 -37.30013 -8.399306 546.413
## 57842 -37.29986 -8.399306 546.011
## 57843 -37.29958 -8.399306 545.618
## 57844 -37.29930 -8.399306 545.945
## 57845 -37.29902 -8.399306 545.717
## 57846 -37.29875 -8.399306 545.815
## 57847 -37.29847 -8.399306 546.232
## 57848 -37.29819 -8.399306 547.189
## 57849 -37.29791 -8.399306 548.389
## 57850 -37.29763 -8.399306 548.943
## 57851 -37.29736 -8.399306 548.808
## 57852 -37.29708 -8.399306 548.647
## 57853 -37.29680 -8.399306 548.509
## 57854 -37.29652 -8.399306 549.740
## 57855 -37.29625 -8.399306 550.979
## 57856 -37.29597 -8.399306 552.259
## 57857 -37.29569 -8.399306 552.645
## 57858 -37.29541 -8.399306 552.775
## 57859 -37.29513 -8.399306 552.913
## 57860 -37.29486 -8.399306 553.421
## 57861 -37.29458 -8.399306 553.833
## 57862 -37.29430 -8.399306 553.964
## 57863 -37.29402 -8.399306 553.583
## 57864 -37.29375 -8.399306 553.135
## 57865 -37.29347 -8.399306 552.985
## 57866 -37.29319 -8.399306 553.341
## 57867 -37.29291 -8.399306 553.806
## 57868 -37.29263 -8.399306 554.009
## 57869 -37.29236 -8.399306 553.915
## 57870 -37.29208 -8.399306 553.659
## 57871 -37.29180 -8.399306 553.299
## 57872 -37.29152 -8.399306 553.039
## 57873 -37.29125 -8.399306 552.988
## 57874 -37.29097 -8.399306 553.202
## 57875 -37.29069 -8.399306 553.631
## 57876 -37.29041 -8.399306 554.176
## 57877 -37.29013 -8.399306 554.654
## 57878 -37.28986 -8.399306 555.193
## 57879 -37.28958 -8.399306 555.623
## 57880 -37.28930 -8.399306 555.595
## 57881 -37.28902 -8.399306 554.979
## 57882 -37.28875 -8.399306 554.082
## 57883 -37.28847 -8.399306 552.901
## 57884 -37.28819 -8.399306 552.266
## 57885 -37.28791 -8.399306 552.177
## 57886 -37.28763 -8.399306 552.598
## 57887 -37.28736 -8.399306 553.901
## 57888 -37.28708 -8.399306 555.204
## 57889 -37.28680 -8.399306 556.566
## 57890 -37.28652 -8.399306 556.472
## 57891 -37.28625 -8.399306 555.958
## 57892 -37.28597 -8.399306 554.924
## 57893 -37.28569 -8.399306 554.545
## 57894 -37.28541 -8.399306 554.574
## 57895 -37.28513 -8.399306 555.223
## 57896 -37.28486 -8.399306 556.332
## 57897 -37.28458 -8.399306 557.578
## 57898 -37.28430 -8.399306 558.292
## 57899 -37.28402 -8.399306 557.835
## 57900 -37.28375 -8.399306 557.025
## 57901 -37.28347 -8.399306 555.543
## 57902 -37.28319 -8.399306 554.251
## 57903 -37.28291 -8.399306 553.789
## 57904 -37.28263 -8.399306 553.752
## 57905 -37.28236 -8.399306 554.703
## 57906 -37.28208 -8.399306 555.732
## 57907 -37.28180 -8.399306 557.333
## 57908 -37.28152 -8.399306 558.220
## 57909 -37.28125 -8.399306 559.007
## 57910 -37.28097 -8.399306 559.518
## 57911 -37.28069 -8.399306 560.091
## 57912 -37.28041 -8.399306 560.545
## 57913 -37.28013 -8.399306 561.069
## 57914 -37.27986 -8.399306 561.762
## 57915 -37.27958 -8.399306 562.458
## 57916 -37.27930 -8.399306 563.090
## 57917 -37.27902 -8.399306 563.413
## 57918 -37.27875 -8.399306 563.719
## 57919 -37.27847 -8.399306 563.931
## 57920 -37.27819 -8.399306 564.714
## 57921 -37.27791 -8.399306 565.342
## 57922 -37.27763 -8.399306 566.215
## 57923 -37.27736 -8.399306 566.560
## 57924 -37.27708 -8.399306 567.057
## 57925 -37.27680 -8.399306 567.408
## 57926 -37.27652 -8.399306 568.539
## 57927 -37.27625 -8.399306 569.864
## 57928 -37.27597 -8.399306 571.168
## 57929 -37.27569 -8.399306 571.807
## 57930 -37.27541 -8.399306 572.346
## 57931 -37.27513 -8.399306 572.704
## 57932 -37.27486 -8.399306 572.367
## 57933 -37.27458 -8.399306 571.969
## 57934 -37.27430 -8.399306 570.978
## 57935 -37.27402 -8.399306 570.436
## 57936 -37.27375 -8.399306 569.783
## 57937 -37.27347 -8.399306 568.680
## 57938 -37.27319 -8.399306 566.893
## 57939 -37.27291 -8.399306 564.818
## 57940 -37.27263 -8.399306 562.864
## 57941 -37.27236 -8.399306 560.735
## 57942 -37.27208 -8.399306 558.894
## 57943 -37.27180 -8.399306 557.374
## 57944 -37.27152 -8.399306 557.387
## 57945 -37.27125 -8.399306 557.593
## 57946 -37.27097 -8.399306 558.030
## 57947 -37.27069 -8.399306 557.952
## 57948 -37.27041 -8.399306 557.670
## 57949 -37.27013 -8.399306 557.349
## 57950 -37.26986 -8.399306 556.565
## 57951 -37.26958 -8.399306 555.808
## 57952 -37.26930 -8.399306 555.492
## 57953 -37.26902 -8.399306 555.528
## 57954 -37.26875 -8.399306 555.898
## 57955 -37.26847 -8.399306 556.706
## 57956 -37.26819 -8.399306 557.289
## 57957 -37.26791 -8.399306 557.718
## 57958 -37.26763 -8.399306 557.913
## 57959 -37.26736 -8.399306 558.453
## 57960 -37.26708 -8.399306 558.937
## 57961 -37.26680 -8.399306 558.878
## 57962 -37.26652 -8.399306 558.166
## 57963 -37.26625 -8.399306 557.158
## 57964 -37.26597 -8.399306 556.563
## 57965 -37.26569 -8.399306 556.358
## 57966 -37.26541 -8.399306 555.988
## 57967 -37.26513 -8.399306 555.590
## 57968 -37.26486 -8.399306 554.871
## 57969 -37.26458 -8.399306 554.152
## 57970 -37.26430 -8.399306 553.133
## 57971 -37.26402 -8.399306 552.258
## 57972 -37.26375 -8.399306 551.714
## 57973 -37.26347 -8.399306 551.331
## 57974 -37.26319 -8.399306 551.197
## 57975 -37.26291 -8.399306 551.139
## 57976 -37.26263 -8.399306 550.578
## 57977 -37.26236 -8.399306 550.225
## 57978 -37.26208 -8.399306 549.625
## 57979 -37.26180 -8.399306 549.744
## 57980 -37.26152 -8.399306 549.662
## 57981 -37.26125 -8.399306 549.493
## 57982 -37.26097 -8.399306 549.893
## 57983 -37.26069 -8.399306 550.568
## 57984 -37.26041 -8.399306 550.873
## 57985 -37.26013 -8.399306 551.062
## 57986 -37.25986 -8.399306 551.173
## 57987 -37.25958 -8.399306 551.541
## 57988 -37.25930 -8.399306 552.236
## 57989 -37.25902 -8.399306 552.873
## 57990 -37.25875 -8.399306 553.641
## 57991 -37.25847 -8.399306 554.653
## 57992 -37.25819 -8.399306 555.800
## 57993 -37.25791 -8.399306 556.882
## 57994 -37.25763 -8.399306 557.604
## 57995 -37.25736 -8.399306 558.019
## 57996 -37.25708 -8.399306 558.330
## 57997 -37.25680 -8.399306 558.675
## 57998 -37.25652 -8.399306 559.460
## 57999 -37.25625 -8.399306 560.111
## 58000 -37.25597 -8.399306 560.654
## 58001 -37.25569 -8.399306 560.462
## 58002 -37.25541 -8.399306 559.872
## 58003 -37.25513 -8.399306 559.258
## 58004 -37.25486 -8.399306 558.543
## 58005 -37.25458 -8.399306 557.907
## 58006 -37.25430 -8.399306 557.606
## 58007 -37.25402 -8.399306 557.662
## 58008 -37.25375 -8.399306 558.145
## 58009 -37.25347 -8.399306 558.603
## 58010 -37.25319 -8.399306 559.177
## 58011 -37.25291 -8.399306 559.983
## 58012 -37.25263 -8.399306 561.207
## 58013 -37.25236 -8.399306 562.240
## 58014 -37.25208 -8.399306 563.445
## 58015 -37.25180 -8.399306 564.791
## 58016 -37.25152 -8.399306 566.530
## 58017 -37.25125 -8.399306 567.991
## 58018 -37.25097 -8.399306 568.765
## 58019 -37.25069 -8.399306 568.835
## 58020 -37.25041 -8.399306 568.470
## 58021 -37.25013 -8.399306 568.774
## 58022 -37.24986 -8.399306 569.793
## 58023 -37.24958 -8.399306 571.037
## 58024 -37.24930 -8.399306 571.650
## 58025 -37.24902 -8.399306 571.865
## 58026 -37.24875 -8.399306 572.090
## 58027 -37.24847 -8.399306 572.119
## 58028 -37.24819 -8.399306 572.670
## 58029 -37.24791 -8.399306 573.480
## 58030 -37.24763 -8.399306 574.371
## 58031 -37.24736 -8.399306 574.873
## 58032 -37.24708 -8.399306 575.137
## 58033 -37.24680 -8.399306 575.223
## 58034 -37.24652 -8.399306 574.842
## 58035 -37.24625 -8.399306 574.425
## 58036 -37.24597 -8.399306 574.049
## 58037 -37.24569 -8.399306 574.114
## 58038 -37.24541 -8.399306 574.349
## 58039 -37.24513 -8.399306 574.204
## 58040 -37.24486 -8.399306 573.747
## 58041 -37.24458 -8.399306 573.044
## 58042 -37.24430 -8.399306 572.420
## 58043 -37.24402 -8.399306 571.765
## 58044 -37.24375 -8.399306 570.910
## 58045 -37.24347 -8.399306 570.306
## 58046 -37.24319 -8.399306 569.462
## 58047 -37.24291 -8.399306 568.251
## 58048 -37.24263 -8.399306 567.063
## 58049 -37.24236 -8.399306 565.759
## 58050 -37.24208 -8.399306 564.989
## 58051 -37.24180 -8.399306 564.446
## 58052 -37.24152 -8.399306 565.135
## 58053 -37.24125 -8.399306 565.964
## 58054 -37.24097 -8.399306 566.707
## 58055 -37.24069 -8.399306 566.776
## 58056 -37.24041 -8.399306 566.337
## 58057 -37.24013 -8.399306 565.791
## 58058 -37.23986 -8.399306 565.248
## 58059 -37.23958 -8.399306 564.804
## 58060 -37.23930 -8.399306 564.866
## 58061 -37.23902 -8.399306 565.280
## 58062 -37.23875 -8.399306 565.913
## 58063 -37.23847 -8.399306 566.497
## 58064 -37.23819 -8.399306 566.887
## 58065 -37.23791 -8.399306 567.010
## 58066 -37.23763 -8.399306 566.772
## 58067 -37.23736 -8.399306 566.247
## 58068 -37.23708 -8.399306 565.554
## 58069 -37.23680 -8.399306 565.115
## 58070 -37.23652 -8.399306 564.505
## 58071 -37.23625 -8.399306 564.162
## 58072 -37.23597 -8.399306 563.915
## 58073 -37.23569 -8.399306 564.056
## 58074 -37.23541 -8.399306 564.332
## 58075 -37.23513 -8.399306 564.443
## 58076 -37.23486 -8.399306 564.323
## 58077 -37.23458 -8.399306 563.899
## 58078 -37.23430 -8.399306 562.769
## 58079 -37.23402 -8.399306 560.823
## 59169 -37.30763 -8.399583 538.423
## 59170 -37.30736 -8.399583 537.488
## 59171 -37.30708 -8.399583 536.688
## 59172 -37.30680 -8.399583 536.307
## 59173 -37.30652 -8.399583 536.584
## 59174 -37.30625 -8.399583 537.219
## 59175 -37.30597 -8.399583 538.041
## 59176 -37.30569 -8.399583 538.768
## 59177 -37.30541 -8.399583 539.279
## 59178 -37.30513 -8.399583 539.394
## 59179 -37.30486 -8.399583 538.908
## 59180 -37.30458 -8.399583 538.276
## 59181 -37.30430 -8.399583 537.961
## 59182 -37.30402 -8.399583 537.876
## 59183 -37.30375 -8.399583 538.405
## 59184 -37.30347 -8.399583 539.320
## 59185 -37.30319 -8.399583 540.666
## 59186 -37.30291 -8.399583 542.084
## 59187 -37.30263 -8.399583 543.303
## 59188 -37.30236 -8.399583 544.039
## 59189 -37.30208 -8.399583 544.572
## 59190 -37.30180 -8.399583 545.125
## 59191 -37.30152 -8.399583 545.886
## 59192 -37.30125 -8.399583 546.512
## 59193 -37.30097 -8.399583 546.841
## 59194 -37.30069 -8.399583 546.456
## 59195 -37.30041 -8.399583 545.856
## 59196 -37.30013 -8.399583 545.259
## 59197 -37.29986 -8.399583 545.027
## 59198 -37.29958 -8.399583 544.893
## 59199 -37.29930 -8.399583 544.769
## 59200 -37.29902 -8.399583 544.523
## 59201 -37.29875 -8.399583 544.509
## 59202 -37.29847 -8.399583 544.894
## 59203 -37.29819 -8.399583 546.058
## 59204 -37.29791 -8.399583 547.346
## 59205 -37.29763 -8.399583 548.320
## 59206 -37.29736 -8.399583 548.439
## 59207 -37.29708 -8.399583 548.389
## 59208 -37.29680 -8.399583 548.305
## 59209 -37.29652 -8.399583 549.563
## 59210 -37.29625 -8.399583 550.846
## 59211 -37.29597 -8.399583 551.980
## 59212 -37.29569 -8.399583 552.330
## 59213 -37.29541 -8.399583 552.448
## 59214 -37.29513 -8.399583 552.599
## 59215 -37.29486 -8.399583 553.075
## 59216 -37.29458 -8.399583 553.548
## 59217 -37.29430 -8.399583 553.736
## 59218 -37.29402 -8.399583 553.421
## 59219 -37.29375 -8.399583 553.042
## 59220 -37.29347 -8.399583 552.847
## 59221 -37.29319 -8.399583 553.336
## 59222 -37.29291 -8.399583 553.959
## 59223 -37.29263 -8.399583 554.467
## 59224 -37.29236 -8.399583 554.519
## 59225 -37.29208 -8.399583 554.369
## 59226 -37.29180 -8.399583 554.109
## 59227 -37.29152 -8.399583 553.856
## 59228 -37.29125 -8.399583 553.710
## 59229 -37.29097 -8.399583 553.795
## 59230 -37.29069 -8.399583 554.292
## 59231 -37.29041 -8.399583 554.943
## 59232 -37.29013 -8.399583 555.590
## 59233 -37.28986 -8.399583 556.057
## 59234 -37.28958 -8.399583 556.260
## 59235 -37.28930 -8.399583 556.151
## 59236 -37.28902 -8.399583 555.466
## 59237 -37.28875 -8.399583 554.593
## 59238 -37.28847 -8.399583 553.710
## 59239 -37.28819 -8.399583 553.023
## 59240 -37.28791 -8.399583 552.750
## 59241 -37.28763 -8.399583 553.101
## 59242 -37.28736 -8.399583 554.370
## 59243 -37.28708 -8.399583 555.763
## 59244 -37.28680 -8.399583 556.684
## 59245 -37.28652 -8.399583 556.567
## 59246 -37.28625 -8.399583 556.040
## 59247 -37.28597 -8.399583 555.387
## 59248 -37.28569 -8.399583 555.129
## 59249 -37.28541 -8.399583 555.221
## 59250 -37.28513 -8.399583 555.801
## 59251 -37.28486 -8.399583 556.987
## 59252 -37.28458 -8.399583 558.188
## 59253 -37.28430 -8.399583 558.883
## 59254 -37.28402 -8.399583 558.610
## 59255 -37.28375 -8.399583 557.795
## 59256 -37.28347 -8.399583 556.641
## 59257 -37.28319 -8.399583 555.385
## 59258 -37.28291 -8.399583 554.388
## 59259 -37.28263 -8.399583 554.013
## 59260 -37.28236 -8.399583 554.717
## 59261 -37.28208 -8.399583 555.842
## 59262 -37.28180 -8.399583 556.995
## 59263 -37.28152 -8.399583 557.780
## 59264 -37.28125 -8.399583 558.435
## 59265 -37.28097 -8.399583 558.989
## 59266 -37.28069 -8.399583 559.497
## 59267 -37.28041 -8.399583 560.018
## 59268 -37.28013 -8.399583 560.624
## 59269 -37.27986 -8.399583 561.463
## 59270 -37.27958 -8.399583 562.298
## 59271 -37.27930 -8.399583 562.957
## 59272 -37.27902 -8.399583 563.282
## 59273 -37.27875 -8.399583 563.562
## 59274 -37.27847 -8.399583 563.912
## 59275 -37.27819 -8.399583 564.629
## 59276 -37.27791 -8.399583 565.347
## 59277 -37.27763 -8.399583 565.911
## 59278 -37.27736 -8.399583 566.049
## 59279 -37.27708 -8.399583 566.218
## 59280 -37.27680 -8.399583 566.723
## 59281 -37.27652 -8.399583 567.854
## 59282 -37.27625 -8.399583 569.159
## 59283 -37.27597 -8.399583 570.415
## 59284 -37.27569 -8.399583 571.310
## 59285 -37.27541 -8.399583 571.925
## 59286 -37.27513 -8.399583 572.227
## 59287 -37.27486 -8.399583 572.162
## 59288 -37.27458 -8.399583 571.920
## 59289 -37.27430 -8.399583 571.640
## 59290 -37.27402 -8.399583 571.469
## 59291 -37.27375 -8.399583 571.000
## 59292 -37.27347 -8.399583 570.006
## 59293 -37.27319 -8.399583 568.114
## 59294 -37.27291 -8.399583 565.805
## 59295 -37.27263 -8.399583 563.364
## 59296 -37.27236 -8.399583 560.992
## 59297 -37.27208 -8.399583 559.089
## 59298 -37.27180 -8.399583 558.042
## 59299 -37.27152 -8.399583 558.138
## 59300 -37.27125 -8.399583 558.672
## 59301 -37.27097 -8.399583 559.219
## 59302 -37.27069 -8.399583 559.205
## 59303 -37.27041 -8.399583 558.861
## 59304 -37.27013 -8.399583 558.217
## 59305 -37.26986 -8.399583 557.275
## 59306 -37.26958 -8.399583 556.357
## 59307 -37.26930 -8.399583 555.668
## 59308 -37.26902 -8.399583 555.448
## 59309 -37.26875 -8.399583 555.598
## 59310 -37.26847 -8.399583 556.035
## 59311 -37.26819 -8.399583 556.618
## 59312 -37.26791 -8.399583 557.352
## 59313 -37.26763 -8.399583 558.191
## 59314 -37.26736 -8.399583 559.191
## 59315 -37.26708 -8.399583 559.941
## 59316 -37.26680 -8.399583 560.113
## 59317 -37.26652 -8.399583 559.474
## 59318 -37.26625 -8.399583 558.539
## 59319 -37.26597 -8.399583 557.639
## 59320 -37.26569 -8.399583 557.231
## 59321 -37.26541 -8.399583 556.930
## 59322 -37.26513 -8.399583 556.553
## 59323 -37.26486 -8.399583 555.871
## 59324 -37.26458 -8.399583 555.047
## 59325 -37.26430 -8.399583 554.123
## 59326 -37.26402 -8.399583 553.197
## 59327 -37.26375 -8.399583 552.367
## 59328 -37.26347 -8.399583 551.750
## 59329 -37.26319 -8.399583 551.516
## 59330 -37.26291 -8.399583 551.394
## 59331 -37.26263 -8.399583 551.219
## 59332 -37.26236 -8.399583 550.840
## 59333 -37.26208 -8.399583 550.377
## 59334 -37.26180 -8.399583 550.083
## 59335 -37.26152 -8.399583 549.390
## 59336 -37.26125 -8.399583 549.035
## 59337 -37.26097 -8.399583 548.979
## 59338 -37.26069 -8.399583 549.465
## 59339 -37.26041 -8.399583 550.128
## 59340 -37.26013 -8.399583 550.762
## 59341 -37.25986 -8.399583 551.222
## 59342 -37.25958 -8.399583 551.645
## 59343 -37.25930 -8.399583 552.089
## 59344 -37.25902 -8.399583 552.595
## 59345 -37.25875 -8.399583 553.216
## 59346 -37.25847 -8.399583 553.978
## 59347 -37.25819 -8.399583 554.992
## 59348 -37.25791 -8.399583 555.996
## 59349 -37.25763 -8.399583 556.826
## 59350 -37.25736 -8.399583 557.273
## 59351 -37.25708 -8.399583 557.623
## 59352 -37.25680 -8.399583 558.070
## 59353 -37.25652 -8.399583 558.786
## 59354 -37.25625 -8.399583 559.393
## 59355 -37.25597 -8.399583 559.739
## 59356 -37.25569 -8.399583 559.419
## 59357 -37.25541 -8.399583 558.842
## 59358 -37.25513 -8.399583 558.165
## 59359 -37.25486 -8.399583 557.570
## 59360 -37.25458 -8.399583 557.130
## 59361 -37.25430 -8.399583 556.991
## 59362 -37.25402 -8.399583 557.213
## 59363 -37.25375 -8.399583 557.739
## 59364 -37.25347 -8.399583 558.401
## 59365 -37.25319 -8.399583 559.107
## 59366 -37.25291 -8.399583 559.901
## 59367 -37.25263 -8.399583 560.816
## 59368 -37.25236 -8.399583 561.857
## 59369 -37.25208 -8.399583 563.048
## 59370 -37.25180 -8.399583 564.417
## 59371 -37.25152 -8.399583 565.936
## 59372 -37.25125 -8.399583 567.259
## 59373 -37.25097 -8.399583 568.138
## 59374 -37.25069 -8.399583 568.160
## 59375 -37.25041 -8.399583 568.011
## 59376 -37.25013 -8.399583 568.131
## 59377 -37.24986 -8.399583 568.961
## 59378 -37.24958 -8.399583 569.995
## 59379 -37.24930 -8.399583 570.891
## 59380 -37.24902 -8.399583 571.383
## 59381 -37.24875 -8.399583 571.777
## 59382 -37.24847 -8.399583 572.197
## 59383 -37.24819 -8.399583 572.933
## 59384 -37.24791 -8.399583 573.710
## 59385 -37.24763 -8.399583 574.436
## 59386 -37.24736 -8.399583 574.978
## 59387 -37.24708 -8.399583 575.318
## 59388 -37.24680 -8.399583 575.350
## 59389 -37.24652 -8.399583 575.000
## 59390 -37.24625 -8.399583 574.600
## 59391 -37.24597 -8.399583 574.325
## 59392 -37.24569 -8.399583 574.543
## 59393 -37.24541 -8.399583 574.797
## 59394 -37.24513 -8.399583 574.884
## 59395 -37.24486 -8.399583 574.633
## 59396 -37.24458 -8.399583 574.133
## 59397 -37.24430 -8.399583 573.426
## 59398 -37.24402 -8.399583 572.542
## 59399 -37.24375 -8.399583 571.555
## 59400 -37.24347 -8.399583 570.532
## 59401 -37.24319 -8.399583 569.575
## 59402 -37.24291 -8.399583 568.604
## 59403 -37.24263 -8.399583 567.574
## 59404 -37.24236 -8.399583 566.392
## 59405 -37.24208 -8.399583 565.542
## 59406 -37.24180 -8.399583 565.382
## 59407 -37.24152 -8.399583 566.162
## 59408 -37.24125 -8.399583 567.184
## 59409 -37.24097 -8.399583 568.048
## 59410 -37.24069 -8.399583 568.131
## 59411 -37.24041 -8.399583 567.833
## 59412 -37.24013 -8.399583 567.290
## 59413 -37.23986 -8.399583 566.684
## 59414 -37.23958 -8.399583 566.165
## 59415 -37.23930 -8.399583 565.953
## 59416 -37.23902 -8.399583 566.185
## 59417 -37.23875 -8.399583 566.663
## 59418 -37.23847 -8.399583 567.247
## 59419 -37.23819 -8.399583 567.717
## 59420 -37.23791 -8.399583 568.043
## 59421 -37.23763 -8.399583 568.123
## 59422 -37.23736 -8.399583 567.915
## 59423 -37.23708 -8.399583 567.516
## 59424 -37.23680 -8.399583 567.027
## 59425 -37.23652 -8.399583 566.528
## 59426 -37.23625 -8.399583 566.160
## 59427 -37.23597 -8.399583 566.013
## 59428 -37.23569 -8.399583 566.223
## 59429 -37.23541 -8.399583 566.481
## 59430 -37.23513 -8.399583 566.598
## 59431 -37.23486 -8.399583 566.387
## 59432 -37.23458 -8.399583 565.727
## 59433 -37.23430 -8.399583 564.609
## 59434 -37.23402 -8.399583 562.536
## 60501 -37.31402 -8.399861 536.727
## 60502 -37.31375 -8.399861 536.739
## 60523 -37.30791 -8.399861 538.615
## 60524 -37.30763 -8.399861 537.954
## 60525 -37.30736 -8.399861 537.238
## 60526 -37.30708 -8.399861 536.731
## 60527 -37.30680 -8.399861 536.414
## 60528 -37.30652 -8.399861 536.895
## 60529 -37.30625 -8.399861 537.180
## 60530 -37.30597 -8.399861 537.704
## 60531 -37.30569 -8.399861 538.222
## 60532 -37.30541 -8.399861 538.711
## 60533 -37.30513 -8.399861 539.036
## 60534 -37.30486 -8.399861 538.520
## 60535 -37.30458 -8.399861 537.903
## 60536 -37.30430 -8.399861 537.210
## 60537 -37.30402 -8.399861 537.083
## 60538 -37.30375 -8.399861 537.544
## 60539 -37.30347 -8.399861 538.526
## 60540 -37.30319 -8.399861 539.932
## 60541 -37.30291 -8.399861 541.180
## 60542 -37.30263 -8.399861 542.582
## 60543 -37.30236 -8.399861 543.251
## 60544 -37.30208 -8.399861 543.713
## 60545 -37.30180 -8.399861 543.867
## 60546 -37.30152 -8.399861 544.157
## 60547 -37.30125 -8.399861 544.565
## 60548 -37.30097 -8.399861 544.765
## 60549 -37.30069 -8.399861 544.329
## 60550 -37.30041 -8.399861 544.008
## 60551 -37.30013 -8.399861 543.798
## 60552 -37.29986 -8.399861 543.852
## 60553 -37.29958 -8.399861 543.859
## 60554 -37.29930 -8.399861 543.424
## 60555 -37.29902 -8.399861 543.117
## 60556 -37.29875 -8.399861 542.954
## 60557 -37.29847 -8.399861 543.287
## 60558 -37.29819 -8.399861 544.693
## 60559 -37.29791 -8.399861 546.089
## 60560 -37.29763 -8.399861 547.482
## 60561 -37.29736 -8.399861 547.962
## 60562 -37.29708 -8.399861 548.076
## 60563 -37.29680 -8.399861 548.373
## 60564 -37.29652 -8.399861 549.276
## 60565 -37.29625 -8.399861 550.482
## 60566 -37.29597 -8.399861 551.503
## 60567 -37.29569 -8.399861 551.701
## 60568 -37.29541 -8.399861 551.746
## 60569 -37.29513 -8.399861 551.877
## 60570 -37.29486 -8.399861 552.387
## 60571 -37.29458 -8.399861 552.988
## 60572 -37.29430 -8.399861 553.288
## 60573 -37.29402 -8.399861 553.196
## 60574 -37.29375 -8.399861 552.969
## 60575 -37.29347 -8.399861 552.825
## 60576 -37.29319 -8.399861 553.491
## 60577 -37.29291 -8.399861 554.178
## 60578 -37.29263 -8.399861 554.998
## 60579 -37.29236 -8.399861 555.233
## 60580 -37.29208 -8.399861 555.327
## 60581 -37.29180 -8.399861 555.068
## 60582 -37.29152 -8.399861 554.861
## 60583 -37.29125 -8.399861 554.619
## 60584 -37.29097 -8.399861 554.581
## 60585 -37.29069 -8.399861 555.031
## 60586 -37.29041 -8.399861 555.723
## 60587 -37.29013 -8.399861 556.488
## 60588 -37.28986 -8.399861 556.843
## 60589 -37.28958 -8.399861 556.845
## 60590 -37.28930 -8.399861 556.653
## 60591 -37.28902 -8.399861 555.931
## 60592 -37.28875 -8.399861 555.174
## 60593 -37.28847 -8.399861 554.590
## 60594 -37.28819 -8.399861 553.946
## 60595 -37.28791 -8.399861 553.706
## 60596 -37.28763 -8.399861 553.908
## 60597 -37.28736 -8.399861 555.050
## 60598 -37.28708 -8.399861 556.343
## 60599 -37.28680 -8.399861 556.840
## 60600 -37.28652 -8.399861 556.586
## 60601 -37.28625 -8.399861 556.104
## 60602 -37.28597 -8.399861 555.816
## 60603 -37.28569 -8.399861 555.720
## 60604 -37.28541 -8.399861 555.791
## 60605 -37.28513 -8.399861 556.305
## 60606 -37.28486 -8.399861 557.413
## 60607 -37.28458 -8.399861 558.541
## 60608 -37.28430 -8.399861 559.325
## 60609 -37.28402 -8.399861 559.240
## 60610 -37.28375 -8.399861 558.772
## 60611 -37.28347 -8.399861 557.763
## 60612 -37.28319 -8.399861 556.773
## 60613 -37.28291 -8.399861 555.657
## 60614 -37.28263 -8.399861 554.898
## 60615 -37.28236 -8.399861 555.319
## 60616 -37.28208 -8.399861 556.084
## 60617 -37.28180 -8.399861 557.043
## 60618 -37.28152 -8.399861 557.438
## 60619 -37.28125 -8.399861 557.922
## 60620 -37.28097 -8.399861 558.406
## 60621 -37.28069 -8.399861 558.867
## 60622 -37.28041 -8.399861 559.511
## 60623 -37.28013 -8.399861 560.225
## 60624 -37.27986 -8.399861 561.055
## 60625 -37.27958 -8.399861 561.856
## 60626 -37.27930 -8.399861 562.660
## 60627 -37.27902 -8.399861 563.011
## 60628 -37.27875 -8.399861 563.434
## 60629 -37.27847 -8.399861 563.936
## 60630 -37.27819 -8.399861 564.685
## 60631 -37.27791 -8.399861 565.445
## 60632 -37.27763 -8.399861 565.749
## 60633 -37.27736 -8.399861 565.772
## 60634 -37.27708 -8.399861 565.782
## 60635 -37.27680 -8.399861 566.288
## 60636 -37.27652 -8.399861 567.503
## 60637 -37.27625 -8.399861 568.830
## 60638 -37.27597 -8.399861 569.861
## 60639 -37.27569 -8.399861 570.868
## 60640 -37.27541 -8.399861 571.418
## 60641 -37.27513 -8.399861 571.653
## 60642 -37.27486 -8.399861 571.795
## 60643 -37.27458 -8.399861 571.773
## 60644 -37.27430 -8.399861 572.099
## 60645 -37.27402 -8.399861 572.374
## 60646 -37.27375 -8.399861 572.105
## 60647 -37.27347 -8.399861 571.347
## 60648 -37.27319 -8.399861 569.377
## 60649 -37.27291 -8.399861 566.879
## 60650 -37.27263 -8.399861 564.020
## 60651 -37.27236 -8.399861 561.629
## 60652 -37.27208 -8.399861 559.878
## 60653 -37.27180 -8.399861 559.123
## 60654 -37.27152 -8.399861 559.367
## 60655 -37.27125 -8.399861 560.101
## 60656 -37.27097 -8.399861 560.714
## 60657 -37.27069 -8.399861 560.438
## 60658 -37.27041 -8.399861 559.859
## 60659 -37.27013 -8.399861 558.920
## 60660 -37.26986 -8.399861 557.718
## 60661 -37.26958 -8.399861 556.831
## 60662 -37.26930 -8.399861 555.750
## 60663 -37.26902 -8.399861 555.316
## 60664 -37.26875 -8.399861 555.283
## 60665 -37.26847 -8.399861 555.309
## 60666 -37.26819 -8.399861 555.906
## 60667 -37.26791 -8.399861 556.965
## 60668 -37.26763 -8.399861 558.445
## 60669 -37.26736 -8.399861 559.843
## 60670 -37.26708 -8.399861 560.798
## 60671 -37.26680 -8.399861 561.246
## 60672 -37.26652 -8.399861 560.599
## 60673 -37.26625 -8.399861 559.750
## 60674 -37.26597 -8.399861 558.561
## 60675 -37.26569 -8.399861 557.979
## 60676 -37.26541 -8.399861 557.708
## 60677 -37.26513 -8.399861 557.347
## 60678 -37.26486 -8.399861 556.794
## 60679 -37.26458 -8.399861 555.983
## 60680 -37.26430 -8.399861 555.166
## 60681 -37.26402 -8.399861 554.240
## 60682 -37.26375 -8.399861 553.167
## 60683 -37.26347 -8.399861 552.286
## 60684 -37.26319 -8.399861 552.003
## 60685 -37.26291 -8.399861 551.924
## 60686 -37.26263 -8.399861 552.132
## 60687 -37.26236 -8.399861 551.575
## 60688 -37.26208 -8.399861 551.184
## 60689 -37.26180 -8.399861 550.205
## 60690 -37.26152 -8.399861 549.315
## 60691 -37.26125 -8.399861 548.589
## 60692 -37.26097 -8.399861 548.411
## 60693 -37.26069 -8.399861 548.763
## 60694 -37.26041 -8.399861 549.570
## 60695 -37.26013 -8.399861 550.751
## 60696 -37.25986 -8.399861 551.430
## 60697 -37.25958 -8.399861 551.830
## 60698 -37.25930 -8.399861 551.989
## 60699 -37.25902 -8.399861 552.369
## 60700 -37.25875 -8.399861 552.860
## 60701 -37.25847 -8.399861 553.392
## 60702 -37.25819 -8.399861 554.256
## 60703 -37.25791 -8.399861 555.010
## 60704 -37.25763 -8.399861 555.937
## 60705 -37.25736 -8.399861 556.487
## 60706 -37.25708 -8.399861 557.081
## 60707 -37.25680 -8.399861 557.553
## 60708 -37.25652 -8.399861 558.279
## 60709 -37.25625 -8.399861 558.599
## 60710 -37.25597 -8.399861 558.756
## 60711 -37.25569 -8.399861 558.333
## 60712 -37.25541 -8.399861 557.902
## 60713 -37.25513 -8.399861 557.195
## 60714 -37.25486 -8.399861 556.894
## 60715 -37.25458 -8.399861 556.663
## 60716 -37.25430 -8.399861 556.687
## 60717 -37.25402 -8.399861 557.232
## 60718 -37.25375 -8.399861 557.819
## 60719 -37.25347 -8.399861 558.688
## 60720 -37.25319 -8.399861 559.491
## 60721 -37.25291 -8.399861 560.125
## 60722 -37.25263 -8.399861 560.726
## 60723 -37.25236 -8.399861 561.661
## 60724 -37.25208 -8.399861 562.634
## 60725 -37.25180 -8.399861 564.091
## 60726 -37.25152 -8.399861 565.331
## 60727 -37.25125 -8.399861 566.481
## 60728 -37.25097 -8.399861 567.468
## 60729 -37.25069 -8.399861 567.427
## 60730 -37.25041 -8.399861 567.549
## 60731 -37.25013 -8.399861 567.436
## 60732 -37.24986 -8.399861 568.079
## 60733 -37.24958 -8.399861 568.819
## 60734 -37.24930 -8.399861 570.006
## 60735 -37.24902 -8.399861 570.762
## 60736 -37.24875 -8.399861 571.448
## 60737 -37.24847 -8.399861 572.161
## 60738 -37.24819 -8.399861 573.054
## 60739 -37.24791 -8.399861 573.734
## 60740 -37.24763 -8.399861 574.324
## 60741 -37.24736 -8.399861 574.786
## 60742 -37.24708 -8.399861 575.196
## 60743 -37.24680 -8.399861 575.184
## 60744 -37.24652 -8.399861 575.005
## 60745 -37.24625 -8.399861 574.775
## 60746 -37.24597 -8.399861 574.586
## 60747 -37.24569 -8.399861 575.052
## 60748 -37.24541 -8.399861 575.338
## 60749 -37.24513 -8.399861 575.688
## 60750 -37.24486 -8.399861 575.484
## 60751 -37.24458 -8.399861 575.064
## 60752 -37.24430 -8.399861 574.302
## 60753 -37.24402 -8.399861 573.189
## 60754 -37.24375 -8.399861 572.101
## 60755 -37.24347 -8.399861 570.697
## 60756 -37.24319 -8.399861 569.627
## 60757 -37.24291 -8.399861 568.724
## 60758 -37.24263 -8.399861 567.926
## 60759 -37.24236 -8.399861 566.933
## 60760 -37.24208 -8.399861 566.273
## 60761 -37.24180 -8.399861 566.332
## 60762 -37.24152 -8.399861 567.283
## 60763 -37.24125 -8.399861 568.415
## 60764 -37.24097 -8.399861 569.388
## 60765 -37.24069 -8.399861 569.414
## 60766 -37.24041 -8.399861 569.322
## 60767 -37.24013 -8.399861 568.764
## 60768 -37.23986 -8.399861 568.139
## 60769 -37.23958 -8.399861 567.494
## 60770 -37.23930 -8.399861 567.041
## 60771 -37.23902 -8.399861 567.007
## 60772 -37.23875 -8.399861 567.268
## 60773 -37.23847 -8.399861 567.758
## 60774 -37.23819 -8.399861 568.398
## 60775 -37.23791 -8.399861 568.909
## 60776 -37.23763 -8.399861 569.389
## 60777 -37.23736 -8.399861 569.403
## 60778 -37.23708 -8.399861 569.214
## 60779 -37.23680 -8.399861 568.755
## 60780 -37.23652 -8.399861 568.367
## 60781 -37.23625 -8.399861 568.052
## 60782 -37.23597 -8.399861 567.995
## 60783 -37.23569 -8.399861 568.289
## 60784 -37.23541 -8.399861 568.612
## 60785 -37.23513 -8.399861 568.682
## 60786 -37.23486 -8.399861 568.309
## 60787 -37.23458 -8.399861 567.487
## 60788 -37.23430 -8.399861 566.443
## 60789 -37.23402 -8.399861 564.375
## 60790 -37.23375 -8.399861 562.204
## 61851 -37.31541 -8.400139 536.044
## 61852 -37.31513 -8.400139 535.709
## 61853 -37.31486 -8.400139 535.650
## 61854 -37.31458 -8.400139 535.720
## 61855 -37.31430 -8.400139 535.967
## 61856 -37.31402 -8.400139 536.234
## 61857 -37.31375 -8.400139 536.557
## 61858 -37.31347 -8.400139 536.925
## 61859 -37.31319 -8.400139 537.068
## 61860 -37.31291 -8.400139 537.179
## 61861 -37.31263 -8.400139 536.924
## 61877 -37.30819 -8.400139 538.073
## 61878 -37.30791 -8.400139 537.666
## 61879 -37.30763 -8.400139 536.964
## 61880 -37.30736 -8.400139 536.749
## 61881 -37.30708 -8.400139 536.649
## 61882 -37.30680 -8.400139 536.805
## 61883 -37.30652 -8.400139 536.656
## 61884 -37.30625 -8.400139 536.825
## 61885 -37.30597 -8.400139 537.097
## 61886 -37.30569 -8.400139 537.801
## 61887 -37.30541 -8.400139 538.435
## 61888 -37.30513 -8.400139 538.835
## 61889 -37.30486 -8.400139 538.463
## 61890 -37.30458 -8.400139 537.914
## 61891 -37.30430 -8.400139 537.230
## 61892 -37.30402 -8.400139 536.980
## 61893 -37.30375 -8.400139 537.440
## 61894 -37.30347 -8.400139 538.352
## 61895 -37.30319 -8.400139 539.466
## 61896 -37.30291 -8.400139 540.548
## 61897 -37.30263 -8.400139 541.707
## 61898 -37.30236 -8.400139 542.329
## 61899 -37.30208 -8.400139 542.711
## 61900 -37.30180 -8.400139 542.611
## 61901 -37.30152 -8.400139 542.571
## 61902 -37.30125 -8.400139 542.326
## 61903 -37.30097 -8.400139 542.296
## 61904 -37.30069 -8.400139 542.393
## 61905 -37.30041 -8.400139 542.617
## 61906 -37.30013 -8.400139 542.820
## 61907 -37.29986 -8.400139 542.883
## 61908 -37.29958 -8.400139 542.906
## 61909 -37.29930 -8.400139 542.495
## 61910 -37.29902 -8.400139 541.888
## 61911 -37.29875 -8.400139 541.623
## 61912 -37.29847 -8.400139 541.830
## 61913 -37.29819 -8.400139 543.384
## 61914 -37.29791 -8.400139 545.118
## 61915 -37.29763 -8.400139 546.794
## 61916 -37.29736 -8.400139 547.306
## 61917 -37.29708 -8.400139 547.465
## 61918 -37.29680 -8.400139 547.910
## 61919 -37.29652 -8.400139 548.789
## 61920 -37.29625 -8.400139 549.765
## 61921 -37.29597 -8.400139 550.594
## 61922 -37.29569 -8.400139 550.681
## 61923 -37.29541 -8.400139 550.596
## 61924 -37.29513 -8.400139 550.746
## 61925 -37.29486 -8.400139 551.435
## 61926 -37.29458 -8.400139 552.183
## 61927 -37.29430 -8.400139 552.736
## 61928 -37.29402 -8.400139 552.909
## 61929 -37.29375 -8.400139 553.119
## 61930 -37.29347 -8.400139 553.306
## 61931 -37.29319 -8.400139 553.805
## 61932 -37.29291 -8.400139 554.399
## 61933 -37.29263 -8.400139 555.229
## 61934 -37.29236 -8.400139 555.847
## 61935 -37.29208 -8.400139 556.220
## 61936 -37.29180 -8.400139 556.255
## 61937 -37.29152 -8.400139 555.814
## 61938 -37.29125 -8.400139 555.622
## 61939 -37.29097 -8.400139 555.493
## 61940 -37.29069 -8.400139 556.059
## 61941 -37.29041 -8.400139 556.809
## 61942 -37.29013 -8.400139 557.544
## 61943 -37.28986 -8.400139 557.813
## 61944 -37.28958 -8.400139 557.857
## 61945 -37.28930 -8.400139 557.362
## 61946 -37.28902 -8.400139 556.709
## 61947 -37.28875 -8.400139 556.100
## 61948 -37.28847 -8.400139 555.556
## 61949 -37.28819 -8.400139 555.286
## 61950 -37.28791 -8.400139 555.293
## 61951 -37.28763 -8.400139 555.723
## 61952 -37.28736 -8.400139 556.365
## 61953 -37.28708 -8.400139 556.996
## 61954 -37.28680 -8.400139 557.165
## 61955 -37.28652 -8.400139 557.125
## 61956 -37.28625 -8.400139 556.954
## 61957 -37.28597 -8.400139 556.728
## 61958 -37.28569 -8.400139 556.594
## 61959 -37.28541 -8.400139 556.561
## 61960 -37.28513 -8.400139 557.121
## 61961 -37.28486 -8.400139 557.901
## 61962 -37.28458 -8.400139 558.813
## 61963 -37.28430 -8.400139 559.315
## 61964 -37.28402 -8.400139 559.728
## 61965 -37.28375 -8.400139 559.789
## 61966 -37.28347 -8.400139 559.335
## 61967 -37.28319 -8.400139 558.403
## 61968 -37.28291 -8.400139 557.585
## 61969 -37.28263 -8.400139 556.835
## 61970 -37.28236 -8.400139 556.719
## 61971 -37.28208 -8.400139 556.861
## 61972 -37.28180 -8.400139 557.170
## 61973 -37.28152 -8.400139 557.389
## 61974 -37.28125 -8.400139 557.585
## 61975 -37.28097 -8.400139 557.859
## 61976 -37.28069 -8.400139 558.530
## 61977 -37.28041 -8.400139 559.339
## 61978 -37.28013 -8.400139 560.183
## 61979 -37.27986 -8.400139 560.757
## 61980 -37.27958 -8.400139 561.426
## 61981 -37.27930 -8.400139 562.035
## 61982 -37.27902 -8.400139 562.677
## 61983 -37.27875 -8.400139 563.415
## 61984 -37.27847 -8.400139 564.207
## 61985 -37.27819 -8.400139 565.022
## 61986 -37.27791 -8.400139 565.756
## 61987 -37.27763 -8.400139 566.055
## 61988 -37.27736 -8.400139 566.135
## 61989 -37.27708 -8.400139 566.167
## 61990 -37.27680 -8.400139 566.714
## 61991 -37.27652 -8.400139 567.738
## 61992 -37.27625 -8.400139 568.803
## 61993 -37.27597 -8.400139 569.796
## 61994 -37.27569 -8.400139 570.413
## 61995 -37.27541 -8.400139 570.740
## 61996 -37.27513 -8.400139 570.907
## 61997 -37.27486 -8.400139 571.194
## 61998 -37.27458 -8.400139 571.384
## 61999 -37.27430 -8.400139 572.042
## 62000 -37.27402 -8.400139 572.531
## 62001 -37.27375 -8.400139 572.638
## 62002 -37.27347 -8.400139 571.993
## 62003 -37.27319 -8.400139 569.897
## 62004 -37.27291 -8.400139 567.457
## 62005 -37.27263 -8.400139 564.636
## 62006 -37.27236 -8.400139 562.617
## 62007 -37.27208 -8.400139 561.181
## 62008 -37.27180 -8.400139 560.814
## 62009 -37.27152 -8.400139 561.201
## 62010 -37.27125 -8.400139 561.883
## 62011 -37.27097 -8.400139 562.502
## 62012 -37.27069 -8.400139 561.668
## 62013 -37.27041 -8.400139 560.301
## 62014 -37.27013 -8.400139 558.856
## 62015 -37.26986 -8.400139 557.756
## 62016 -37.26958 -8.400139 556.775
## 62017 -37.26930 -8.400139 556.090
## 62018 -37.26902 -8.400139 555.296
## 62019 -37.26875 -8.400139 554.834
## 62020 -37.26847 -8.400139 554.787
## 62021 -37.26819 -8.400139 555.612
## 62022 -37.26791 -8.400139 556.739
## 62023 -37.26763 -8.400139 558.588
## 62024 -37.26736 -8.400139 560.139
## 62025 -37.26708 -8.400139 561.271
## 62026 -37.26680 -8.400139 561.874
## 62027 -37.26652 -8.400139 561.334
## 62028 -37.26625 -8.400139 560.395
## 62029 -37.26597 -8.400139 559.285
## 62030 -37.26569 -8.400139 558.800
## 62031 -37.26541 -8.400139 558.459
## 62032 -37.26513 -8.400139 558.104
## 62033 -37.26486 -8.400139 557.628
## 62034 -37.26458 -8.400139 556.934
## 62035 -37.26430 -8.400139 556.236
## 62036 -37.26402 -8.400139 555.036
## 62037 -37.26375 -8.400139 553.870
## 62038 -37.26347 -8.400139 552.884
## 62039 -37.26319 -8.400139 552.581
## 62040 -37.26291 -8.400139 552.488
## 62041 -37.26263 -8.400139 552.669
## 62042 -37.26236 -8.400139 552.197
## 62043 -37.26208 -8.400139 551.564
## 62044 -37.26180 -8.400139 550.717
## 62045 -37.26152 -8.400139 549.759
## 62046 -37.26125 -8.400139 549.286
## 62047 -37.26097 -8.400139 548.917
## 62048 -37.26069 -8.400139 549.332
## 62049 -37.26041 -8.400139 549.808
## 62050 -37.26013 -8.400139 551.082
## 62051 -37.25986 -8.400139 551.701
## 62052 -37.25958 -8.400139 551.900
## 62053 -37.25930 -8.400139 551.944
## 62054 -37.25902 -8.400139 552.168
## 62055 -37.25875 -8.400139 552.617
## 62056 -37.25847 -8.400139 553.054
## 62057 -37.25819 -8.400139 553.430
## 62058 -37.25791 -8.400139 553.809
## 62059 -37.25763 -8.400139 554.469
## 62060 -37.25736 -8.400139 555.398
## 62061 -37.25708 -8.400139 556.312
## 62062 -37.25680 -8.400139 557.304
## 62063 -37.25652 -8.400139 557.289
## 62064 -37.25625 -8.400139 557.444
## 62065 -37.25597 -8.400139 557.374
## 62066 -37.25569 -8.400139 557.357
## 62067 -37.25541 -8.400139 557.397
## 62068 -37.25513 -8.400139 557.024
## 62069 -37.25486 -8.400139 556.962
## 62070 -37.25458 -8.400139 557.049
## 62071 -37.25430 -8.400139 557.363
## 62072 -37.25402 -8.400139 558.015
## 62073 -37.25375 -8.400139 558.733
## 62074 -37.25347 -8.400139 559.497
## 62075 -37.25319 -8.400139 560.073
## 62076 -37.25291 -8.400139 560.496
## 62077 -37.25263 -8.400139 560.886
## 62078 -37.25236 -8.400139 561.545
## 62079 -37.25208 -8.400139 562.335
## 62080 -37.25180 -8.400139 563.385
## 62081 -37.25152 -8.400139 564.493
## 62082 -37.25125 -8.400139 565.387
## 62083 -37.25097 -8.400139 566.204
## 62084 -37.25069 -8.400139 566.634
## 62085 -37.25041 -8.400139 567.065
## 62086 -37.25013 -8.400139 567.105
## 62087 -37.24986 -8.400139 567.456
## 62088 -37.24958 -8.400139 568.089
## 62089 -37.24930 -8.400139 568.933
## 62090 -37.24902 -8.400139 569.952
## 62091 -37.24875 -8.400139 571.015
## 62092 -37.24847 -8.400139 571.954
## 62093 -37.24819 -8.400139 572.692
## 62094 -37.24791 -8.400139 573.328
## 62095 -37.24763 -8.400139 573.935
## 62096 -37.24736 -8.400139 574.376
## 62097 -37.24708 -8.400139 574.761
## 62098 -37.24680 -8.400139 574.757
## 62099 -37.24652 -8.400139 574.951
## 62100 -37.24625 -8.400139 575.222
## 62101 -37.24597 -8.400139 575.381
## 62102 -37.24569 -8.400139 575.701
## 62103 -37.24541 -8.400139 575.914
## 62104 -37.24513 -8.400139 576.298
## 62105 -37.24486 -8.400139 576.080
## 62106 -37.24458 -8.400139 575.493
## 62107 -37.24430 -8.400139 574.593
## 62108 -37.24402 -8.400139 573.582
## 62109 -37.24375 -8.400139 572.453
## 62110 -37.24347 -8.400139 571.101
## 62111 -37.24319 -8.400139 569.850
## 62112 -37.24291 -8.400139 568.698
## 62113 -37.24263 -8.400139 567.893
## 62114 -37.24236 -8.400139 567.335
## 62115 -37.24208 -8.400139 567.048
## 62116 -37.24180 -8.400139 567.613
## 62117 -37.24152 -8.400139 568.434
## 62118 -37.24125 -8.400139 569.304
## 62119 -37.24097 -8.400139 570.228
## 62120 -37.24069 -8.400139 570.729
## 62121 -37.24041 -8.400139 570.943
## 62122 -37.24013 -8.400139 570.467
## 62123 -37.23986 -8.400139 569.816
## 62124 -37.23958 -8.400139 569.098
## 62125 -37.23930 -8.400139 568.592
## 62126 -37.23902 -8.400139 568.075
## 62127 -37.23875 -8.400139 567.719
## 62128 -37.23847 -8.400139 567.940
## 62129 -37.23819 -8.400139 568.860
## 62130 -37.23791 -8.400139 569.807
## 62131 -37.23763 -8.400139 570.563
## 62132 -37.23736 -8.400139 570.627
## 62133 -37.23708 -8.400139 570.494
## 62134 -37.23680 -8.400139 570.101
## 62135 -37.23652 -8.400139 569.897
## 62136 -37.23625 -8.400139 569.733
## 62137 -37.23597 -8.400139 569.761
## 62138 -37.23569 -8.400139 569.913
## 62139 -37.23541 -8.400139 570.158
## 62140 -37.23513 -8.400139 570.340
## 62141 -37.23486 -8.400139 569.789
## 62142 -37.23458 -8.400139 568.803
## 62143 -37.23430 -8.400139 567.416
## 62144 -37.23402 -8.400139 565.770
## 62145 -37.23375 -8.400139 564.144
## 63200 -37.31708 -8.400417 538.419
## 63201 -37.31680 -8.400417 537.659
## 63202 -37.31652 -8.400417 537.179
## 63203 -37.31625 -8.400417 536.788
## 63204 -37.31597 -8.400417 536.420
## 63205 -37.31569 -8.400417 536.003
## 63206 -37.31541 -8.400417 535.615
## 63207 -37.31513 -8.400417 535.360
## 63208 -37.31486 -8.400417 535.158
## 63209 -37.31458 -8.400417 535.147
## 63210 -37.31430 -8.400417 535.244
## 63211 -37.31402 -8.400417 535.694
## 63212 -37.31375 -8.400417 536.132
## 63213 -37.31347 -8.400417 536.663
## 63214 -37.31319 -8.400417 536.850
## 63215 -37.31291 -8.400417 537.013
## 63216 -37.31263 -8.400417 537.140
## 63217 -37.31236 -8.400417 536.728
## 63218 -37.31208 -8.400417 536.409
## 63219 -37.31180 -8.400417 536.100
## 63220 -37.31152 -8.400417 536.266
## 63232 -37.30819 -8.400417 536.940
## 63233 -37.30791 -8.400417 536.581
## 63234 -37.30763 -8.400417 536.193
## 63235 -37.30736 -8.400417 536.312
## 63236 -37.30708 -8.400417 536.484
## 63237 -37.30680 -8.400417 536.759
## 63238 -37.30652 -8.400417 536.509
## 63239 -37.30625 -8.400417 536.541
## 63240 -37.30597 -8.400417 536.765
## 63241 -37.30569 -8.400417 537.672
## 63242 -37.30541 -8.400417 538.527
## 63243 -37.30513 -8.400417 539.067
## 63244 -37.30486 -8.400417 538.882
## 63245 -37.30458 -8.400417 538.428
## 63246 -37.30430 -8.400417 537.982
## 63247 -37.30402 -8.400417 537.901
## 63248 -37.30375 -8.400417 538.156
## 63249 -37.30347 -8.400417 538.498
## 63250 -37.30319 -8.400417 539.401
## 63251 -37.30291 -8.400417 540.198
## 63252 -37.30263 -8.400417 540.865
## 63253 -37.30236 -8.400417 541.415
## 63254 -37.30208 -8.400417 541.657
## 63255 -37.30180 -8.400417 541.764
## 63256 -37.30152 -8.400417 541.274
## 63257 -37.30125 -8.400417 540.907
## 63258 -37.30097 -8.400417 540.670
## 63259 -37.30069 -8.400417 540.983
## 63260 -37.30041 -8.400417 541.443
## 63261 -37.30013 -8.400417 541.926
## 63262 -37.29986 -8.400417 542.247
## 63263 -37.29958 -8.400417 542.368
## 63264 -37.29930 -8.400417 542.219
## 63265 -37.29902 -8.400417 541.554
## 63266 -37.29875 -8.400417 541.117
## 63267 -37.29847 -8.400417 541.113
## 63268 -37.29819 -8.400417 542.598
## 63269 -37.29791 -8.400417 544.320
## 63270 -37.29763 -8.400417 545.792
## 63271 -37.29736 -8.400417 546.505
## 63272 -37.29708 -8.400417 546.861
## 63273 -37.29680 -8.400417 547.157
## 63274 -37.29652 -8.400417 547.901
## 63275 -37.29625 -8.400417 548.687
## 63276 -37.29597 -8.400417 549.312
## 63277 -37.29569 -8.400417 549.380
## 63278 -37.29541 -8.400417 549.386
## 63279 -37.29513 -8.400417 549.602
## 63280 -37.29486 -8.400417 550.399
## 63281 -37.29458 -8.400417 551.351
## 63282 -37.29430 -8.400417 552.306
## 63283 -37.29402 -8.400417 552.731
## 63284 -37.29375 -8.400417 553.169
## 63285 -37.29347 -8.400417 553.642
## 63286 -37.29319 -8.400417 554.248
## 63287 -37.29291 -8.400417 554.950
## 63288 -37.29263 -8.400417 555.683
## 63289 -37.29236 -8.400417 556.432
## 63290 -37.29208 -8.400417 557.006
## 63291 -37.29180 -8.400417 557.410
## 63292 -37.29152 -8.400417 557.025
## 63293 -37.29125 -8.400417 556.782
## 63294 -37.29097 -8.400417 556.736
## 63295 -37.29069 -8.400417 557.408
## 63296 -37.29041 -8.400417 558.195
## 63297 -37.29013 -8.400417 558.813
## 63298 -37.28986 -8.400417 558.877
## 63299 -37.28958 -8.400417 558.660
## 63300 -37.28930 -8.400417 558.289
## 63301 -37.28902 -8.400417 557.912
## 63302 -37.28875 -8.400417 557.572
## 63303 -37.28847 -8.400417 557.263
## 63304 -37.28819 -8.400417 557.189
## 63305 -37.28791 -8.400417 557.245
## 63306 -37.28763 -8.400417 557.586
## 63307 -37.28736 -8.400417 557.970
## 63308 -37.28708 -8.400417 558.450
## 63309 -37.28680 -8.400417 558.679
## 63310 -37.28652 -8.400417 558.700
## 63311 -37.28625 -8.400417 558.454
## 63312 -37.28597 -8.400417 557.926
## 63313 -37.28569 -8.400417 557.811
## 63314 -37.28541 -8.400417 557.676
## 63315 -37.28513 -8.400417 557.838
## 63316 -37.28486 -8.400417 558.358
## 63317 -37.28458 -8.400417 559.064
## 63318 -37.28430 -8.400417 559.872
## 63319 -37.28402 -8.400417 560.492
## 63320 -37.28375 -8.400417 560.911
## 63321 -37.28347 -8.400417 561.043
## 63322 -37.28319 -8.400417 560.458
## 63323 -37.28291 -8.400417 559.749
## 63324 -37.28263 -8.400417 559.039
## 63325 -37.28236 -8.400417 558.541
## 63326 -37.28208 -8.400417 558.178
## 63327 -37.28180 -8.400417 557.835
## 63328 -37.28152 -8.400417 557.753
## 63329 -37.28125 -8.400417 557.741
## 63330 -37.28097 -8.400417 557.950
## 63331 -37.28069 -8.400417 558.529
## 63332 -37.28041 -8.400417 559.241
## 63333 -37.28013 -8.400417 559.947
## 63334 -37.27986 -8.400417 560.470
## 63335 -37.27958 -8.400417 561.012
## 63336 -37.27930 -8.400417 561.669
## 63337 -37.27902 -8.400417 562.535
## 63338 -37.27875 -8.400417 563.498
## 63339 -37.27847 -8.400417 564.640
## 63340 -37.27819 -8.400417 565.519
## 63341 -37.27791 -8.400417 566.408
## 63342 -37.27763 -8.400417 567.054
## 63343 -37.27736 -8.400417 567.332
## 63344 -37.27708 -8.400417 567.532
## 63345 -37.27680 -8.400417 567.725
## 63346 -37.27652 -8.400417 568.577
## 63347 -37.27625 -8.400417 569.311
## 63348 -37.27597 -8.400417 569.834
## 63349 -37.27569 -8.400417 570.159
## 63350 -37.27541 -8.400417 570.247
## 63351 -37.27513 -8.400417 570.323
## 63352 -37.27486 -8.400417 570.535
## 63353 -37.27458 -8.400417 570.819
## 63354 -37.27430 -8.400417 571.227
## 63355 -37.27402 -8.400417 571.793
## 63356 -37.27375 -8.400417 571.971
## 63357 -37.27347 -8.400417 571.701
## 63358 -37.27319 -8.400417 569.679
## 63359 -37.27291 -8.400417 567.511
## 63360 -37.27263 -8.400417 565.438
## 63361 -37.27236 -8.400417 564.006
## 63362 -37.27208 -8.400417 563.142
## 63363 -37.27180 -8.400417 562.816
## 63364 -37.27152 -8.400417 563.385
## 63365 -37.27125 -8.400417 563.805
## 63366 -37.27097 -8.400417 563.739
## 63367 -37.27069 -8.400417 562.424
## 63368 -37.27041 -8.400417 560.656
## 63369 -37.27013 -8.400417 558.884
## 63370 -37.26986 -8.400417 557.702
## 63371 -37.26958 -8.400417 556.779
## 63372 -37.26930 -8.400417 556.044
## 63373 -37.26902 -8.400417 555.278
## 63374 -37.26875 -8.400417 554.803
## 63375 -37.26847 -8.400417 554.776
## 63376 -37.26819 -8.400417 555.611
## 63377 -37.26791 -8.400417 556.854
## 63378 -37.26763 -8.400417 558.241
## 63379 -37.26736 -8.400417 559.941
## 63380 -37.26708 -8.400417 561.222
## 63381 -37.26680 -8.400417 561.914
## 63382 -37.26652 -8.400417 561.507
## 63383 -37.26625 -8.400417 560.773
## 63384 -37.26597 -8.400417 560.029
## 63385 -37.26569 -8.400417 559.584
## 63386 -37.26541 -8.400417 559.300
## 63387 -37.26513 -8.400417 558.982
## 63388 -37.26486 -8.400417 558.501
## 63389 -37.26458 -8.400417 557.834
## 63390 -37.26430 -8.400417 556.852
## 63391 -37.26402 -8.400417 555.664
## 63392 -37.26375 -8.400417 554.466
## 63393 -37.26347 -8.400417 553.516
## 63394 -37.26319 -8.400417 553.162
## 63395 -37.26291 -8.400417 553.021
## 63396 -37.26263 -8.400417 552.896
## 63397 -37.26236 -8.400417 552.540
## 63398 -37.26208 -8.400417 552.062
## 63399 -37.26180 -8.400417 551.483
## 63400 -37.26152 -8.400417 550.874
## 63401 -37.26125 -8.400417 550.413
## 63402 -37.26097 -8.400417 550.056
## 63403 -37.26069 -8.400417 550.697
## 63404 -37.26041 -8.400417 551.298
## 63405 -37.26013 -8.400417 551.606
## 63406 -37.25986 -8.400417 551.911
## 63407 -37.25958 -8.400417 551.870
## 63408 -37.25930 -8.400417 551.880
## 63409 -37.25902 -8.400417 552.087
## 63410 -37.25875 -8.400417 552.357
## 63411 -37.25847 -8.400417 552.618
## 63412 -37.25819 -8.400417 552.693
## 63413 -37.25791 -8.400417 552.881
## 63414 -37.25763 -8.400417 553.364
## 63415 -37.25736 -8.400417 554.388
## 63416 -37.25708 -8.400417 555.478
## 63417 -37.25680 -8.400417 556.419
## 63418 -37.25652 -8.400417 556.512
## 63419 -37.25625 -8.400417 556.532
## 63420 -37.25597 -8.400417 556.643
## 63421 -37.25569 -8.400417 556.772
## 63422 -37.25541 -8.400417 557.120
## 63423 -37.25513 -8.400417 557.522
## 63424 -37.25486 -8.400417 557.956
## 63425 -37.25458 -8.400417 558.439
## 63426 -37.25430 -8.400417 558.931
## 63427 -37.25402 -8.400417 559.569
## 63428 -37.25375 -8.400417 560.127
## 63429 -37.25347 -8.400417 560.346
## 63430 -37.25319 -8.400417 560.751
## 63431 -37.25291 -8.400417 560.868
## 63432 -37.25263 -8.400417 560.954
## 63433 -37.25236 -8.400417 561.372
## 63434 -37.25208 -8.400417 561.858
## 63435 -37.25180 -8.400417 562.425
## 63436 -37.25152 -8.400417 563.316
## 63437 -37.25125 -8.400417 564.141
## 63438 -37.25097 -8.400417 565.025
## 63439 -37.25069 -8.400417 565.544
## 63440 -37.25041 -8.400417 566.084
## 63441 -37.25013 -8.400417 566.561
## 63442 -37.24986 -8.400417 566.982
## 63443 -37.24958 -8.400417 567.485
## 63444 -37.24930 -8.400417 568.079
## 63445 -37.24902 -8.400417 569.195
## 63446 -37.24875 -8.400417 570.266
## 63447 -37.24847 -8.400417 571.272
## 63448 -37.24819 -8.400417 572.043
## 63449 -37.24791 -8.400417 572.679
## 63450 -37.24763 -8.400417 573.226
## 63451 -37.24736 -8.400417 573.719
## 63452 -37.24708 -8.400417 574.176
## 63453 -37.24680 -8.400417 574.736
## 63454 -37.24652 -8.400417 575.163
## 63455 -37.24625 -8.400417 575.666
## 63456 -37.24597 -8.400417 576.070
## 63457 -37.24569 -8.400417 576.458
## 63458 -37.24541 -8.400417 576.635
## 63459 -37.24513 -8.400417 576.590
## 63460 -37.24486 -8.400417 576.231
## 63461 -37.24458 -8.400417 575.609
## 63462 -37.24430 -8.400417 574.859
## 63463 -37.24402 -8.400417 573.753
## 63464 -37.24375 -8.400417 572.609
## 63465 -37.24347 -8.400417 571.431
## 63466 -37.24319 -8.400417 570.125
## 63467 -37.24291 -8.400417 569.028
## 63468 -37.24263 -8.400417 568.245
## 63469 -37.24236 -8.400417 567.908
## 63470 -37.24208 -8.400417 567.995
## 63471 -37.24180 -8.400417 568.498
## 63472 -37.24152 -8.400417 569.349
## 63473 -37.24125 -8.400417 570.338
## 63474 -37.24097 -8.400417 571.361
## 63475 -37.24069 -8.400417 572.002
## 63476 -37.24041 -8.400417 572.383
## 63477 -37.24013 -8.400417 572.326
## 63478 -37.23986 -8.400417 571.805
## 63479 -37.23958 -8.400417 571.028
## 63480 -37.23930 -8.400417 570.030
## 63481 -37.23902 -8.400417 569.302
## 63482 -37.23875 -8.400417 568.753
## 63483 -37.23847 -8.400417 568.585
## 63484 -37.23819 -8.400417 569.390
## 63485 -37.23791 -8.400417 570.323
## 63486 -37.23763 -8.400417 571.138
## 63487 -37.23736 -8.400417 571.456
## 63488 -37.23708 -8.400417 571.522
## 63489 -37.23680 -8.400417 571.409
## 63490 -37.23652 -8.400417 571.253
## 63491 -37.23625 -8.400417 571.091
## 63492 -37.23597 -8.400417 570.979
## 63493 -37.23569 -8.400417 571.196
## 63494 -37.23541 -8.400417 571.309
## 63495 -37.23513 -8.400417 571.155
## 63496 -37.23486 -8.400417 570.502
## 63497 -37.23458 -8.400417 569.506
## 63498 -37.23430 -8.400417 568.259
## 63499 -37.23402 -8.400417 566.928
## 63500 -37.23375 -8.400417 565.552
## 63501 -37.23347 -8.400417 564.454
## 64549 -37.31875 -8.400694 535.790
## 64550 -37.31847 -8.400694 535.930
## 64551 -37.31819 -8.400694 536.694
## 64552 -37.31791 -8.400694 537.491
## 64553 -37.31763 -8.400694 537.883
## 64554 -37.31736 -8.400694 537.544
## 64555 -37.31708 -8.400694 537.019
## 64556 -37.31680 -8.400694 536.477
## 64557 -37.31652 -8.400694 536.384
## 64558 -37.31625 -8.400694 536.228
## 64559 -37.31597 -8.400694 536.046
## 64560 -37.31569 -8.400694 535.705
## 64561 -37.31541 -8.400694 535.371
## 64562 -37.31513 -8.400694 535.075
## 64563 -37.31486 -8.400694 534.892
## 64564 -37.31458 -8.400694 534.844
## 64565 -37.31430 -8.400694 534.928
## 64566 -37.31402 -8.400694 535.323
## 64567 -37.31375 -8.400694 535.802
## 64568 -37.31347 -8.400694 536.211
## 64569 -37.31319 -8.400694 536.578
## 64570 -37.31291 -8.400694 536.799
## 64571 -37.31263 -8.400694 537.024
## 64572 -37.31236 -8.400694 536.972
## 64573 -37.31208 -8.400694 536.749
## 64574 -37.31180 -8.400694 536.583
## 64575 -37.31152 -8.400694 536.730
## 64576 -37.31125 -8.400694 536.854
## 64577 -37.31097 -8.400694 536.840
## 64578 -37.31069 -8.400694 536.472
## 64579 -37.31041 -8.400694 536.100
## 64586 -37.30847 -8.400694 535.958
## 64587 -37.30819 -8.400694 535.940
## 64588 -37.30791 -8.400694 535.732
## 64589 -37.30763 -8.400694 535.623
## 64590 -37.30736 -8.400694 536.016
## 64591 -37.30708 -8.400694 536.286
## 64592 -37.30680 -8.400694 536.467
## 64593 -37.30652 -8.400694 536.285
## 64594 -37.30625 -8.400694 536.343
## 64595 -37.30597 -8.400694 536.709
## 64596 -37.30569 -8.400694 537.879
## 64597 -37.30541 -8.400694 538.958
## 64598 -37.30513 -8.400694 539.706
## 64599 -37.30486 -8.400694 539.738
## 64600 -37.30458 -8.400694 539.422
## 64601 -37.30430 -8.400694 539.099
## 64602 -37.30402 -8.400694 539.246
## 64603 -37.30375 -8.400694 539.247
## 64604 -37.30347 -8.400694 539.350
## 64605 -37.30319 -8.400694 539.582
## 64606 -37.30291 -8.400694 540.113
## 64607 -37.30263 -8.400694 540.548
## 64608 -37.30236 -8.400694 540.779
## 64609 -37.30208 -8.400694 540.949
## 64610 -37.30180 -8.400694 540.791
## 64611 -37.30152 -8.400694 540.407
## 64612 -37.30125 -8.400694 539.851
## 64613 -37.30097 -8.400694 539.547
## 64614 -37.30069 -8.400694 539.931
## 64615 -37.30041 -8.400694 540.542
## 64616 -37.30013 -8.400694 541.282
## 64617 -37.29986 -8.400694 541.815
## 64618 -37.29958 -8.400694 542.109
## 64619 -37.29930 -8.400694 542.031
## 64620 -37.29902 -8.400694 541.441
## 64621 -37.29875 -8.400694 540.967
## 64622 -37.29847 -8.400694 540.815
## 64623 -37.29819 -8.400694 542.012
## 64624 -37.29791 -8.400694 543.538
## 64625 -37.29763 -8.400694 545.065
## 64626 -37.29736 -8.400694 545.558
## 64627 -37.29708 -8.400694 545.962
## 64628 -37.29680 -8.400694 546.268
## 64629 -37.29652 -8.400694 546.873
## 64630 -37.29625 -8.400694 547.495
## 64631 -37.29597 -8.400694 547.895
## 64632 -37.29569 -8.400694 547.992
## 64633 -37.29541 -8.400694 548.117
## 64634 -37.29513 -8.400694 548.447
## 64635 -37.29486 -8.400694 549.444
## 64636 -37.29458 -8.400694 550.575
## 64637 -37.29430 -8.400694 551.712
## 64638 -37.29402 -8.400694 552.523
## 64639 -37.29375 -8.400694 553.134
## 64640 -37.29347 -8.400694 553.808
## 64641 -37.29319 -8.400694 554.587
## 64642 -37.29291 -8.400694 555.403
## 64643 -37.29263 -8.400694 556.045
## 64644 -37.29236 -8.400694 556.838
## 64645 -37.29208 -8.400694 557.492
## 64646 -37.29180 -8.400694 557.969
## 64647 -37.29152 -8.400694 557.836
## 64648 -37.29125 -8.400694 557.621
## 64649 -37.29097 -8.400694 557.668
## 64650 -37.29069 -8.400694 558.428
## 64651 -37.29041 -8.400694 559.237
## 64652 -37.29013 -8.400694 559.677
## 64653 -37.28986 -8.400694 559.593
## 64654 -37.28958 -8.400694 559.311
## 64655 -37.28930 -8.400694 558.963
## 64656 -37.28902 -8.400694 558.930
## 64657 -37.28875 -8.400694 558.942
## 64658 -37.28847 -8.400694 559.081
## 64659 -37.28819 -8.400694 559.088
## 64660 -37.28791 -8.400694 559.141
## 64661 -37.28763 -8.400694 559.224
## 64662 -37.28736 -8.400694 559.564
## 64663 -37.28708 -8.400694 559.992
## 64664 -37.28680 -8.400694 560.479
## 64665 -37.28652 -8.400694 560.474
## 64666 -37.28625 -8.400694 560.214
## 64667 -37.28597 -8.400694 559.769
## 64668 -37.28569 -8.400694 559.213
## 64669 -37.28541 -8.400694 558.939
## 64670 -37.28513 -8.400694 558.772
## 64671 -37.28486 -8.400694 559.029
## 64672 -37.28458 -8.400694 559.679
## 64673 -37.28430 -8.400694 560.430
## 64674 -37.28402 -8.400694 561.400
## 64675 -37.28375 -8.400694 562.017
## 64676 -37.28347 -8.400694 562.648
## 64677 -37.28319 -8.400694 562.462
## 64678 -37.28291 -8.400694 561.966
## 64679 -37.28263 -8.400694 561.222
## 64680 -37.28236 -8.400694 560.611
## 64681 -37.28208 -8.400694 559.974
## 64682 -37.28180 -8.400694 559.211
## 64683 -37.28152 -8.400694 558.584
## 64684 -37.28125 -8.400694 558.360
## 64685 -37.28097 -8.400694 558.514
## 64686 -37.28069 -8.400694 558.921
## 64687 -37.28041 -8.400694 559.394
## 64688 -37.28013 -8.400694 559.889
## 64689 -37.27986 -8.400694 560.278
## 64690 -37.27958 -8.400694 560.769
## 64691 -37.27930 -8.400694 561.450
## 64692 -37.27902 -8.400694 562.421
## 64693 -37.27875 -8.400694 563.585
## 64694 -37.27847 -8.400694 564.803
## 64695 -37.27819 -8.400694 565.994
## 64696 -37.27791 -8.400694 567.014
## 64697 -37.27763 -8.400694 568.088
## 64698 -37.27736 -8.400694 568.565
## 64699 -37.27708 -8.400694 568.855
## 64700 -37.27680 -8.400694 569.077
## 64701 -37.27652 -8.400694 569.557
## 64702 -37.27625 -8.400694 570.026
## 64703 -37.27597 -8.400694 570.179
## 64704 -37.27569 -8.400694 570.038
## 64705 -37.27541 -8.400694 569.953
## 64706 -37.27513 -8.400694 569.947
## 64707 -37.27486 -8.400694 570.039
## 64708 -37.27458 -8.400694 570.260
## 64709 -37.27430 -8.400694 570.406
## 64710 -37.27402 -8.400694 570.843
## 64711 -37.27375 -8.400694 570.985
## 64712 -37.27347 -8.400694 570.551
## 64713 -37.27319 -8.400694 569.049
## 64714 -37.27291 -8.400694 567.238
## 64715 -37.27263 -8.400694 565.971
## 64716 -37.27236 -8.400694 565.245
## 64717 -37.27208 -8.400694 564.813
## 64718 -37.27180 -8.400694 564.924
## 64719 -37.27152 -8.400694 565.244
## 64720 -37.27125 -8.400694 565.417
## 64721 -37.27097 -8.400694 564.760
## 64722 -37.27069 -8.400694 562.868
## 64723 -37.27041 -8.400694 560.803
## 64724 -37.27013 -8.400694 558.822
## 64725 -37.26986 -8.400694 557.575
## 64726 -37.26958 -8.400694 556.651
## 64727 -37.26930 -8.400694 556.029
## 64728 -37.26902 -8.400694 555.325
## 64729 -37.26875 -8.400694 554.838
## 64730 -37.26847 -8.400694 554.975
## 64731 -37.26819 -8.400694 555.729
## 64732 -37.26791 -8.400694 556.875
## 64733 -37.26763 -8.400694 558.150
## 64734 -37.26736 -8.400694 559.555
## 64735 -37.26708 -8.400694 560.909
## 64736 -37.26680 -8.400694 561.654
## 64737 -37.26652 -8.400694 561.475
## 64738 -37.26625 -8.400694 560.953
## 64739 -37.26597 -8.400694 560.478
## 64740 -37.26569 -8.400694 560.315
## 64741 -37.26541 -8.400694 560.057
## 64742 -37.26513 -8.400694 559.721
## 64743 -37.26486 -8.400694 559.149
## 64744 -37.26458 -8.400694 558.414
## 64745 -37.26430 -8.400694 557.377
## 64746 -37.26402 -8.400694 556.061
## 64747 -37.26375 -8.400694 554.903
## 64748 -37.26347 -8.400694 554.014
## 64749 -37.26319 -8.400694 553.695
## 64750 -37.26291 -8.400694 553.538
## 64751 -37.26263 -8.400694 553.142
## 64752 -37.26236 -8.400694 552.873
## 64753 -37.26208 -8.400694 552.547
## 64754 -37.26180 -8.400694 552.295
## 64755 -37.26152 -8.400694 552.009
## 64756 -37.26125 -8.400694 551.532
## 64757 -37.26097 -8.400694 551.735
## 64758 -37.26069 -8.400694 552.207
## 64759 -37.26041 -8.400694 552.822
## 64760 -37.26013 -8.400694 552.760
## 64761 -37.25986 -8.400694 552.268
## 64762 -37.25958 -8.400694 551.988
## 64763 -37.25930 -8.400694 552.094
## 64764 -37.25902 -8.400694 552.254
## 64765 -37.25875 -8.400694 552.448
## 64766 -37.25847 -8.400694 552.437
## 64767 -37.25819 -8.400694 552.359
## 64768 -37.25791 -8.400694 552.346
## 64769 -37.25763 -8.400694 552.615
## 64770 -37.25736 -8.400694 553.558
## 64771 -37.25708 -8.400694 554.504
## 64772 -37.25680 -8.400694 555.270
## 64773 -37.25652 -8.400694 555.521
## 64774 -37.25625 -8.400694 555.645
## 64775 -37.25597 -8.400694 555.680
## 64776 -37.25569 -8.400694 556.265
## 64777 -37.25541 -8.400694 556.904
## 64778 -37.25513 -8.400694 557.958
## 64779 -37.25486 -8.400694 558.931
## 64780 -37.25458 -8.400694 559.692
## 64781 -37.25430 -8.400694 560.490
## 64782 -37.25402 -8.400694 560.997
## 64783 -37.25375 -8.400694 561.476
## 64784 -37.25347 -8.400694 561.567
## 64785 -37.25319 -8.400694 561.329
## 64786 -37.25291 -8.400694 561.238
## 64787 -37.25263 -8.400694 561.259
## 64788 -37.25236 -8.400694 561.296
## 64789 -37.25208 -8.400694 561.569
## 64790 -37.25180 -8.400694 561.845
## 64791 -37.25152 -8.400694 562.403
## 64792 -37.25125 -8.400694 563.127
## 64793 -37.25097 -8.400694 563.822
## 64794 -37.25069 -8.400694 564.617
## 64795 -37.25041 -8.400694 565.217
## 64796 -37.25013 -8.400694 566.027
## 64797 -37.24986 -8.400694 566.596
## 64798 -37.24958 -8.400694 567.084
## 64799 -37.24930 -8.400694 567.550
## 64800 -37.24902 -8.400694 568.453
## 64801 -37.24875 -8.400694 569.486
## 64802 -37.24847 -8.400694 570.518
## 64803 -37.24819 -8.400694 571.245
## 64804 -37.24791 -8.400694 571.924
## 64805 -37.24763 -8.400694 572.415
## 64806 -37.24736 -8.400694 573.051
## 64807 -37.24708 -8.400694 573.686
## 64808 -37.24680 -8.400694 574.504
## 64809 -37.24652 -8.400694 575.285
## 64810 -37.24625 -8.400694 575.999
## 64811 -37.24597 -8.400694 576.782
## 64812 -37.24569 -8.400694 577.095
## 64813 -37.24541 -8.400694 577.196
## 64814 -37.24513 -8.400694 576.817
## 64815 -37.24486 -8.400694 576.263
## 64816 -37.24458 -8.400694 575.663
## 64817 -37.24430 -8.400694 574.864
## 64818 -37.24402 -8.400694 573.886
## 64819 -37.24375 -8.400694 572.703
## 64820 -37.24347 -8.400694 571.630
## 64821 -37.24319 -8.400694 570.437
## 64822 -37.24291 -8.400694 569.435
## 64823 -37.24263 -8.400694 568.802
## 64824 -37.24236 -8.400694 568.584
## 64825 -37.24208 -8.400694 568.879
## 64826 -37.24180 -8.400694 569.455
## 64827 -37.24152 -8.400694 570.388
## 64828 -37.24125 -8.400694 571.483
## 64829 -37.24097 -8.400694 572.412
## 64830 -37.24069 -8.400694 573.347
## 64831 -37.24041 -8.400694 573.821
## 64832 -37.24013 -8.400694 574.094
## 64833 -37.23986 -8.400694 573.696
## 64834 -37.23958 -8.400694 572.819
## 64835 -37.23930 -8.400694 571.728
## 64836 -37.23902 -8.400694 570.598
## 64837 -37.23875 -8.400694 569.940
## 64838 -37.23847 -8.400694 569.607
## 64839 -37.23819 -8.400694 570.055
## 64840 -37.23791 -8.400694 570.829
## 64841 -37.23763 -8.400694 571.755
## 64842 -37.23736 -8.400694 572.163
## 64843 -37.23708 -8.400694 572.461
## 64844 -37.23680 -8.400694 572.591
## 64845 -37.23652 -8.400694 572.514
## 64846 -37.23625 -8.400694 572.329
## 64847 -37.23597 -8.400694 572.118
## 64848 -37.23569 -8.400694 572.258
## 64849 -37.23541 -8.400694 572.173
## 64850 -37.23513 -8.400694 571.703
## 64851 -37.23486 -8.400694 570.915
## 64852 -37.23458 -8.400694 569.913
## 64853 -37.23430 -8.400694 568.747
## 64854 -37.23402 -8.400694 567.760
## 64855 -37.23375 -8.400694 566.532
## 64856 -37.23347 -8.400694 565.753
## 65898 -37.32041 -8.400972 537.174
## 65899 -37.32013 -8.400972 536.669
## 65900 -37.31986 -8.400972 536.495
## 65901 -37.31958 -8.400972 536.268
## 65902 -37.31930 -8.400972 535.937
## 65903 -37.31902 -8.400972 535.634
## 65904 -37.31875 -8.400972 535.576
## 65905 -37.31847 -8.400972 535.821
## 65906 -37.31819 -8.400972 536.156
## 65907 -37.31791 -8.400972 536.424
## 65908 -37.31763 -8.400972 536.493
## 65909 -37.31736 -8.400972 536.288
## 65910 -37.31708 -8.400972 535.941
## 65911 -37.31680 -8.400972 535.613
## 65912 -37.31652 -8.400972 535.760
## 65913 -37.31625 -8.400972 535.936
## 65914 -37.31597 -8.400972 536.011
## 65915 -37.31569 -8.400972 535.752
## 65916 -37.31541 -8.400972 535.442
## 65917 -37.31513 -8.400972 535.129
## 65918 -37.31486 -8.400972 535.028
## 65919 -37.31458 -8.400972 535.089
## 65920 -37.31430 -8.400972 535.243
## 65921 -37.31402 -8.400972 535.451
## 65922 -37.31375 -8.400972 535.737
## 65923 -37.31347 -8.400972 536.072
## 65924 -37.31319 -8.400972 536.466
## 65925 -37.31291 -8.400972 536.780
## 65926 -37.31263 -8.400972 536.956
## 65927 -37.31236 -8.400972 537.127
## 65928 -37.31208 -8.400972 537.124
## 65929 -37.31180 -8.400972 537.223
## 65930 -37.31152 -8.400972 537.260
## 65931 -37.31125 -8.400972 537.272
## 65932 -37.31097 -8.400972 537.263
## 65933 -37.31069 -8.400972 536.955
## 65934 -37.31041 -8.400972 536.590
## 65935 -37.31013 -8.400972 536.127
## 65936 -37.30986 -8.400972 535.823
## 65937 -37.30958 -8.400972 535.548
## 65938 -37.30930 -8.400972 535.405
## 65941 -37.30847 -8.400972 534.732
## 65942 -37.30819 -8.400972 535.251
## 65943 -37.30791 -8.400972 535.817
## 65944 -37.30763 -8.400972 536.280
## 65945 -37.30736 -8.400972 536.180
## 65946 -37.30708 -8.400972 536.114
## 65947 -37.30680 -8.400972 536.046
## 65948 -37.30652 -8.400972 536.057
## 65949 -37.30625 -8.400972 536.325
## 65950 -37.30597 -8.400972 536.841
## 65951 -37.30569 -8.400972 538.241
## 65952 -37.30541 -8.400972 539.783
## 65953 -37.30513 -8.400972 540.710
## 65954 -37.30486 -8.400972 541.023
## 65955 -37.30458 -8.400972 540.871
## 65956 -37.30430 -8.400972 540.778
## 65957 -37.30402 -8.400972 540.683
## 65958 -37.30375 -8.400972 540.186
## 65959 -37.30347 -8.400972 539.906
## 65960 -37.30319 -8.400972 539.882
## 65961 -37.30291 -8.400972 540.053
## 65962 -37.30263 -8.400972 540.093
## 65963 -37.30236 -8.400972 540.579
## 65964 -37.30208 -8.400972 541.086
## 65965 -37.30180 -8.400972 541.168
## 65966 -37.30152 -8.400972 540.245
## 65967 -37.30125 -8.400972 539.174
## 65968 -37.30097 -8.400972 538.632
## 65969 -37.30069 -8.400972 539.124
## 65970 -37.30041 -8.400972 539.936
## 65971 -37.30013 -8.400972 540.805
## 65972 -37.29986 -8.400972 541.458
## 65973 -37.29958 -8.400972 541.922
## 65974 -37.29930 -8.400972 541.914
## 65975 -37.29902 -8.400972 541.464
## 65976 -37.29875 -8.400972 541.030
## 65977 -37.29847 -8.400972 541.003
## 65978 -37.29819 -8.400972 541.590
## 65979 -37.29791 -8.400972 542.376
## 65980 -37.29763 -8.400972 543.265
## 65981 -37.29736 -8.400972 544.269
## 65982 -37.29708 -8.400972 545.134
## 65983 -37.29680 -8.400972 545.711
## 65984 -37.29652 -8.400972 545.955
## 65985 -37.29625 -8.400972 546.090
## 65986 -37.29597 -8.400972 546.278
## 65987 -37.29569 -8.400972 546.638
## 65988 -37.29541 -8.400972 547.218
## 65989 -37.29513 -8.400972 547.890
## 65990 -37.29486 -8.400972 548.842
## 65991 -37.29458 -8.400972 550.029
## 65992 -37.29430 -8.400972 551.265
## 65993 -37.29402 -8.400972 552.219
## 65994 -37.29375 -8.400972 552.969
## 65995 -37.29347 -8.400972 553.755
## 65996 -37.29319 -8.400972 554.639
## 65997 -37.29291 -8.400972 555.546
## 65998 -37.29263 -8.400972 556.234
## 65999 -37.29236 -8.400972 557.009
## 66000 -37.29208 -8.400972 557.616
## 66001 -37.29180 -8.400972 558.123
## 66002 -37.29152 -8.400972 557.967
## 66003 -37.29125 -8.400972 557.736
## 66004 -37.29097 -8.400972 557.732
## 66005 -37.29069 -8.400972 558.569
## 66006 -37.29041 -8.400972 559.414
## 66007 -37.29013 -8.400972 560.172
## 66008 -37.28986 -8.400972 559.666
## 66009 -37.28958 -8.400972 559.207
## 66010 -37.28930 -8.400972 558.560
## 66011 -37.28902 -8.400972 559.148
## 66012 -37.28875 -8.400972 560.109
## 66013 -37.28847 -8.400972 560.851
## 66014 -37.28819 -8.400972 560.686
## 66015 -37.28791 -8.400972 560.370
## 66016 -37.28763 -8.400972 560.274
## 66017 -37.28736 -8.400972 560.747
## 66018 -37.28708 -8.400972 561.227
## 66019 -37.28680 -8.400972 561.644
## 66020 -37.28652 -8.400972 561.877
## 66021 -37.28625 -8.400972 561.836
## 66022 -37.28597 -8.400972 561.514
## 66023 -37.28569 -8.400972 560.717
## 66024 -37.28541 -8.400972 560.069
## 66025 -37.28513 -8.400972 559.531
## 66026 -37.28486 -8.400972 560.061
## 66027 -37.28458 -8.400972 560.854
## 66028 -37.28430 -8.400972 562.094
## 66029 -37.28402 -8.400972 562.594
## 66030 -37.28375 -8.400972 562.889
## 66031 -37.28347 -8.400972 563.428
## 66032 -37.28319 -8.400972 563.896
## 66033 -37.28291 -8.400972 564.120
## 66034 -37.28263 -8.400972 563.872
## 66035 -37.28236 -8.400972 562.744
## 66036 -37.28208 -8.400972 561.791
## 66037 -37.28180 -8.400972 560.428
## 66038 -37.28152 -8.400972 559.944
## 66039 -37.28125 -8.400972 559.777
## 66040 -37.28097 -8.400972 559.815
## 66041 -37.28069 -8.400972 559.813
## 66042 -37.28041 -8.400972 559.780
## 66043 -37.28013 -8.400972 559.992
## 66044 -37.27986 -8.400972 560.204
## 66045 -37.27958 -8.400972 560.516
## 66046 -37.27930 -8.400972 561.059
## 66047 -37.27902 -8.400972 562.328
## 66048 -37.27875 -8.400972 563.772
## 66049 -37.27847 -8.400972 565.265
## 66050 -37.27819 -8.400972 566.287
## 66051 -37.27791 -8.400972 567.157
## 66052 -37.27763 -8.400972 567.971
## 66053 -37.27736 -8.400972 569.101
## 66054 -37.27708 -8.400972 569.886
## 66055 -37.27680 -8.400972 570.567
## 66056 -37.27652 -8.400972 570.384
## 66057 -37.27625 -8.400972 570.180
## 66058 -37.27597 -8.400972 569.918
## 66059 -37.27569 -8.400972 569.959
## 66060 -37.27541 -8.400972 570.085
## 66061 -37.27513 -8.400972 570.083
## 66062 -37.27486 -8.400972 570.017
## 66063 -37.27458 -8.400972 569.955
## 66064 -37.27430 -8.400972 570.123
## 66065 -37.27402 -8.400972 570.216
## 66066 -37.27375 -8.400972 569.990
## 66067 -37.27347 -8.400972 569.519
## 66068 -37.27319 -8.400972 568.202
## 66069 -37.27291 -8.400972 566.781
## 66070 -37.27263 -8.400972 565.660
## 66071 -37.27236 -8.400972 565.790
## 66072 -37.27208 -8.400972 566.145
## 66073 -37.27180 -8.400972 566.645
## 66074 -37.27152 -8.400972 566.605
## 66075 -37.27125 -8.400972 566.113
## 66076 -37.27097 -8.400972 564.998
## 66077 -37.27069 -8.400972 563.010
## 66078 -37.27041 -8.400972 560.781
## 66079 -37.27013 -8.400972 558.693
## 66080 -37.26986 -8.400972 557.488
## 66081 -37.26958 -8.400972 556.588
## 66082 -37.26930 -8.400972 555.993
## 66083 -37.26902 -8.400972 555.394
## 66084 -37.26875 -8.400972 555.087
## 66085 -37.26847 -8.400972 555.239
## 66086 -37.26819 -8.400972 555.814
## 66087 -37.26791 -8.400972 556.745
## 66088 -37.26763 -8.400972 557.996
## 66089 -37.26736 -8.400972 559.204
## 66090 -37.26708 -8.400972 560.283
## 66091 -37.26680 -8.400972 560.965
## 66092 -37.26652 -8.400972 561.384
## 66093 -37.26625 -8.400972 561.441
## 66094 -37.26597 -8.400972 561.273
## 66095 -37.26569 -8.400972 561.005
## 66096 -37.26541 -8.400972 560.584
## 66097 -37.26513 -8.400972 560.134
## 66098 -37.26486 -8.400972 559.461
## 66099 -37.26458 -8.400972 558.651
## 66100 -37.26430 -8.400972 557.463
## 66101 -37.26402 -8.400972 556.169
## 66102 -37.26375 -8.400972 555.143
## 66103 -37.26347 -8.400972 554.291
## 66104 -37.26319 -8.400972 554.102
## 66105 -37.26291 -8.400972 554.096
## 66106 -37.26263 -8.400972 553.923
## 66107 -37.26236 -8.400972 553.446
## 66108 -37.26208 -8.400972 552.750
## 66109 -37.26180 -8.400972 552.494
## 66110 -37.26152 -8.400972 552.540
## 66111 -37.26125 -8.400972 552.417
## 66112 -37.26097 -8.400972 552.805
## 66113 -37.26069 -8.400972 553.203
## 66114 -37.26041 -8.400972 553.786
## 66115 -37.26013 -8.400972 553.710
## 66116 -37.25986 -8.400972 552.987
## 66117 -37.25958 -8.400972 552.419
## 66118 -37.25930 -8.400972 552.271
## 66119 -37.25902 -8.400972 552.756
## 66120 -37.25875 -8.400972 553.237
## 66121 -37.25847 -8.400972 553.190
## 66122 -37.25819 -8.400972 552.843
## 66123 -37.25791 -8.400972 552.429
## 66124 -37.25763 -8.400972 552.468
## 66125 -37.25736 -8.400972 553.108
## 66126 -37.25708 -8.400972 553.730
## 66127 -37.25680 -8.400972 554.259
## 66128 -37.25652 -8.400972 554.519
## 66129 -37.25625 -8.400972 554.687
## 66130 -37.25597 -8.400972 554.729
## 66131 -37.25569 -8.400972 555.573
## 66132 -37.25541 -8.400972 556.600
## 66133 -37.25513 -8.400972 557.959
## 66134 -37.25486 -8.400972 559.085
## 66135 -37.25458 -8.400972 560.043
## 66136 -37.25430 -8.400972 560.933
## 66137 -37.25402 -8.400972 561.495
## 66138 -37.25375 -8.400972 561.884
## 66139 -37.25347 -8.400972 561.906
## 66140 -37.25319 -8.400972 561.578
## 66141 -37.25291 -8.400972 561.328
## 66142 -37.25263 -8.400972 561.145
## 66143 -37.25236 -8.400972 561.344
## 66144 -37.25208 -8.400972 561.757
## 66145 -37.25180 -8.400972 562.111
## 66146 -37.25152 -8.400972 562.294
## 66147 -37.25125 -8.400972 562.692
## 66148 -37.25097 -8.400972 563.242
## 66149 -37.25069 -8.400972 564.103
## 66150 -37.25041 -8.400972 564.891
## 66151 -37.25013 -8.400972 565.737
## 66152 -37.24986 -8.400972 566.224
## 66153 -37.24958 -8.400972 566.627
## 66154 -37.24930 -8.400972 567.132
## 66155 -37.24902 -8.400972 567.809
## 66156 -37.24875 -8.400972 568.601
## 66157 -37.24847 -8.400972 569.521
## 66158 -37.24819 -8.400972 570.409
## 66159 -37.24791 -8.400972 571.291
## 66160 -37.24763 -8.400972 571.901
## 66161 -37.24736 -8.400972 572.614
## 66162 -37.24708 -8.400972 573.355
## 66163 -37.24680 -8.400972 574.390
## 66164 -37.24652 -8.400972 575.370
## 66165 -37.24625 -8.400972 576.093
## 66166 -37.24597 -8.400972 576.951
## 66167 -37.24569 -8.400972 577.224
## 66168 -37.24541 -8.400972 577.268
## 66169 -37.24513 -8.400972 576.800
## 66170 -37.24486 -8.400972 576.370
## 66171 -37.24458 -8.400972 575.806
## 66172 -37.24430 -8.400972 575.189
## 66173 -37.24402 -8.400972 574.144
## 66174 -37.24375 -8.400972 572.934
## 66175 -37.24347 -8.400972 571.898
## 66176 -37.24319 -8.400972 570.739
## 66177 -37.24291 -8.400972 569.849
## 66178 -37.24263 -8.400972 569.297
## 66179 -37.24236 -8.400972 569.387
## 66180 -37.24208 -8.400972 569.962
## 66181 -37.24180 -8.400972 570.794
## 66182 -37.24152 -8.400972 571.803
## 66183 -37.24125 -8.400972 572.956
## 66184 -37.24097 -8.400972 573.940
## 66185 -37.24069 -8.400972 574.877
## 66186 -37.24041 -8.400972 575.401
## 66187 -37.24013 -8.400972 575.758
## 66188 -37.23986 -8.400972 575.188
## 66189 -37.23958 -8.400972 574.223
## 66190 -37.23930 -8.400972 572.739
## 66191 -37.23902 -8.400972 571.867
## 66192 -37.23875 -8.400972 571.358
## 66193 -37.23847 -8.400972 571.028
## 66194 -37.23819 -8.400972 571.094
## 66195 -37.23791 -8.400972 571.371
## 66196 -37.23763 -8.400972 572.025
## 66197 -37.23736 -8.400972 572.862
## 66198 -37.23708 -8.400972 573.435
## 66199 -37.23680 -8.400972 573.848
## 66200 -37.23652 -8.400972 573.848
## 66201 -37.23625 -8.400972 573.699
## 66202 -37.23597 -8.400972 573.539
## 66203 -37.23569 -8.400972 573.282
## 66204 -37.23541 -8.400972 572.837
## 66205 -37.23513 -8.400972 572.024
## 66206 -37.23486 -8.400972 571.363
## 66207 -37.23458 -8.400972 570.366
## 66208 -37.23430 -8.400972 569.478
## 66209 -37.23402 -8.400972 568.313
## 66210 -37.23375 -8.400972 566.892
## 66211 -37.23347 -8.400972 566.010
## 67247 -37.32208 -8.401250 536.907
## 67248 -37.32180 -8.401250 536.279
## 67249 -37.32152 -8.401250 536.416
## 67250 -37.32125 -8.401250 536.519
## 67251 -37.32097 -8.401250 536.754
## 67252 -37.32069 -8.401250 536.161
## 67253 -37.32041 -8.401250 535.667
## 67254 -37.32013 -8.401250 535.277
## 67255 -37.31986 -8.401250 535.237
## 67256 -37.31958 -8.401250 535.315
## 67257 -37.31930 -8.401250 535.281
## 67258 -37.31902 -8.401250 535.425
## 67259 -37.31875 -8.401250 535.464
## 67260 -37.31847 -8.401250 535.566
## 67261 -37.31819 -8.401250 535.640
## 67262 -37.31791 -8.401250 535.708
## 67263 -37.31763 -8.401250 535.677
## 67264 -37.31736 -8.401250 535.454
## 67265 -37.31708 -8.401250 535.239
## 67266 -37.31680 -8.401250 535.152
## 67267 -37.31652 -8.401250 535.484
## 67268 -37.31625 -8.401250 535.911
## 67269 -37.31597 -8.401250 536.189
## 67270 -37.31569 -8.401250 536.166
## 67271 -37.31541 -8.401250 535.950
## 67272 -37.31513 -8.401250 535.764
## 67273 -37.31486 -8.401250 535.686
## 67274 -37.31458 -8.401250 535.741
## 67275 -37.31430 -8.401250 535.869
## 67276 -37.31402 -8.401250 535.996
## 67277 -37.31375 -8.401250 536.170
## 67278 -37.31347 -8.401250 536.436
## 67279 -37.31319 -8.401250 536.596
## 67280 -37.31291 -8.401250 536.822
## 67281 -37.31263 -8.401250 537.051
## 67282 -37.31236 -8.401250 537.259
## 67283 -37.31208 -8.401250 537.440
## 67284 -37.31180 -8.401250 537.495
## 67285 -37.31152 -8.401250 537.653
## 67286 -37.31125 -8.401250 537.665
## 67287 -37.31097 -8.401250 537.640
## 67288 -37.31069 -8.401250 537.433
## 67289 -37.31041 -8.401250 537.191
## 67290 -37.31013 -8.401250 536.896
## 67291 -37.30986 -8.401250 536.634
## 67292 -37.30958 -8.401250 536.316
## 67293 -37.30930 -8.401250 535.795
## 67294 -37.30902 -8.401250 535.279
## 67295 -37.30875 -8.401250 534.837
## 67296 -37.30847 -8.401250 534.767
## 67297 -37.30819 -8.401250 535.324
## 67298 -37.30791 -8.401250 536.047
## 67299 -37.30763 -8.401250 536.560
## 67300 -37.30736 -8.401250 536.425
## 67301 -37.30708 -8.401250 536.118
## 67302 -37.30680 -8.401250 535.992
## 67303 -37.30652 -8.401250 535.950
## 67304 -37.30625 -8.401250 536.402
## 67305 -37.30597 -8.401250 537.166
## 67306 -37.30569 -8.401250 539.005
## 67307 -37.30541 -8.401250 540.767
## 67308 -37.30513 -8.401250 542.158
## 67309 -37.30486 -8.401250 542.719
## 67310 -37.30458 -8.401250 542.737
## 67311 -37.30430 -8.401250 542.288
## 67312 -37.30402 -8.401250 541.748
## 67313 -37.30375 -8.401250 541.055
## 67314 -37.30347 -8.401250 540.333
## 67315 -37.30319 -8.401250 540.145
## 67316 -37.30291 -8.401250 540.102
## 67317 -37.30263 -8.401250 540.416
## 67318 -37.30236 -8.401250 541.077
## 67319 -37.30208 -8.401250 541.661
## 67320 -37.30180 -8.401250 541.820
## 67321 -37.30152 -8.401250 540.550
## 67322 -37.30125 -8.401250 539.301
## 67323 -37.30097 -8.401250 538.358
## 67324 -37.30069 -8.401250 538.678
## 67325 -37.30041 -8.401250 539.444
## 67326 -37.30013 -8.401250 540.393
## 67327 -37.29986 -8.401250 541.163
## 67328 -37.29958 -8.401250 541.714
## 67329 -37.29930 -8.401250 541.967
## 67330 -37.29902 -8.401250 541.530
## 67331 -37.29875 -8.401250 541.076
## 67332 -37.29847 -8.401250 540.778
## 67333 -37.29819 -8.401250 540.962
## 67334 -37.29791 -8.401250 541.455
## 67335 -37.29763 -8.401250 542.194
## 67336 -37.29736 -8.401250 543.146
## 67337 -37.29708 -8.401250 544.053
## 67338 -37.29680 -8.401250 544.713
## 67339 -37.29652 -8.401250 544.964
## 67340 -37.29625 -8.401250 545.021
## 67341 -37.29597 -8.401250 545.113
## 67342 -37.29569 -8.401250 545.688
## 67343 -37.29541 -8.401250 546.465
## 67344 -37.29513 -8.401250 547.530
## 67345 -37.29486 -8.401250 548.582
## 67346 -37.29458 -8.401250 549.768
## 67347 -37.29430 -8.401250 550.994
## 67348 -37.29402 -8.401250 551.758
## 67349 -37.29375 -8.401250 552.576
## 67350 -37.29347 -8.401250 553.395
## 67351 -37.29319 -8.401250 554.308
## 67352 -37.29291 -8.401250 555.217
## 67353 -37.29263 -8.401250 556.056
## 67354 -37.29236 -8.401250 556.806
## 67355 -37.29208 -8.401250 557.335
## 67356 -37.29180 -8.401250 557.696
## 67357 -37.29152 -8.401250 557.300
## 67358 -37.29125 -8.401250 557.046
## 67359 -37.29097 -8.401250 556.978
## 67360 -37.29069 -8.401250 557.808
## 67361 -37.29041 -8.401250 558.647
## 67362 -37.29013 -8.401250 559.146
## 67363 -37.28986 -8.401250 558.688
## 67364 -37.28958 -8.401250 558.141
## 67365 -37.28930 -8.401250 557.954
## 67366 -37.28902 -8.401250 558.893
## 67367 -37.28875 -8.401250 560.209
## 67368 -37.28847 -8.401250 561.365
## 67369 -37.28819 -8.401250 561.399
## 67370 -37.28791 -8.401250 561.187
## 67371 -37.28763 -8.401250 560.972
## 67372 -37.28736 -8.401250 561.401
## 67373 -37.28708 -8.401250 561.910
## 67374 -37.28680 -8.401250 562.410
## 67375 -37.28652 -8.401250 562.806
## 67376 -37.28625 -8.401250 562.935
## 67377 -37.28597 -8.401250 562.596
## 67378 -37.28569 -8.401250 562.023
## 67379 -37.28541 -8.401250 561.341
## 67380 -37.28513 -8.401250 561.053
## 67381 -37.28486 -8.401250 561.635
## 67382 -37.28458 -8.401250 562.520
## 67383 -37.28430 -8.401250 563.479
## 67384 -37.28402 -8.401250 563.703
## 67385 -37.28375 -8.401250 563.962
## 67386 -37.28347 -8.401250 564.340
## 67387 -37.28319 -8.401250 564.932
## 67388 -37.28291 -8.401250 565.416
## 67389 -37.28263 -8.401250 565.394
## 67390 -37.28236 -8.401250 564.504
## 67391 -37.28208 -8.401250 563.352
## 67392 -37.28180 -8.401250 562.244
## 67393 -37.28152 -8.401250 561.875
## 67394 -37.28125 -8.401250 561.602
## 67395 -37.28097 -8.401250 561.446
## 67396 -37.28069 -8.401250 560.997
## 67397 -37.28041 -8.401250 560.620
## 67398 -37.28013 -8.401250 560.355
## 67399 -37.27986 -8.401250 560.228
## 67400 -37.27958 -8.401250 560.417
## 67401 -37.27930 -8.401250 561.050
## 67402 -37.27902 -8.401250 562.328
## 67403 -37.27875 -8.401250 563.781
## 67404 -37.27847 -8.401250 565.254
## 67405 -37.27819 -8.401250 566.182
## 67406 -37.27791 -8.401250 567.044
## 67407 -37.27763 -8.401250 567.934
## 67408 -37.27736 -8.401250 569.052
## 67409 -37.27708 -8.401250 570.035
## 67410 -37.27680 -8.401250 570.577
## 67411 -37.27652 -8.401250 570.542
## 67412 -37.27625 -8.401250 570.262
## 67413 -37.27597 -8.401250 569.857
## 67414 -37.27569 -8.401250 570.070
## 67415 -37.27541 -8.401250 570.254
## 67416 -37.27513 -8.401250 570.412
## 67417 -37.27486 -8.401250 570.418
## 67418 -37.27458 -8.401250 570.330
## 67419 -37.27430 -8.401250 570.203
## 67420 -37.27402 -8.401250 569.970
## 67421 -37.27375 -8.401250 569.509
## 67422 -37.27347 -8.401250 568.884
## 67423 -37.27319 -8.401250 567.395
## 67424 -37.27291 -8.401250 566.169
## 67425 -37.27263 -8.401250 565.503
## 67426 -37.27236 -8.401250 565.914
## 67427 -37.27208 -8.401250 566.645
## 67428 -37.27180 -8.401250 567.054
## 67429 -37.27152 -8.401250 567.008
## 67430 -37.27125 -8.401250 566.266
## 67431 -37.27097 -8.401250 564.968
## 67432 -37.27069 -8.401250 562.854
## 67433 -37.27041 -8.401250 560.635
## 67434 -37.27013 -8.401250 558.686
## 67435 -37.26986 -8.401250 557.523
## 67436 -37.26958 -8.401250 556.754
## 67437 -37.26930 -8.401250 556.288
## 67438 -37.26902 -8.401250 555.701
## 67439 -37.26875 -8.401250 555.362
## 67440 -37.26847 -8.401250 555.331
## 67441 -37.26819 -8.401250 555.780
## 67442 -37.26791 -8.401250 556.568
## 67443 -37.26763 -8.401250 557.540
## 67444 -37.26736 -8.401250 558.828
## 67445 -37.26708 -8.401250 559.999
## 67446 -37.26680 -8.401250 560.975
## 67447 -37.26652 -8.401250 561.613
## 67448 -37.26625 -8.401250 561.921
## 67449 -37.26597 -8.401250 561.979
## 67450 -37.26569 -8.401250 561.608
## 67451 -37.26541 -8.401250 561.049
## 67452 -37.26513 -8.401250 560.290
## 67453 -37.26486 -8.401250 559.373
## 67454 -37.26458 -8.401250 558.341
## 67455 -37.26430 -8.401250 557.153
## 67456 -37.26402 -8.401250 556.084
## 67457 -37.26375 -8.401250 555.136
## 67458 -37.26347 -8.401250 554.445
## 67459 -37.26319 -8.401250 554.454
## 67460 -37.26291 -8.401250 554.561
## 67461 -37.26263 -8.401250 554.550
## 67462 -37.26236 -8.401250 554.085
## 67463 -37.26208 -8.401250 553.490
## 67464 -37.26180 -8.401250 553.012
## 67465 -37.26152 -8.401250 552.628
## 67466 -37.26125 -8.401250 552.602
## 67467 -37.26097 -8.401250 552.636
## 67468 -37.26069 -8.401250 553.427
## 67469 -37.26041 -8.401250 554.012
## 67470 -37.26013 -8.401250 554.209
## 67471 -37.25986 -8.401250 553.850
## 67472 -37.25958 -8.401250 553.336
## 67473 -37.25930 -8.401250 553.154
## 67474 -37.25902 -8.401250 553.685
## 67475 -37.25875 -8.401250 554.262
## 67476 -37.25847 -8.401250 554.601
## 67477 -37.25819 -8.401250 553.982
## 67478 -37.25791 -8.401250 553.268
## 67479 -37.25763 -8.401250 552.803
## 67480 -37.25736 -8.401250 552.951
## 67481 -37.25708 -8.401250 553.314
## 67482 -37.25680 -8.401250 553.742
## 67483 -37.25652 -8.401250 553.674
## 67484 -37.25625 -8.401250 553.753
## 67485 -37.25597 -8.401250 554.056
## 67486 -37.25569 -8.401250 554.896
## 67487 -37.25541 -8.401250 555.995
## 67488 -37.25513 -8.401250 557.206
## 67489 -37.25486 -8.401250 558.297
## 67490 -37.25458 -8.401250 559.311
## 67491 -37.25430 -8.401250 560.151
## 67492 -37.25402 -8.401250 560.889
## 67493 -37.25375 -8.401250 561.358
## 67494 -37.25347 -8.401250 561.370
## 67495 -37.25319 -8.401250 561.452
## 67496 -37.25291 -8.401250 561.297
## 67497 -37.25263 -8.401250 561.189
## 67498 -37.25236 -8.401250 561.715
## 67499 -37.25208 -8.401250 562.262
## 67500 -37.25180 -8.401250 562.645
## 67501 -37.25152 -8.401250 562.977
## 67502 -37.25125 -8.401250 563.207
## 67503 -37.25097 -8.401250 563.573
## 67504 -37.25069 -8.401250 564.203
## 67505 -37.25041 -8.401250 564.908
## 67506 -37.25013 -8.401250 565.522
## 67507 -37.24986 -8.401250 565.839
## 67508 -37.24958 -8.401250 566.138
## 67509 -37.24930 -8.401250 566.537
## 67510 -37.24902 -8.401250 567.188
## 67511 -37.24875 -8.401250 567.958
## 67512 -37.24847 -8.401250 568.739
## 67513 -37.24819 -8.401250 569.734
## 67514 -37.24791 -8.401250 570.669
## 67515 -37.24763 -8.401250 571.583
## 67516 -37.24736 -8.401250 572.481
## 67517 -37.24708 -8.401250 573.377
## 67518 -37.24680 -8.401250 574.472
## 67519 -37.24652 -8.401250 575.191
## 67520 -37.24625 -8.401250 575.981
## 67521 -37.24597 -8.401250 576.577
## 67522 -37.24569 -8.401250 576.911
## 67523 -37.24541 -8.401250 577.002
## 67524 -37.24513 -8.401250 576.892
## 67525 -37.24486 -8.401250 576.697
## 67526 -37.24458 -8.401250 576.279
## 67527 -37.24430 -8.401250 575.648
## 67528 -37.24402 -8.401250 574.596
## 67529 -37.24375 -8.401250 573.433
## 67530 -37.24347 -8.401250 572.179
## 67531 -37.24319 -8.401250 571.074
## 67532 -37.24291 -8.401250 570.239
## 67533 -37.24263 -8.401250 569.931
## 67534 -37.24236 -8.401250 570.342
## 67535 -37.24208 -8.401250 571.227
## 67536 -37.24180 -8.401250 572.294
## 67537 -37.24152 -8.401250 573.560
## 67538 -37.24125 -8.401250 574.717
## 67539 -37.24097 -8.401250 575.762
## 67540 -37.24069 -8.401250 576.538
## 67541 -37.24041 -8.401250 576.950
## 67542 -37.24013 -8.401250 576.853
## 67543 -37.23986 -8.401250 576.055
## 67544 -37.23958 -8.401250 574.988
## 67545 -37.23930 -8.401250 573.847
## 67546 -37.23902 -8.401250 573.190
## 67547 -37.23875 -8.401250 572.681
## 67548 -37.23847 -8.401250 572.372
## 67549 -37.23819 -8.401250 572.320
## 67550 -37.23791 -8.401250 572.498
## 67551 -37.23763 -8.401250 572.986
## 67552 -37.23736 -8.401250 573.800
## 67553 -37.23708 -8.401250 574.619
## 67554 -37.23680 -8.401250 575.120
## 67555 -37.23652 -8.401250 575.292
## 67556 -37.23625 -8.401250 575.129
## 67557 -37.23597 -8.401250 574.806
## 67558 -37.23569 -8.401250 574.311
## 67559 -37.23541 -8.401250 573.706
## 67560 -37.23513 -8.401250 572.949
## 67561 -37.23486 -8.401250 572.099
## 67562 -37.23458 -8.401250 571.064
## 67563 -37.23430 -8.401250 569.797
## 67564 -37.23402 -8.401250 568.413
## 67565 -37.23375 -8.401250 566.957
## 67566 -37.23347 -8.401250 565.824
## 67567 -37.23319 -8.401250 564.694
## 68596 -37.32375 -8.401528 535.271
## 68597 -37.32347 -8.401528 536.327
## 68598 -37.32319 -8.401528 536.752
## 68599 -37.32291 -8.401528 536.934
## 68600 -37.32263 -8.401528 536.635
## 68601 -37.32236 -8.401528 536.182
## 68602 -37.32208 -8.401528 535.589
## 68603 -37.32180 -8.401528 535.390
## 68604 -37.32152 -8.401528 535.533
## 68605 -37.32125 -8.401528 535.496
## 68606 -37.32097 -8.401528 535.113
## 68607 -37.32069 -8.401528 534.600
## 68608 -37.32041 -8.401528 534.253
## 68609 -37.32013 -8.401528 533.961
## 68610 -37.31986 -8.401528 534.133
## 68611 -37.31958 -8.401528 534.422
## 68612 -37.31930 -8.401528 534.999
## 68613 -37.31902 -8.401528 535.254
## 68614 -37.31875 -8.401528 535.340
## 68615 -37.31847 -8.401528 535.244
## 68616 -37.31819 -8.401528 535.183
## 68617 -37.31791 -8.401528 535.174
## 68618 -37.31763 -8.401528 535.063
## 68619 -37.31736 -8.401528 534.939
## 68620 -37.31708 -8.401528 534.874
## 68621 -37.31680 -8.401528 534.958
## 68622 -37.31652 -8.401528 535.512
## 68623 -37.31625 -8.401528 536.186
## 68624 -37.31597 -8.401528 536.732
## 68625 -37.31569 -8.401528 536.838
## 68626 -37.31541 -8.401528 536.720
## 68627 -37.31513 -8.401528 536.582
## 68628 -37.31486 -8.401528 536.575
## 68629 -37.31458 -8.401528 536.590
## 68630 -37.31430 -8.401528 536.662
## 68631 -37.31402 -8.401528 536.703
## 68632 -37.31375 -8.401528 536.734
## 68633 -37.31347 -8.401528 536.799
## 68634 -37.31319 -8.401528 536.803
## 68635 -37.31291 -8.401528 536.935
## 68636 -37.31263 -8.401528 537.154
## 68637 -37.31236 -8.401528 537.356
## 68638 -37.31208 -8.401528 537.734
## 68639 -37.31180 -8.401528 537.839
## 68640 -37.31152 -8.401528 537.977
## 68641 -37.31125 -8.401528 538.005
## 68642 -37.31097 -8.401528 537.834
## 68643 -37.31069 -8.401528 537.869
## 68644 -37.31041 -8.401528 537.814
## 68645 -37.31013 -8.401528 537.671
## 68646 -37.30986 -8.401528 537.475
## 68647 -37.30958 -8.401528 536.995
## 68648 -37.30930 -8.401528 536.498
## 68649 -37.30902 -8.401528 535.749
## 68650 -37.30875 -8.401528 535.135
## 68651 -37.30847 -8.401528 534.946
## 68652 -37.30819 -8.401528 535.577
## 68653 -37.30791 -8.401528 536.329
## 68654 -37.30763 -8.401528 536.949
## 68655 -37.30736 -8.401528 536.655
## 68656 -37.30708 -8.401528 536.268
## 68657 -37.30680 -8.401528 535.797
## 68658 -37.30652 -8.401528 535.980
## 68659 -37.30625 -8.401528 536.659
## 68660 -37.30597 -8.401528 537.936
## 68661 -37.30569 -8.401528 539.912
## 68662 -37.30541 -8.401528 541.805
## 68663 -37.30513 -8.401528 543.566
## 68664 -37.30486 -8.401528 544.287
## 68665 -37.30458 -8.401528 544.370
## 68666 -37.30430 -8.401528 543.713
## 68667 -37.30402 -8.401528 542.594
## 68668 -37.30375 -8.401528 541.757
## 68669 -37.30347 -8.401528 540.957
## 68670 -37.30319 -8.401528 540.507
## 68671 -37.30291 -8.401528 540.315
## 68672 -37.30263 -8.401528 540.864
## 68673 -37.30236 -8.401528 541.784
## 68674 -37.30208 -8.401528 542.425
## 68675 -37.30180 -8.401528 542.465
## 68676 -37.30152 -8.401528 541.217
## 68677 -37.30125 -8.401528 539.766
## 68678 -37.30097 -8.401528 538.649
## 68679 -37.30069 -8.401528 538.711
## 68680 -37.30041 -8.401528 539.285
## 68681 -37.30013 -8.401528 540.289
## 68682 -37.29986 -8.401528 541.007
## 68683 -37.29958 -8.401528 541.660
## 68684 -37.29930 -8.401528 541.952
## 68685 -37.29902 -8.401528 541.726
## 68686 -37.29875 -8.401528 541.301
## 68687 -37.29847 -8.401528 540.716
## 68688 -37.29819 -8.401528 540.637
## 68689 -37.29791 -8.401528 540.905
## 68690 -37.29763 -8.401528 541.355
## 68691 -37.29736 -8.401528 542.354
## 68692 -37.29708 -8.401528 543.362
## 68693 -37.29680 -8.401528 544.052
## 68694 -37.29652 -8.401528 544.195
## 68695 -37.29625 -8.401528 544.238
## 68696 -37.29597 -8.401528 544.267
## 68697 -37.29569 -8.401528 545.040
## 68698 -37.29541 -8.401528 545.965
## 68699 -37.29513 -8.401528 547.278
## 68700 -37.29486 -8.401528 548.412
## 68701 -37.29458 -8.401528 549.485
## 68702 -37.29430 -8.401528 550.348
## 68703 -37.29402 -8.401528 551.071
## 68704 -37.29375 -8.401528 551.864
## 68705 -37.29347 -8.401528 552.685
## 68706 -37.29319 -8.401528 553.579
## 68707 -37.29291 -8.401528 554.471
## 68708 -37.29263 -8.401528 555.397
## 68709 -37.29236 -8.401528 556.125
## 68710 -37.29208 -8.401528 556.528
## 68711 -37.29180 -8.401528 556.443
## 68712 -37.29152 -8.401528 556.086
## 68713 -37.29125 -8.401528 555.828
## 68714 -37.29097 -8.401528 555.795
## 68715 -37.29069 -8.401528 556.461
## 68716 -37.29041 -8.401528 557.236
## 68717 -37.29013 -8.401528 557.565
## 68718 -37.28986 -8.401528 557.131
## 68719 -37.28958 -8.401528 556.656
## 68720 -37.28930 -8.401528 556.705
## 68721 -37.28902 -8.401528 558.104
## 68722 -37.28875 -8.401528 559.721
## 68723 -37.28847 -8.401528 561.158
## 68724 -37.28819 -8.401528 561.402
## 68725 -37.28791 -8.401528 561.405
## 68726 -37.28763 -8.401528 561.235
## 68727 -37.28736 -8.401528 561.654
## 68728 -37.28708 -8.401528 562.270
## 68729 -37.28680 -8.401528 562.889
## 68730 -37.28652 -8.401528 563.469
## 68731 -37.28625 -8.401528 563.833
## 68732 -37.28597 -8.401528 563.717
## 68733 -37.28569 -8.401528 563.178
## 68734 -37.28541 -8.401528 562.554
## 68735 -37.28513 -8.401528 562.472
## 68736 -37.28486 -8.401528 563.165
## 68737 -37.28458 -8.401528 563.975
## 68738 -37.28430 -8.401528 564.499
## 68739 -37.28402 -8.401528 564.620
## 68740 -37.28375 -8.401528 564.718
## 68741 -37.28347 -8.401528 564.887
## 68742 -37.28319 -8.401528 565.633
## 68743 -37.28291 -8.401528 566.284
## 68744 -37.28263 -8.401528 566.668
## 68745 -37.28236 -8.401528 565.961
## 68746 -37.28208 -8.401528 564.880
## 68747 -37.28180 -8.401528 564.150
## 68748 -37.28152 -8.401528 563.885
## 68749 -37.28125 -8.401528 563.531
## 68750 -37.28097 -8.401528 563.117
## 68751 -37.28069 -8.401528 562.298
## 68752 -37.28041 -8.401528 561.577
## 68753 -37.28013 -8.401528 560.882
## 68754 -37.27986 -8.401528 560.407
## 68755 -37.27958 -8.401528 560.538
## 68756 -37.27930 -8.401528 561.162
## 68757 -37.27902 -8.401528 562.404
## 68758 -37.27875 -8.401528 563.769
## 68759 -37.27847 -8.401528 565.058
## 68760 -37.27819 -8.401528 565.888
## 68761 -37.27791 -8.401528 566.711
## 68762 -37.27763 -8.401528 567.485
## 68763 -37.27736 -8.401528 568.609
## 68764 -37.27708 -8.401528 569.667
## 68765 -37.27680 -8.401528 570.341
## 68766 -37.27652 -8.401528 570.351
## 68767 -37.27625 -8.401528 570.165
## 68768 -37.27597 -8.401528 569.992
## 68769 -37.27569 -8.401528 570.247
## 68770 -37.27541 -8.401528 570.504
## 68771 -37.27513 -8.401528 570.874
## 68772 -37.27486 -8.401528 571.006
## 68773 -37.27458 -8.401528 571.018
## 68774 -37.27430 -8.401528 570.503
## 68775 -37.27402 -8.401528 570.004
## 68776 -37.27375 -8.401528 569.257
## 68777 -37.27347 -8.401528 568.145
## 68778 -37.27319 -8.401528 566.735
## 68779 -37.27291 -8.401528 565.638
## 68780 -37.27263 -8.401528 565.180
## 68781 -37.27236 -8.401528 565.789
## 68782 -37.27208 -8.401528 566.631
## 68783 -37.27180 -8.401528 567.259
## 68784 -37.27152 -8.401528 566.781
## 68785 -37.27125 -8.401528 565.831
## 68786 -37.27097 -8.401528 564.337
## 68787 -37.27069 -8.401528 562.398
## 68788 -37.27041 -8.401528 560.399
## 68789 -37.27013 -8.401528 558.679
## 68790 -37.26986 -8.401528 557.745
## 68791 -37.26958 -8.401528 557.114
## 68792 -37.26930 -8.401528 556.726
## 68793 -37.26902 -8.401528 556.273
## 68794 -37.26875 -8.401528 555.834
## 68795 -37.26847 -8.401528 555.665
## 68796 -37.26819 -8.401528 555.864
## 68797 -37.26791 -8.401528 556.471
## 68798 -37.26763 -8.401528 557.418
## 68799 -37.26736 -8.401528 558.589
## 68800 -37.26708 -8.401528 559.874
## 68801 -37.26680 -8.401528 561.130
## 68802 -37.26652 -8.401528 562.059
## 68803 -37.26625 -8.401528 562.561
## 68804 -37.26597 -8.401528 562.662
## 68805 -37.26569 -8.401528 562.305
## 68806 -37.26541 -8.401528 561.634
## 68807 -37.26513 -8.401528 560.471
## 68808 -37.26486 -8.401528 559.303
## 68809 -37.26458 -8.401528 557.970
## 68810 -37.26430 -8.401528 556.950
## 68811 -37.26402 -8.401528 555.951
## 68812 -37.26375 -8.401528 555.102
## 68813 -37.26347 -8.401528 554.733
## 68814 -37.26319 -8.401528 554.758
## 68815 -37.26291 -8.401528 554.938
## 68816 -37.26263 -8.401528 555.182
## 68817 -37.26236 -8.401528 554.723
## 68818 -37.26208 -8.401528 554.407
## 68819 -37.26180 -8.401528 553.373
## 68820 -37.26152 -8.401528 552.732
## 68821 -37.26125 -8.401528 552.623
## 68822 -37.26097 -8.401528 552.663
## 68823 -37.26069 -8.401528 553.308
## 68824 -37.26041 -8.401528 553.911
## 68825 -37.26013 -8.401528 554.546
## 68826 -37.25986 -8.401528 554.527
## 68827 -37.25958 -8.401528 554.143
## 68828 -37.25930 -8.401528 553.930
## 68829 -37.25902 -8.401528 554.539
## 68830 -37.25875 -8.401528 555.297
## 68831 -37.25847 -8.401528 555.894
## 68832 -37.25819 -8.401528 555.158
## 68833 -37.25791 -8.401528 554.246
## 68834 -37.25763 -8.401528 553.304
## 68835 -37.25736 -8.401528 553.073
## 68836 -37.25708 -8.401528 553.246
## 68837 -37.25680 -8.401528 553.357
## 68838 -37.25652 -8.401528 553.271
## 68839 -37.25625 -8.401528 553.297
## 68840 -37.25597 -8.401528 553.767
## 68841 -37.25569 -8.401528 554.548
## 68842 -37.25541 -8.401528 555.538
## 68843 -37.25513 -8.401528 556.483
## 68844 -37.25486 -8.401528 557.376
## 68845 -37.25458 -8.401528 558.453
## 68846 -37.25430 -8.401528 559.297
## 68847 -37.25402 -8.401528 560.068
## 68848 -37.25375 -8.401528 560.739
## 68849 -37.25347 -8.401528 561.144
## 68850 -37.25319 -8.401528 561.374
## 68851 -37.25291 -8.401528 561.425
## 68852 -37.25263 -8.401528 561.653
## 68853 -37.25236 -8.401528 562.387
## 68854 -37.25208 -8.401528 563.098
## 68855 -37.25180 -8.401528 563.813
## 68856 -37.25152 -8.401528 564.109
## 68857 -37.25125 -8.401528 564.161
## 68858 -37.25097 -8.401528 564.288
## 68859 -37.25069 -8.401528 564.642
## 68860 -37.25041 -8.401528 565.093
## 68861 -37.25013 -8.401528 565.476
## 68862 -37.24986 -8.401528 565.488
## 68863 -37.24958 -8.401528 565.807
## 68864 -37.24930 -8.401528 566.055
## 68865 -37.24902 -8.401528 566.723
## 68866 -37.24875 -8.401528 567.494
## 68867 -37.24847 -8.401528 568.312
## 68868 -37.24819 -8.401528 569.221
## 68869 -37.24791 -8.401528 570.154
## 68870 -37.24763 -8.401528 571.360
## 68871 -37.24736 -8.401528 572.391
## 68872 -37.24708 -8.401528 573.431
## 68873 -37.24680 -8.401528 574.157
## 68874 -37.24652 -8.401528 574.964
## 68875 -37.24625 -8.401528 575.732
## 68876 -37.24597 -8.401528 576.224
## 68877 -37.24569 -8.401528 576.564
## 68878 -37.24541 -8.401528 576.758
## 68879 -37.24513 -8.401528 577.039
## 68880 -37.24486 -8.401528 577.154
## 68881 -37.24458 -8.401528 576.897
## 68882 -37.24430 -8.401528 576.187
## 68883 -37.24402 -8.401528 575.234
## 68884 -37.24375 -8.401528 574.088
## 68885 -37.24347 -8.401528 572.772
## 68886 -37.24319 -8.401528 571.563
## 68887 -37.24291 -8.401528 570.747
## 68888 -37.24263 -8.401528 570.644
## 68889 -37.24236 -8.401528 571.348
## 68890 -37.24208 -8.401528 572.538
## 68891 -37.24180 -8.401528 573.941
## 68892 -37.24152 -8.401528 575.267
## 68893 -37.24125 -8.401528 576.383
## 68894 -37.24097 -8.401528 577.388
## 68895 -37.24069 -8.401528 577.953
## 68896 -37.24041 -8.401528 578.155
## 68897 -37.24013 -8.401528 577.617
## 68898 -37.23986 -8.401528 576.557
## 68899 -37.23958 -8.401528 575.568
## 68900 -37.23930 -8.401528 574.929
## 68901 -37.23902 -8.401528 574.448
## 68902 -37.23875 -8.401528 574.033
## 68903 -37.23847 -8.401528 573.849
## 68904 -37.23819 -8.401528 573.691
## 68905 -37.23791 -8.401528 573.784
## 68906 -37.23763 -8.401528 574.050
## 68907 -37.23736 -8.401528 574.811
## 68908 -37.23708 -8.401528 575.771
## 68909 -37.23680 -8.401528 576.494
## 68910 -37.23652 -8.401528 576.579
## 68911 -37.23625 -8.401528 576.330
## 68912 -37.23597 -8.401528 575.724
## 68913 -37.23569 -8.401528 575.124
## 68914 -37.23541 -8.401528 574.432
## 68915 -37.23513 -8.401528 573.677
## 68916 -37.23486 -8.401528 572.695
## 68917 -37.23458 -8.401528 571.460
## 68918 -37.23430 -8.401528 569.921
## 68919 -37.23402 -8.401528 568.233
## 68920 -37.23375 -8.401528 566.645
## 68921 -37.23347 -8.401528 565.176
## 68922 -37.23319 -8.401528 564.232
## 69946 -37.32513 -8.401806 533.991
## 69947 -37.32486 -8.401806 533.095
## 69948 -37.32458 -8.401806 532.474
## 69949 -37.32430 -8.401806 532.740
## 69950 -37.32402 -8.401806 533.697
## 69951 -37.32375 -8.401806 534.477
## 69952 -37.32347 -8.401806 535.112
## 69953 -37.32319 -8.401806 535.612
## 69954 -37.32291 -8.401806 535.795
## 69955 -37.32263 -8.401806 535.497
## 69956 -37.32236 -8.401806 535.156
## 69957 -37.32208 -8.401806 534.786
## 69958 -37.32180 -8.401806 534.843
## 69959 -37.32152 -8.401806 534.456
## 69960 -37.32125 -8.401806 534.154
## 69961 -37.32097 -8.401806 533.634
## 69962 -37.32069 -8.401806 533.378
## 69963 -37.32041 -8.401806 533.199
## 69964 -37.32013 -8.401806 532.989
## 69965 -37.31986 -8.401806 533.485
## 69966 -37.31958 -8.401806 534.028
## 69967 -37.31930 -8.401806 534.968
## 69968 -37.31902 -8.401806 535.085
## 69969 -37.31875 -8.401806 534.841
## 69970 -37.31847 -8.401806 534.548
## 69971 -37.31819 -8.401806 534.623
## 69972 -37.31791 -8.401806 534.820
## 69973 -37.31763 -8.401806 534.893
## 69974 -37.31736 -8.401806 534.750
## 69975 -37.31708 -8.401806 534.729
## 69976 -37.31680 -8.401806 534.949
## 69977 -37.31652 -8.401806 535.807
## 69978 -37.31625 -8.401806 536.715
## 69979 -37.31597 -8.401806 537.422
## 69980 -37.31569 -8.401806 537.664
## 69981 -37.31541 -8.401806 537.596
## 69982 -37.31513 -8.401806 537.531
## 69983 -37.31486 -8.401806 537.439
## 69984 -37.31458 -8.401806 537.297
## 69985 -37.31430 -8.401806 537.252
## 69986 -37.31402 -8.401806 537.243
## 69987 -37.31375 -8.401806 537.215
## 69988 -37.31347 -8.401806 537.201
## 69989 -37.31319 -8.401806 536.886
## 69990 -37.31291 -8.401806 536.852
## 69991 -37.31263 -8.401806 536.875
## 69992 -37.31236 -8.401806 537.375
## 69993 -37.31208 -8.401806 537.884
## 69994 -37.31180 -8.401806 538.432
## 69995 -37.31152 -8.401806 538.306
## 69996 -37.31125 -8.401806 537.999
## 69997 -37.31097 -8.401806 537.730
## 69998 -37.31069 -8.401806 538.285
## 69999 -37.31041 -8.401806 538.607
## 70000 -37.31013 -8.401806 538.692
## 70001 -37.30986 -8.401806 538.264
## 70002 -37.30958 -8.401806 537.596
## 70003 -37.30930 -8.401806 536.767
## 70004 -37.30902 -8.401806 535.922
## 70005 -37.30875 -8.401806 535.250
## 70006 -37.30847 -8.401806 535.015
## 70007 -37.30819 -8.401806 535.512
## 70008 -37.30791 -8.401806 536.225
## 70009 -37.30763 -8.401806 536.841
## 70010 -37.30736 -8.401806 536.561
## 70011 -37.30708 -8.401806 536.348
## 70012 -37.30680 -8.401806 535.837
## 70013 -37.30652 -8.401806 536.289
## 70014 -37.30625 -8.401806 537.289
## 70015 -37.30597 -8.401806 538.749
## 70016 -37.30569 -8.401806 540.846
## 70017 -37.30541 -8.401806 542.727
## 70018 -37.30513 -8.401806 544.718
## 70019 -37.30486 -8.401806 545.138
## 70020 -37.30458 -8.401806 545.037
## 70021 -37.30430 -8.401806 544.149
## 70022 -37.30402 -8.401806 543.119
## 70023 -37.30375 -8.401806 542.534
## 70024 -37.30347 -8.401806 541.642
## 70025 -37.30319 -8.401806 540.945
## 70026 -37.30291 -8.401806 540.890
## 70027 -37.30263 -8.401806 541.553
## 70028 -37.30236 -8.401806 542.296
## 70029 -37.30208 -8.401806 542.852
## 70030 -37.30180 -8.401806 542.748
## 70031 -37.30152 -8.401806 542.084
## 70032 -37.30125 -8.401806 541.034
## 70033 -37.30097 -8.401806 539.908
## 70034 -37.30069 -8.401806 539.275
## 70035 -37.30041 -8.401806 539.394
## 70036 -37.30013 -8.401806 540.080
## 70037 -37.29986 -8.401806 540.899
## 70038 -37.29958 -8.401806 541.637
## 70039 -37.29930 -8.401806 542.125
## 70040 -37.29902 -8.401806 542.099
## 70041 -37.29875 -8.401806 541.878
## 70042 -37.29847 -8.401806 541.400
## 70043 -37.29819 -8.401806 541.098
## 70044 -37.29791 -8.401806 541.067
## 70045 -37.29763 -8.401806 541.306
## 70046 -37.29736 -8.401806 542.234
## 70047 -37.29708 -8.401806 543.000
## 70048 -37.29680 -8.401806 543.801
## 70049 -37.29652 -8.401806 543.836
## 70050 -37.29625 -8.401806 543.721
## 70051 -37.29597 -8.401806 543.581
## 70052 -37.29569 -8.401806 544.599
## 70053 -37.29541 -8.401806 545.786
## 70054 -37.29513 -8.401806 547.299
## 70055 -37.29486 -8.401806 548.076
## 70056 -37.29458 -8.401806 548.641
## 70057 -37.29430 -8.401806 549.195
## 70058 -37.29402 -8.401806 549.930
## 70059 -37.29375 -8.401806 550.694
## 70060 -37.29347 -8.401806 551.428
## 70061 -37.29319 -8.401806 552.392
## 70062 -37.29291 -8.401806 553.349
## 70063 -37.29263 -8.401806 554.361
## 70064 -37.29236 -8.401806 554.829
## 70065 -37.29208 -8.401806 555.173
## 70066 -37.29180 -8.401806 554.840
## 70067 -37.29152 -8.401806 554.688
## 70068 -37.29125 -8.401806 554.395
## 70069 -37.29097 -8.401806 554.440
## 70070 -37.29069 -8.401806 554.888
## 70071 -37.29041 -8.401806 555.262
## 70072 -37.29013 -8.401806 555.487
## 70073 -37.28986 -8.401806 555.256
## 70074 -37.28958 -8.401806 554.962
## 70075 -37.28930 -8.401806 555.423
## 70076 -37.28902 -8.401806 556.861
## 70077 -37.28875 -8.401806 558.461
## 70078 -37.28847 -8.401806 560.208
## 70079 -37.28819 -8.401806 560.836
## 70080 -37.28791 -8.401806 560.785
## 70081 -37.28763 -8.401806 560.883
## 70082 -37.28736 -8.401806 561.620
## 70083 -37.28708 -8.401806 562.581
## 70084 -37.28680 -8.401806 563.441
## 70085 -37.28652 -8.401806 564.102
## 70086 -37.28625 -8.401806 564.516
## 70087 -37.28597 -8.401806 564.520
## 70088 -37.28569 -8.401806 564.258
## 70089 -37.28541 -8.401806 563.789
## 70090 -37.28513 -8.401806 563.809
## 70091 -37.28486 -8.401806 564.238
## 70092 -37.28458 -8.401806 564.871
## 70093 -37.28430 -8.401806 565.188
## 70094 -37.28402 -8.401806 565.172
## 70095 -37.28375 -8.401806 565.207
## 70096 -37.28347 -8.401806 565.232
## 70097 -37.28319 -8.401806 565.957
## 70098 -37.28291 -8.401806 566.897
## 70099 -37.28263 -8.401806 567.354
## 70100 -37.28236 -8.401806 566.995
## 70101 -37.28208 -8.401806 566.299
## 70102 -37.28180 -8.401806 565.867
## 70103 -37.28152 -8.401806 565.527
## 70104 -37.28125 -8.401806 565.203
## 70105 -37.28097 -8.401806 564.766
## 70106 -37.28069 -8.401806 563.430
## 70107 -37.28041 -8.401806 562.185
## 70108 -37.28013 -8.401806 561.008
## 70109 -37.27986 -8.401806 560.716
## 70110 -37.27958 -8.401806 560.845
## 70111 -37.27930 -8.401806 561.636
## 70112 -37.27902 -8.401806 562.624
## 70113 -37.27875 -8.401806 563.723
## 70114 -37.27847 -8.401806 564.856
## 70115 -37.27819 -8.401806 565.741
## 70116 -37.27791 -8.401806 566.209
## 70117 -37.27763 -8.401806 566.904
## 70118 -37.27736 -8.401806 567.970
## 70119 -37.27708 -8.401806 569.039
## 70120 -37.27680 -8.401806 569.638
## 70121 -37.27652 -8.401806 569.895
## 70122 -37.27625 -8.401806 570.213
## 70123 -37.27597 -8.401806 570.338
## 70124 -37.27569 -8.401806 570.429
## 70125 -37.27541 -8.401806 570.711
## 70126 -37.27513 -8.401806 571.056
## 70127 -37.27486 -8.401806 571.464
## 70128 -37.27458 -8.401806 571.646
## 70129 -37.27430 -8.401806 571.405
## 70130 -37.27402 -8.401806 570.386
## 70131 -37.27375 -8.401806 569.049
## 70132 -37.27347 -8.401806 567.571
## 70133 -37.27319 -8.401806 566.547
## 70134 -37.27291 -8.401806 565.576
## 70135 -37.27263 -8.401806 565.170
## 70136 -37.27236 -8.401806 565.744
## 70137 -37.27208 -8.401806 566.407
## 70138 -37.27180 -8.401806 566.889
## 70139 -37.27152 -8.401806 566.034
## 70140 -37.27125 -8.401806 564.675
## 70141 -37.27097 -8.401806 563.004
## 70142 -37.27069 -8.401806 561.620
## 70143 -37.27041 -8.401806 560.309
## 70144 -37.27013 -8.401806 559.029
## 70145 -37.26986 -8.401806 558.345
## 70146 -37.26958 -8.401806 558.013
## 70147 -37.26930 -8.401806 557.685
## 70148 -37.26902 -8.401806 557.274
## 70149 -37.26875 -8.401806 556.718
## 70150 -37.26847 -8.401806 556.430
## 70151 -37.26819 -8.401806 556.221
## 70152 -37.26791 -8.401806 556.597
## 70153 -37.26763 -8.401806 557.171
## 70154 -37.26736 -8.401806 558.621
## 70155 -37.26708 -8.401806 560.297
## 70156 -37.26680 -8.401806 561.865
## 70157 -37.26652 -8.401806 562.832
## 70158 -37.26625 -8.401806 563.449
## 70159 -37.26597 -8.401806 563.569
## 70160 -37.26569 -8.401806 563.338
## 70161 -37.26541 -8.401806 562.577
## 70162 -37.26513 -8.401806 561.307
## 70163 -37.26486 -8.401806 559.767
## 70164 -37.26458 -8.401806 558.147
## 70165 -37.26430 -8.401806 556.691
## 70166 -37.26402 -8.401806 556.059
## 70167 -37.26375 -8.401806 555.372
## 70168 -37.26347 -8.401806 555.271
## 70169 -37.26319 -8.401806 555.092
## 70170 -37.26291 -8.401806 554.985
## 70171 -37.26263 -8.401806 555.001
## 70172 -37.26236 -8.401806 555.086
## 70173 -37.26208 -8.401806 555.088
## 70174 -37.26180 -8.401806 554.840
## 70175 -37.26152 -8.401806 553.575
## 70176 -37.26125 -8.401806 552.564
## 70177 -37.26097 -8.401806 552.126
## 70178 -37.26069 -8.401806 553.053
## 70179 -37.26041 -8.401806 553.801
## 70180 -37.26013 -8.401806 554.711
## 70181 -37.25986 -8.401806 554.567
## 70182 -37.25958 -8.401806 554.291
## 70183 -37.25930 -8.401806 554.176
## 70184 -37.25902 -8.401806 554.797
## 70185 -37.25875 -8.401806 555.541
## 70186 -37.25847 -8.401806 556.325
## 70187 -37.25819 -8.401806 555.689
## 70188 -37.25791 -8.401806 554.770
## 70189 -37.25763 -8.401806 553.874
## 70190 -37.25736 -8.401806 553.473
## 70191 -37.25708 -8.401806 553.602
## 70192 -37.25680 -8.401806 553.493
## 70193 -37.25652 -8.401806 553.726
## 70194 -37.25625 -8.401806 554.081
## 70195 -37.25597 -8.401806 554.719
## 70196 -37.25569 -8.401806 555.045
## 70197 -37.25541 -8.401806 555.477
## 70198 -37.25513 -8.401806 556.094
## 70199 -37.25486 -8.401806 557.064
## 70200 -37.25458 -8.401806 558.024
## 70201 -37.25430 -8.401806 559.029
## 70202 -37.25402 -8.401806 559.869
## 70203 -37.25375 -8.401806 560.678
## 70204 -37.25347 -8.401806 561.331
## 70205 -37.25319 -8.401806 561.820
## 70206 -37.25291 -8.401806 562.060
## 70207 -37.25263 -8.401806 562.536
## 70208 -37.25236 -8.401806 563.401
## 70209 -37.25208 -8.401806 564.250
## 70210 -37.25180 -8.401806 565.000
## 70211 -37.25152 -8.401806 565.344
## 70212 -37.25125 -8.401806 565.527
## 70213 -37.25097 -8.401806 565.557
## 70214 -37.25069 -8.401806 565.148
## 70215 -37.25041 -8.401806 564.897
## 70216 -37.25013 -8.401806 564.759
## 70217 -37.24986 -8.401806 565.020
## 70218 -37.24958 -8.401806 565.413
## 70219 -37.24930 -8.401806 565.925
## 70220 -37.24902 -8.401806 566.559
## 70221 -37.24875 -8.401806 567.295
## 70222 -37.24847 -8.401806 568.078
## 70223 -37.24819 -8.401806 568.844
## 70224 -37.24791 -8.401806 569.722
## 70225 -37.24763 -8.401806 570.965
## 70226 -37.24736 -8.401806 572.003
## 70227 -37.24708 -8.401806 573.121
## 70228 -37.24680 -8.401806 573.991
## 70229 -37.24652 -8.401806 574.821
## 70230 -37.24625 -8.401806 575.681
## 70231 -37.24597 -8.401806 576.185
## 70232 -37.24569 -8.401806 576.628
## 70233 -37.24541 -8.401806 577.020
## 70234 -37.24513 -8.401806 577.414
## 70235 -37.24486 -8.401806 577.709
## 70236 -37.24458 -8.401806 577.681
## 70237 -37.24430 -8.401806 577.113
## 70238 -37.24402 -8.401806 576.134
## 70239 -37.24375 -8.401806 574.935
## 70240 -37.24347 -8.401806 573.568
## 70241 -37.24319 -8.401806 572.261
## 70242 -37.24291 -8.401806 571.416
## 70243 -37.24263 -8.401806 571.276
## 70244 -37.24236 -8.401806 572.235
## 70245 -37.24208 -8.401806 573.631
## 70246 -37.24180 -8.401806 575.197
## 70247 -37.24152 -8.401806 576.545
## 70248 -37.24125 -8.401806 577.668
## 70249 -37.24097 -8.401806 578.680
## 70250 -37.24069 -8.401806 578.738
## 70251 -37.24041 -8.401806 578.368
## 70252 -37.24013 -8.401806 577.530
## 70253 -37.23986 -8.401806 576.760
## 70254 -37.23958 -8.401806 575.940
## 70255 -37.23930 -8.401806 575.510
## 70256 -37.23902 -8.401806 575.446
## 70257 -37.23875 -8.401806 575.610
## 70258 -37.23847 -8.401806 575.709
## 70259 -37.23819 -8.401806 575.133
## 70260 -37.23791 -8.401806 574.827
## 70261 -37.23763 -8.401806 574.748
## 70262 -37.23736 -8.401806 575.770
## 70263 -37.23708 -8.401806 576.721
## 70264 -37.23680 -8.401806 577.666
## 70265 -37.23652 -8.401806 577.442
## 70266 -37.23625 -8.401806 576.769
## 70267 -37.23597 -8.401806 575.849
## 70268 -37.23569 -8.401806 575.403
## 70269 -37.23541 -8.401806 574.905
## 70270 -37.23513 -8.401806 574.257
## 70271 -37.23486 -8.401806 572.859
## 70272 -37.23458 -8.401806 571.448
## 70273 -37.23430 -8.401806 569.573
## 70274 -37.23402 -8.401806 567.884
## 70275 -37.23375 -8.401806 566.374
## 70276 -37.23347 -8.401806 564.740
## 70277 -37.23319 -8.401806 564.182
## 70278 -37.23291 -8.401806 563.875
## 71295 -37.32680 -8.402083 535.898
## 71296 -37.32652 -8.402083 536.256
## 71297 -37.32625 -8.402083 536.576
## 71298 -37.32597 -8.402083 536.634
## 71299 -37.32569 -8.402083 535.956
## 71300 -37.32541 -8.402083 535.049
## 71301 -37.32513 -8.402083 534.118
## 71302 -37.32486 -8.402083 533.538
## 71303 -37.32458 -8.402083 533.224
## 71304 -37.32430 -8.402083 533.219
## 71305 -37.32402 -8.402083 533.526
## 71306 -37.32375 -8.402083 533.980
## 71307 -37.32347 -8.402083 534.440
## 71308 -37.32319 -8.402083 534.796
## 71309 -37.32291 -8.402083 534.973
## 71310 -37.32263 -8.402083 534.934
## 71311 -37.32236 -8.402083 534.724
## 71312 -37.32208 -8.402083 534.382
## 71313 -37.32180 -8.402083 533.985
## 71314 -37.32152 -8.402083 533.516
## 71315 -37.32125 -8.402083 533.110
## 71316 -37.32097 -8.402083 532.758
## 71317 -37.32069 -8.402083 532.551
## 71318 -37.32041 -8.402083 532.516
## 71319 -37.32013 -8.402083 532.786
## 71320 -37.31986 -8.402083 533.500
## 71321 -37.31958 -8.402083 534.247
## 71322 -37.31930 -8.402083 534.747
## 71323 -37.31902 -8.402083 534.665
## 71324 -37.31875 -8.402083 534.400
## 71325 -37.31847 -8.402083 534.123
## 71326 -37.31819 -8.402083 534.231
## 71327 -37.31791 -8.402083 534.454
## 71328 -37.31763 -8.402083 534.702
## 71329 -37.31736 -8.402083 534.799
## 71330 -37.31708 -8.402083 535.023
## 71331 -37.31680 -8.402083 535.432
## 71332 -37.31652 -8.402083 536.421
## 71333 -37.31625 -8.402083 537.461
## 71334 -37.31597 -8.402083 538.317
## 71335 -37.31569 -8.402083 538.591
## 71336 -37.31541 -8.402083 538.569
## 71337 -37.31513 -8.402083 538.382
## 71338 -37.31486 -8.402083 538.180
## 71339 -37.31458 -8.402083 537.962
## 71340 -37.31430 -8.402083 537.772
## 71341 -37.31402 -8.402083 537.636
## 71342 -37.31375 -8.402083 537.492
## 71343 -37.31347 -8.402083 537.321
## 71344 -37.31319 -8.402083 537.004
## 71345 -37.31291 -8.402083 536.810
## 71346 -37.31263 -8.402083 536.897
## 71347 -37.31236 -8.402083 537.514
## 71348 -37.31208 -8.402083 538.205
## 71349 -37.31180 -8.402083 538.627
## 71350 -37.31152 -8.402083 538.439
## 71351 -37.31125 -8.402083 538.148
## 71352 -37.31097 -8.402083 537.977
## 71353 -37.31069 -8.402083 538.511
## 71354 -37.31041 -8.402083 539.046
## 71355 -37.31013 -8.402083 539.260
## 71356 -37.30986 -8.402083 538.750
## 71357 -37.30958 -8.402083 537.893
## 71358 -37.30930 -8.402083 536.868
## 71359 -37.30902 -8.402083 535.840
## 71360 -37.30875 -8.402083 535.065
## 71361 -37.30847 -8.402083 534.722
## 71362 -37.30819 -8.402083 535.220
## 71363 -37.30791 -8.402083 535.895
## 71364 -37.30763 -8.402083 536.381
## 71365 -37.30736 -8.402083 536.231
## 71366 -37.30708 -8.402083 536.017
## 71367 -37.30680 -8.402083 536.084
## 71368 -37.30652 -8.402083 536.800
## 71369 -37.30625 -8.402083 538.012
## 71370 -37.30597 -8.402083 539.641
## 71371 -37.30569 -8.402083 541.653
## 71372 -37.30541 -8.402083 543.527
## 71373 -37.30513 -8.402083 544.879
## 71374 -37.30486 -8.402083 545.146
## 71375 -37.30458 -8.402083 544.827
## 71376 -37.30430 -8.402083 544.126
## 71377 -37.30402 -8.402083 543.567
## 71378 -37.30375 -8.402083 543.005
## 71379 -37.30347 -8.402083 542.453
## 71380 -37.30319 -8.402083 541.919
## 71381 -37.30291 -8.402083 541.630
## 71382 -37.30263 -8.402083 541.767
## 71383 -37.30236 -8.402083 542.419
## 71384 -37.30208 -8.402083 543.116
## 71385 -37.30180 -8.402083 543.392
## 71386 -37.30152 -8.402083 542.901
## 71387 -37.30125 -8.402083 542.083
## 71388 -37.30097 -8.402083 541.203
## 71389 -37.30069 -8.402083 540.621
## 71390 -37.30041 -8.402083 540.341
## 71391 -37.30013 -8.402083 540.454
## 71392 -37.29986 -8.402083 541.045
## 71393 -37.29958 -8.402083 541.747
## 71394 -37.29930 -8.402083 542.303
## 71395 -37.29902 -8.402083 542.516
## 71396 -37.29875 -8.402083 542.524
## 71397 -37.29847 -8.402083 542.384
## 71398 -37.29819 -8.402083 542.132
## 71399 -37.29791 -8.402083 541.989
## 71400 -37.29763 -8.402083 542.120
## 71401 -37.29736 -8.402083 542.736
## 71402 -37.29708 -8.402083 543.421
## 71403 -37.29680 -8.402083 544.206
## 71404 -37.29652 -8.402083 543.881
## 71405 -37.29625 -8.402083 543.697
## 71406 -37.29597 -8.402083 543.740
## 71407 -37.29569 -8.402083 544.645
## 71408 -37.29541 -8.402083 545.788
## 71409 -37.29513 -8.402083 546.876
## 71410 -37.29486 -8.402083 547.429
## 71411 -37.29458 -8.402083 547.808
## 71412 -37.29430 -8.402083 548.148
## 71413 -37.29402 -8.402083 548.611
## 71414 -37.29375 -8.402083 549.174
## 71415 -37.29347 -8.402083 549.885
## 71416 -37.29319 -8.402083 550.877
## 71417 -37.29291 -8.402083 551.863
## 71418 -37.29263 -8.402083 552.657
## 71419 -37.29236 -8.402083 553.025
## 71420 -37.29208 -8.402083 553.144
## 71421 -37.29180 -8.402083 553.079
## 71422 -37.29152 -8.402083 552.938
## 71423 -37.29125 -8.402083 552.835
## 71424 -37.29097 -8.402083 552.856
## 71425 -37.29069 -8.402083 553.167
## 71426 -37.29041 -8.402083 553.501
## 71427 -37.29013 -8.402083 553.694
## 71428 -37.28986 -8.402083 553.540
## 71429 -37.28958 -8.402083 553.511
## 71430 -37.28930 -8.402083 553.821
## 71431 -37.28902 -8.402083 555.259
## 71432 -37.28875 -8.402083 556.955
## 71433 -37.28847 -8.402083 558.554
## 71434 -37.28819 -8.402083 559.267
## 71435 -37.28791 -8.402083 559.772
## 71436 -37.28763 -8.402083 560.350
## 71437 -37.28736 -8.402083 561.456
## 71438 -37.28708 -8.402083 562.655
## 71439 -37.28680 -8.402083 563.755
## 71440 -37.28652 -8.402083 564.576
## 71441 -37.28625 -8.402083 565.088
## 71442 -37.28597 -8.402083 565.246
## 71443 -37.28569 -8.402083 564.959
## 71444 -37.28541 -8.402083 564.578
## 71445 -37.28513 -8.402083 564.367
## 71446 -37.28486 -8.402083 564.566
## 71447 -37.28458 -8.402083 564.931
## 71448 -37.28430 -8.402083 565.233
## 71449 -37.28402 -8.402083 565.230
## 71450 -37.28375 -8.402083 565.288
## 71451 -37.28347 -8.402083 565.543
## 71452 -37.28319 -8.402083 566.445
## 71453 -37.28291 -8.402083 567.328
## 71454 -37.28263 -8.402083 567.882
## 71455 -37.28236 -8.402083 567.758
## 71456 -37.28208 -8.402083 567.355
## 71457 -37.28180 -8.402083 566.949
## 71458 -37.28152 -8.402083 566.770
## 71459 -37.28125 -8.402083 566.448
## 71460 -37.28097 -8.402083 565.800
## 71461 -37.28069 -8.402083 564.355
## 71462 -37.28041 -8.402083 562.847
## 71463 -37.28013 -8.402083 561.671
## 71464 -37.27986 -8.402083 561.348
## 71465 -37.27958 -8.402083 561.521
## 71466 -37.27930 -8.402083 562.088
## 71467 -37.27902 -8.402083 562.880
## 71468 -37.27875 -8.402083 563.791
## 71469 -37.27847 -8.402083 564.691
## 71470 -37.27819 -8.402083 565.269
## 71471 -37.27791 -8.402083 565.802
## 71472 -37.27763 -8.402083 566.398
## 71473 -37.27736 -8.402083 567.247
## 71474 -37.27708 -8.402083 568.095
## 71475 -37.27680 -8.402083 568.842
## 71476 -37.27652 -8.402083 569.422
## 71477 -37.27625 -8.402083 569.913
## 71478 -37.27597 -8.402083 570.335
## 71479 -37.27569 -8.402083 570.670
## 71480 -37.27541 -8.402083 570.998
## 71481 -37.27513 -8.402083 571.363
## 71482 -37.27486 -8.402083 571.859
## 71483 -37.27458 -8.402083 572.095
## 71484 -37.27430 -8.402083 571.788
## 71485 -37.27402 -8.402083 570.677
## 71486 -37.27375 -8.402083 569.241
## 71487 -37.27347 -8.402083 567.740
## 71488 -37.27319 -8.402083 566.556
## 71489 -37.27291 -8.402083 565.722
## 71490 -37.27263 -8.402083 565.400
## 71491 -37.27236 -8.402083 565.777
## 71492 -37.27208 -8.402083 566.192
## 71493 -37.27180 -8.402083 566.073
## 71494 -37.27152 -8.402083 564.935
## 71495 -37.27125 -8.402083 563.399
## 71496 -37.27097 -8.402083 561.794
## 71497 -37.27069 -8.402083 560.714
## 71498 -37.27041 -8.402083 559.903
## 71499 -37.27013 -8.402083 559.403
## 71500 -37.26986 -8.402083 559.218
## 71501 -37.26958 -8.402083 559.141
## 71502 -37.26930 -8.402083 559.012
## 71503 -37.26902 -8.402083 558.526
## 71504 -37.26875 -8.402083 557.925
## 71505 -37.26847 -8.402083 557.360
## 71506 -37.26819 -8.402083 556.918
## 71507 -37.26791 -8.402083 556.883
## 71508 -37.26763 -8.402083 557.485
## 71509 -37.26736 -8.402083 558.975
## 71510 -37.26708 -8.402083 560.795
## 71511 -37.26680 -8.402083 562.515
## 71512 -37.26652 -8.402083 563.742
## 71513 -37.26625 -8.402083 564.512
## 71514 -37.26597 -8.402083 564.765
## 71515 -37.26569 -8.402083 564.500
## 71516 -37.26541 -8.402083 563.694
## 71517 -37.26513 -8.402083 562.358
## 71518 -37.26486 -8.402083 560.513
## 71519 -37.26458 -8.402083 558.606
## 71520 -37.26430 -8.402083 557.039
## 71521 -37.26402 -8.402083 556.134
## 71522 -37.26375 -8.402083 555.647
## 71523 -37.26347 -8.402083 555.461
## 71524 -37.26319 -8.402083 555.261
## 71525 -37.26291 -8.402083 555.200
## 71526 -37.26263 -8.402083 555.287
## 71527 -37.26236 -8.402083 555.676
## 71528 -37.26208 -8.402083 555.876
## 71529 -37.26180 -8.402083 555.614
## 71530 -37.26152 -8.402083 554.563
## 71531 -37.26125 -8.402083 553.328
## 71532 -37.26097 -8.402083 552.528
## 71533 -37.26069 -8.402083 553.008
## 71534 -37.26041 -8.402083 553.788
## 71535 -37.26013 -8.402083 554.369
## 71536 -37.25986 -8.402083 554.142
## 71537 -37.25958 -8.402083 553.794
## 71538 -37.25930 -8.402083 553.794
## 71539 -37.25902 -8.402083 554.512
## 71540 -37.25875 -8.402083 555.303
## 71541 -37.25847 -8.402083 555.795
## 71542 -37.25819 -8.402083 555.366
## 71543 -37.25791 -8.402083 554.689
## 71544 -37.25763 -8.402083 554.086
## 71545 -37.25736 -8.402083 553.959
## 71546 -37.25708 -8.402083 554.104
## 71547 -37.25680 -8.402083 554.448
## 71548 -37.25652 -8.402083 554.947
## 71549 -37.25625 -8.402083 555.470
## 71550 -37.25597 -8.402083 555.942
## 71551 -37.25569 -8.402083 556.102
## 71552 -37.25541 -8.402083 556.304
## 71553 -37.25513 -8.402083 556.692
## 71554 -37.25486 -8.402083 557.474
## 71555 -37.25458 -8.402083 558.428
## 71556 -37.25430 -8.402083 559.451
## 71557 -37.25402 -8.402083 560.456
## 71558 -37.25375 -8.402083 561.373
## 71559 -37.25347 -8.402083 562.161
## 71560 -37.25319 -8.402083 562.725
## 71561 -37.25291 -8.402083 563.245
## 71562 -37.25263 -8.402083 563.849
## 71563 -37.25236 -8.402083 564.695
## 71564 -37.25208 -8.402083 565.540
## 71565 -37.25180 -8.402083 566.230
## 71566 -37.25152 -8.402083 566.621
## 71567 -37.25125 -8.402083 566.715
## 71568 -37.25097 -8.402083 566.488
## 71569 -37.25069 -8.402083 565.777
## 71570 -37.25041 -8.402083 565.043
## 71571 -37.25013 -8.402083 564.584
## 71572 -37.24986 -8.402083 564.740
## 71573 -37.24958 -8.402083 565.223
## 71574 -37.24930 -8.402083 565.888
## 71575 -37.24902 -8.402083 566.607
## 71576 -37.24875 -8.402083 567.366
## 71577 -37.24847 -8.402083 568.128
## 71578 -37.24819 -8.402083 568.814
## 71579 -37.24791 -8.402083 569.547
## 71580 -37.24763 -8.402083 570.400
## 71581 -37.24736 -8.402083 571.461
## 71582 -37.24708 -8.402083 572.604
## 71583 -37.24680 -8.402083 573.725
## 71584 -37.24652 -8.402083 574.758
## 71585 -37.24625 -8.402083 575.695
## 71586 -37.24597 -8.402083 576.497
## 71587 -37.24569 -8.402083 577.156
## 71588 -37.24541 -8.402083 577.669
## 71589 -37.24513 -8.402083 578.063
## 71590 -37.24486 -8.402083 578.361
## 71591 -37.24458 -8.402083 578.388
## 71592 -37.24430 -8.402083 578.004
## 71593 -37.24402 -8.402083 577.120
## 71594 -37.24375 -8.402083 575.960
## 71595 -37.24347 -8.402083 574.665
## 71596 -37.24319 -8.402083 573.354
## 71597 -37.24291 -8.402083 572.442
## 71598 -37.24263 -8.402083 572.254
## 71599 -37.24236 -8.402083 573.151
## 71600 -37.24208 -8.402083 574.568
## 71601 -37.24180 -8.402083 576.107
## 71602 -37.24152 -8.402083 577.393
## 71603 -37.24125 -8.402083 578.377
## 71604 -37.24097 -8.402083 578.941
## 71605 -37.24069 -8.402083 578.822
## 71606 -37.24041 -8.402083 578.343
## 71607 -37.24013 -8.402083 577.639
## 71608 -37.23986 -8.402083 576.951
## 71609 -37.23958 -8.402083 576.363
## 71610 -37.23930 -8.402083 576.156
## 71611 -37.23902 -8.402083 576.488
## 71612 -37.23875 -8.402083 576.898
## 71613 -37.23847 -8.402083 577.116
## 71614 -37.23819 -8.402083 576.556
## 71615 -37.23791 -8.402083 576.035
## 71616 -37.23763 -8.402083 575.955
## 71617 -37.23736 -8.402083 576.790
## 71618 -37.23708 -8.402083 577.729
## 71619 -37.23680 -8.402083 578.213
## 71620 -37.23652 -8.402083 577.756
## 71621 -37.23625 -8.402083 576.918
## 71622 -37.23597 -8.402083 575.968
## 71623 -37.23569 -8.402083 575.450
## 71624 -37.23541 -8.402083 574.840
## 71625 -37.23513 -8.402083 573.942
## 71626 -37.23486 -8.402083 572.504
## 71627 -37.23458 -8.402083 570.839
## 71628 -37.23430 -8.402083 569.119
## 71629 -37.23402 -8.402083 567.448
## 71630 -37.23375 -8.402083 566.061
## 71631 -37.23347 -8.402083 565.081
## 71632 -37.23319 -8.402083 564.754
## 71633 -37.23291 -8.402083 564.814
## 72572 -37.34847 -8.402361 527.239
## 72573 -37.34819 -8.402361 525.961
## 72574 -37.34791 -8.402361 525.176
## 72575 -37.34763 -8.402361 524.296
## 72576 -37.34736 -8.402361 524.364
## 72644 -37.32847 -8.402361 534.835
## 72645 -37.32819 -8.402361 534.908
## 72646 -37.32791 -8.402361 534.942
## 72647 -37.32763 -8.402361 534.866
## 72648 -37.32736 -8.402361 534.718
## 72649 -37.32708 -8.402361 534.564
## 72650 -37.32680 -8.402361 534.289
## 72651 -37.32652 -8.402361 534.797
## 72652 -37.32625 -8.402361 535.030
## 72653 -37.32597 -8.402361 535.388
## 72654 -37.32569 -8.402361 535.167
## 72655 -37.32541 -8.402361 534.578
## 72656 -37.32513 -8.402361 534.459
## 72657 -37.32486 -8.402361 534.198
## 72658 -37.32458 -8.402361 534.069
## 72659 -37.32430 -8.402361 533.878
## 72660 -37.32402 -8.402361 533.516
## 72661 -37.32375 -8.402361 533.827
## 72662 -37.32347 -8.402361 534.141
## 72663 -37.32319 -8.402361 534.416
## 72664 -37.32291 -8.402361 534.534
## 72665 -37.32263 -8.402361 534.864
## 72666 -37.32236 -8.402361 534.683
## 72667 -37.32208 -8.402361 534.331
## 72668 -37.32180 -8.402361 533.515
## 72669 -37.32152 -8.402361 532.993
## 72670 -37.32125 -8.402361 532.548
## 72671 -37.32097 -8.402361 532.361
## 72672 -37.32069 -8.402361 532.260
## 72673 -37.32041 -8.402361 532.489
## 72674 -37.32013 -8.402361 533.169
## 72675 -37.31986 -8.402361 533.981
## 72676 -37.31958 -8.402361 534.715
## 72677 -37.31930 -8.402361 534.818
## 72678 -37.31902 -8.402361 534.414
## 72679 -37.31875 -8.402361 534.211
## 72680 -37.31847 -8.402361 534.006
## 72681 -37.31819 -8.402361 534.113
## 72682 -37.31791 -8.402361 534.338
## 72683 -37.31763 -8.402361 534.729
## 72684 -37.31736 -8.402361 535.133
## 72685 -37.31708 -8.402361 535.708
## 72686 -37.31680 -8.402361 536.316
## 72687 -37.31652 -8.402361 537.315
## 72688 -37.31625 -8.402361 538.403
## 72689 -37.31597 -8.402361 539.385
## 72690 -37.31569 -8.402361 539.617
## 72691 -37.31541 -8.402361 539.621
## 72692 -37.31513 -8.402361 539.287
## 72693 -37.31486 -8.402361 539.015
## 72694 -37.31458 -8.402361 538.726
## 72695 -37.31430 -8.402361 538.381
## 72696 -37.31402 -8.402361 538.153
## 72697 -37.31375 -8.402361 537.892
## 72698 -37.31347 -8.402361 537.540
## 72699 -37.31319 -8.402361 537.215
## 72700 -37.31291 -8.402361 536.899
## 72701 -37.31263 -8.402361 537.033
## 72702 -37.31236 -8.402361 537.687
## 72703 -37.31208 -8.402361 538.436
## 72704 -37.31180 -8.402361 538.733
## 72705 -37.31152 -8.402361 538.507
## 72706 -37.31125 -8.402361 538.277
## 72707 -37.31097 -8.402361 538.204
## 72708 -37.31069 -8.402361 538.711
## 72709 -37.31041 -8.402361 539.309
## 72710 -37.31013 -8.402361 539.689
## 72711 -37.30986 -8.402361 539.012
## 72712 -37.30958 -8.402361 538.078
## 72713 -37.30930 -8.402361 536.889
## 72714 -37.30902 -8.402361 535.776
## 72715 -37.30875 -8.402361 535.007
## 72716 -37.30847 -8.402361 534.520
## 72717 -37.30819 -8.402361 535.091
## 72718 -37.30791 -8.402361 535.701
## 72719 -37.30763 -8.402361 536.093
## 72720 -37.30736 -8.402361 535.952
## 72721 -37.30708 -8.402361 535.692
## 72722 -37.30680 -8.402361 536.302
## 72723 -37.30652 -8.402361 537.275
## 72724 -37.30625 -8.402361 538.680
## 72725 -37.30597 -8.402361 540.459
## 72726 -37.30569 -8.402361 542.313
## 72727 -37.30541 -8.402361 544.134
## 72728 -37.30513 -8.402361 544.834
## 72729 -37.30486 -8.402361 544.968
## 72730 -37.30458 -8.402361 544.507
## 72731 -37.30430 -8.402361 544.082
## 72732 -37.30402 -8.402361 543.978
## 72733 -37.30375 -8.402361 543.463
## 72734 -37.30347 -8.402361 543.315
## 72735 -37.30319 -8.402361 542.928
## 72736 -37.30291 -8.402361 542.206
## 72737 -37.30263 -8.402361 541.878
## 72738 -37.30236 -8.402361 542.438
## 72739 -37.30208 -8.402361 543.341
## 72740 -37.30180 -8.402361 544.083
## 72741 -37.30152 -8.402361 543.924
## 72742 -37.30125 -8.402361 543.252
## 72743 -37.30097 -8.402361 542.603
## 72744 -37.30069 -8.402361 542.154
## 72745 -37.30041 -8.402361 541.680
## 72746 -37.30013 -8.402361 541.186
## 72747 -37.29986 -8.402361 541.561
## 72748 -37.29958 -8.402361 542.026
## 72749 -37.29930 -8.402361 542.744
## 72750 -37.29902 -8.402361 543.108
## 72751 -37.29875 -8.402361 543.239
## 72752 -37.29847 -8.402361 543.516
## 72753 -37.29819 -8.402361 543.312
## 72754 -37.29791 -8.402361 543.161
## 72755 -37.29763 -8.402361 543.161
## 72756 -37.29736 -8.402361 543.592
## 72757 -37.29708 -8.402361 544.208
## 72758 -37.29680 -8.402361 544.626
## 72759 -37.29652 -8.402361 544.379
## 72760 -37.29625 -8.402361 544.210
## 72761 -37.29597 -8.402361 544.450
## 72762 -37.29569 -8.402361 545.265
## 72763 -37.29541 -8.402361 545.991
## 72764 -37.29513 -8.402361 546.762
## 72765 -37.29486 -8.402361 547.023
## 72766 -37.29458 -8.402361 547.301
## 72767 -37.29430 -8.402361 547.337
## 72768 -37.29402 -8.402361 547.599
## 72769 -37.29375 -8.402361 547.882
## 72770 -37.29347 -8.402361 548.531
## 72771 -37.29319 -8.402361 549.456
## 72772 -37.29291 -8.402361 550.403
## 72773 -37.29263 -8.402361 550.998
## 72774 -37.29236 -8.402361 551.183
## 72775 -37.29208 -8.402361 551.089
## 72776 -37.29180 -8.402361 551.300
## 72777 -37.29152 -8.402361 551.220
## 72778 -37.29125 -8.402361 551.379
## 72779 -37.29097 -8.402361 551.357
## 72780 -37.29069 -8.402361 551.660
## 72781 -37.29041 -8.402361 551.992
## 72782 -37.29013 -8.402361 552.147
## 72783 -37.28986 -8.402361 552.063
## 72784 -37.28958 -8.402361 552.164
## 72785 -37.28930 -8.402361 552.274
## 72786 -37.28902 -8.402361 553.601
## 72787 -37.28875 -8.402361 555.229
## 72788 -37.28847 -8.402361 556.614
## 72789 -37.28819 -8.402361 557.317
## 72790 -37.28791 -8.402361 558.662
## 72791 -37.28763 -8.402361 559.536
## 72792 -37.28736 -8.402361 561.083
## 72793 -37.28708 -8.402361 562.430
## 72794 -37.28680 -8.402361 563.677
## 72795 -37.28652 -8.402361 564.584
## 72796 -37.28625 -8.402361 565.129
## 72797 -37.28597 -8.402361 565.460
## 72798 -37.28569 -8.402361 565.077
## 72799 -37.28541 -8.402361 564.714
## 72800 -37.28513 -8.402361 564.349
## 72801 -37.28486 -8.402361 564.248
## 72802 -37.28458 -8.402361 564.436
## 72803 -37.28430 -8.402361 564.729
## 72804 -37.28402 -8.402361 564.956
## 72805 -37.28375 -8.402361 565.213
## 72806 -37.28347 -8.402361 565.660
## 72807 -37.28319 -8.402361 566.818
## 72808 -37.28291 -8.402361 567.557
## 72809 -37.28263 -8.402361 568.240
## 72810 -37.28236 -8.402361 568.159
## 72811 -37.28208 -8.402361 567.997
## 72812 -37.28180 -8.402361 567.673
## 72813 -37.28152 -8.402361 567.586
## 72814 -37.28125 -8.402361 567.332
## 72815 -37.28097 -8.402361 566.513
## 72816 -37.28069 -8.402361 565.070
## 72817 -37.28041 -8.402361 563.540
## 72818 -37.28013 -8.402361 562.355
## 72819 -37.27986 -8.402361 562.117
## 72820 -37.27958 -8.402361 562.217
## 72821 -37.27930 -8.402361 562.716
## 72822 -37.27902 -8.402361 563.111
## 72823 -37.27875 -8.402361 563.777
## 72824 -37.27847 -8.402361 564.383
## 72825 -37.27819 -8.402361 564.686
## 72826 -37.27791 -8.402361 565.513
## 72827 -37.27763 -8.402361 565.905
## 72828 -37.27736 -8.402361 566.617
## 72829 -37.27708 -8.402361 567.006
## 72830 -37.27680 -8.402361 568.097
## 72831 -37.27652 -8.402361 568.777
## 72832 -37.27625 -8.402361 569.398
## 72833 -37.27597 -8.402361 570.025
## 72834 -37.27569 -8.402361 570.625
## 72835 -37.27541 -8.402361 571.068
## 72836 -37.27513 -8.402361 571.478
## 72837 -37.27486 -8.402361 571.943
## 72838 -37.27458 -8.402361 572.119
## 72839 -37.27430 -8.402361 571.909
## 72840 -37.27402 -8.402361 570.779
## 72841 -37.27375 -8.402361 569.431
## 72842 -37.27347 -8.402361 567.920
## 72843 -37.27319 -8.402361 566.711
## 72844 -37.27291 -8.402361 566.011
## 72845 -37.27263 -8.402361 565.724
## 72846 -37.27236 -8.402361 565.780
## 72847 -37.27208 -8.402361 565.801
## 72848 -37.27180 -8.402361 565.186
## 72849 -37.27152 -8.402361 563.673
## 72850 -37.27125 -8.402361 562.158
## 72851 -37.27097 -8.402361 560.648
## 72852 -37.27069 -8.402361 560.011
## 72853 -37.27041 -8.402361 559.574
## 72854 -37.27013 -8.402361 559.838
## 72855 -37.26986 -8.402361 560.089
## 72856 -37.26958 -8.402361 560.306
## 72857 -37.26930 -8.402361 560.374
## 72858 -37.26902 -8.402361 559.773
## 72859 -37.26875 -8.402361 559.162
## 72860 -37.26847 -8.402361 558.302
## 72861 -37.26819 -8.402361 557.659
## 72862 -37.26791 -8.402361 557.311
## 72863 -37.26763 -8.402361 557.899
## 72864 -37.26736 -8.402361 559.437
## 72865 -37.26708 -8.402361 561.273
## 72866 -37.26680 -8.402361 563.141
## 72867 -37.26652 -8.402361 564.493
## 72868 -37.26625 -8.402361 565.370
## 72869 -37.26597 -8.402361 565.740
## 72870 -37.26569 -8.402361 565.452
## 72871 -37.26541 -8.402361 564.640
## 72872 -37.26513 -8.402361 563.294
## 72873 -37.26486 -8.402361 561.225
## 72874 -37.26458 -8.402361 559.107
## 72875 -37.26430 -8.402361 557.447
## 72876 -37.26402 -8.402361 556.330
## 72877 -37.26375 -8.402361 555.957
## 72878 -37.26347 -8.402361 555.621
## 72879 -37.26319 -8.402361 555.515
## 72880 -37.26291 -8.402361 555.569
## 72881 -37.26263 -8.402361 555.828
## 72882 -37.26236 -8.402361 556.310
## 72883 -37.26208 -8.402361 556.449
## 72884 -37.26180 -8.402361 556.557
## 72885 -37.26152 -8.402361 555.544
## 72886 -37.26125 -8.402361 554.290
## 72887 -37.26097 -8.402361 553.122
## 72888 -37.26069 -8.402361 553.255
## 72889 -37.26041 -8.402361 553.800
## 72890 -37.26013 -8.402361 554.248
## 72891 -37.25986 -8.402361 553.722
## 72892 -37.25958 -8.402361 553.232
## 72893 -37.25930 -8.402361 553.248
## 72894 -37.25902 -8.402361 554.054
## 72895 -37.25875 -8.402361 554.850
## 72896 -37.25847 -8.402361 555.100
## 72897 -37.25819 -8.402361 554.865
## 72898 -37.25791 -8.402361 554.436
## 72899 -37.25763 -8.402361 554.142
## 72900 -37.25736 -8.402361 554.425
## 72901 -37.25708 -8.402361 554.706
## 72902 -37.25680 -8.402361 555.520
## 72903 -37.25652 -8.402361 556.353
## 72904 -37.25625 -8.402361 556.909
## 72905 -37.25597 -8.402361 557.233
## 72906 -37.25569 -8.402361 557.283
## 72907 -37.25541 -8.402361 557.353
## 72908 -37.25513 -8.402361 557.496
## 72909 -37.25486 -8.402361 558.232
## 72910 -37.25458 -8.402361 559.138
## 72911 -37.25430 -8.402361 560.204
## 72912 -37.25402 -8.402361 561.379
## 72913 -37.25375 -8.402361 562.372
## 72914 -37.25347 -8.402361 563.243
## 72915 -37.25319 -8.402361 563.834
## 72916 -37.25291 -8.402361 564.651
## 72917 -37.25263 -8.402361 565.319
## 72918 -37.25236 -8.402361 566.058
## 72919 -37.25208 -8.402361 566.802
## 72920 -37.25180 -8.402361 567.524
## 72921 -37.25152 -8.402361 567.798
## 72922 -37.25125 -8.402361 567.819
## 72923 -37.25097 -8.402361 567.309
## 72924 -37.25069 -8.402361 566.406
## 72925 -37.25041 -8.402361 565.406
## 72926 -37.25013 -8.402361 564.641
## 72927 -37.24986 -8.402361 564.749
## 72928 -37.24958 -8.402361 565.190
## 72929 -37.24930 -8.402361 566.145
## 72930 -37.24902 -8.402361 566.920
## 72931 -37.24875 -8.402361 567.738
## 72932 -37.24847 -8.402361 568.457
## 72933 -37.24819 -8.402361 569.074
## 72934 -37.24791 -8.402361 569.622
## 72935 -37.24763 -8.402361 570.064
## 72936 -37.24736 -8.402361 571.082
## 72937 -37.24708 -8.402361 572.190
## 72938 -37.24680 -8.402361 573.511
## 72939 -37.24652 -8.402361 574.746
## 72940 -37.24625 -8.402361 575.747
## 72941 -37.24597 -8.402361 576.845
## 72942 -37.24569 -8.402361 577.698
## 72943 -37.24541 -8.402361 578.332
## 72944 -37.24513 -8.402361 578.715
## 72945 -37.24486 -8.402361 578.925
## 72946 -37.24458 -8.402361 578.935
## 72947 -37.24430 -8.402361 578.806
## 72948 -37.24402 -8.402361 578.046
## 72949 -37.24375 -8.402361 577.036
## 72950 -37.24347 -8.402361 575.815
## 72951 -37.24319 -8.402361 574.596
## 72952 -37.24291 -8.402361 573.686
## 72953 -37.24263 -8.402361 573.396
## 72954 -37.24236 -8.402361 574.134
## 72955 -37.24208 -8.402361 575.354
## 72956 -37.24180 -8.402361 576.989
## 72957 -37.24152 -8.402361 577.949
## 72958 -37.24125 -8.402361 578.745
## 72959 -37.24097 -8.402361 578.879
## 72960 -37.24069 -8.402361 578.671
## 72961 -37.24041 -8.402361 578.324
## 72962 -37.24013 -8.402361 577.722
## 72963 -37.23986 -8.402361 577.380
## 72964 -37.23958 -8.402361 576.996
## 72965 -37.23930 -8.402361 577.080
## 72966 -37.23902 -8.402361 577.627
## 72967 -37.23875 -8.402361 578.136
## 72968 -37.23847 -8.402361 578.446
## 72969 -37.23819 -8.402361 577.849
## 72970 -37.23791 -8.402361 577.263
## 72971 -37.23763 -8.402361 577.175
## 72972 -37.23736 -8.402361 577.785
## 72973 -37.23708 -8.402361 578.526
## 72974 -37.23680 -8.402361 578.633
## 72975 -37.23652 -8.402361 577.836
## 72976 -37.23625 -8.402361 576.990
## 72977 -37.23597 -8.402361 576.027
## 72978 -37.23569 -8.402361 575.441
## 72979 -37.23541 -8.402361 574.673
## 72980 -37.23513 -8.402361 573.600
## 72981 -37.23486 -8.402361 572.043
## 72982 -37.23458 -8.402361 570.219
## 72983 -37.23430 -8.402361 568.705
## 72984 -37.23402 -8.402361 567.104
## 72985 -37.23375 -8.402361 565.944
## 72986 -37.23347 -8.402361 565.614
## 72987 -37.23319 -8.402361 565.591
## 72988 -37.23291 -8.402361 566.028
## 72989 -37.23263 -8.402361 566.032
## 73922 -37.34986 -8.402639 525.486
## 73923 -37.34958 -8.402639 525.139
## 73924 -37.34930 -8.402639 525.061
## 73925 -37.34902 -8.402639 525.406
## 73926 -37.34875 -8.402639 525.597
## 73927 -37.34847 -8.402639 525.707
## 73928 -37.34819 -8.402639 525.008
## 73929 -37.34791 -8.402639 524.783
## 73930 -37.34763 -8.402639 524.455
## 73931 -37.34736 -8.402639 524.351
## 73932 -37.34708 -8.402639 524.342
## 73933 -37.34680 -8.402639 525.071
## 73934 -37.34652 -8.402639 525.958
## 73993 -37.33013 -8.402639 531.414
## 73994 -37.32986 -8.402639 531.537
## 73995 -37.32958 -8.402639 531.898
## 73996 -37.32930 -8.402639 532.597
## 73997 -37.32902 -8.402639 532.859
## 73998 -37.32875 -8.402639 533.050
## 73999 -37.32847 -8.402639 533.218
## 74000 -37.32819 -8.402639 533.566
## 74001 -37.32791 -8.402639 534.017
## 74002 -37.32763 -8.402639 534.142
## 74003 -37.32736 -8.402639 533.975
## 74004 -37.32708 -8.402639 533.771
## 74005 -37.32680 -8.402639 533.683
## 74006 -37.32652 -8.402639 533.627
## 74007 -37.32625 -8.402639 533.701
## 74008 -37.32597 -8.402639 533.850
## 74009 -37.32569 -8.402639 534.310
## 74010 -37.32541 -8.402639 534.680
## 74011 -37.32513 -8.402639 535.161
## 74012 -37.32486 -8.402639 534.879
## 74013 -37.32458 -8.402639 534.733
## 74014 -37.32430 -8.402639 534.288
## 74015 -37.32402 -8.402639 533.989
## 74016 -37.32375 -8.402639 534.204
## 74017 -37.32347 -8.402639 534.489
## 74018 -37.32319 -8.402639 534.729
## 74019 -37.32291 -8.402639 534.765
## 74020 -37.32263 -8.402639 535.131
## 74021 -37.32236 -8.402639 534.916
## 74022 -37.32208 -8.402639 534.488
## 74023 -37.32180 -8.402639 533.599
## 74024 -37.32152 -8.402639 533.042
## 74025 -37.32125 -8.402639 532.723
## 74026 -37.32097 -8.402639 532.706
## 74027 -37.32069 -8.402639 532.989
## 74028 -37.32041 -8.402639 533.453
## 74029 -37.32013 -8.402639 534.367
## 74030 -37.31986 -8.402639 534.911
## 74031 -37.31958 -8.402639 535.391
## 74032 -37.31930 -8.402639 535.070
## 74033 -37.31902 -8.402639 534.893
## 74034 -37.31875 -8.402639 534.599
## 74035 -37.31847 -8.402639 534.462
## 74036 -37.31819 -8.402639 534.481
## 74037 -37.31791 -8.402639 534.709
## 74038 -37.31763 -8.402639 534.968
## 74039 -37.31736 -8.402639 535.673
## 74040 -37.31708 -8.402639 536.477
## 74041 -37.31680 -8.402639 537.610
## 74042 -37.31652 -8.402639 538.533
## 74043 -37.31625 -8.402639 539.441
## 74044 -37.31597 -8.402639 540.298
## 74045 -37.31569 -8.402639 540.613
## 74046 -37.31541 -8.402639 540.651
## 74047 -37.31513 -8.402639 540.304
## 74048 -37.31486 -8.402639 540.003
## 74049 -37.31458 -8.402639 539.699
## 74050 -37.31430 -8.402639 539.354
## 74051 -37.31402 -8.402639 539.056
## 74052 -37.31375 -8.402639 538.679
## 74053 -37.31347 -8.402639 538.211
## 74054 -37.31319 -8.402639 537.679
## 74055 -37.31291 -8.402639 537.255
## 74056 -37.31263 -8.402639 537.354
## 74057 -37.31236 -8.402639 537.877
## 74058 -37.31208 -8.402639 538.496
## 74059 -37.31180 -8.402639 538.639
## 74060 -37.31152 -8.402639 538.536
## 74061 -37.31125 -8.402639 538.461
## 74062 -37.31097 -8.402639 538.466
## 74063 -37.31069 -8.402639 538.967
## 74064 -37.31041 -8.402639 539.596
## 74065 -37.31013 -8.402639 539.745
## 74066 -37.30986 -8.402639 539.063
## 74067 -37.30958 -8.402639 538.103
## 74068 -37.30930 -8.402639 536.732
## 74069 -37.30902 -8.402639 535.928
## 74070 -37.30875 -8.402639 535.502
## 74071 -37.30847 -8.402639 535.274
## 74072 -37.30819 -8.402639 535.591
## 74073 -37.30791 -8.402639 535.915
## 74074 -37.30763 -8.402639 536.242
## 74075 -37.30736 -8.402639 535.977
## 74076 -37.30708 -8.402639 535.644
## 74077 -37.30680 -8.402639 536.234
## 74078 -37.30652 -8.402639 537.611
## 74079 -37.30625 -8.402639 539.204
## 74080 -37.30597 -8.402639 541.102
## 74081 -37.30569 -8.402639 542.833
## 74082 -37.30541 -8.402639 544.424
## 74083 -37.30513 -8.402639 545.058
## 74084 -37.30486 -8.402639 545.145
## 74085 -37.30458 -8.402639 544.683
## 74086 -37.30430 -8.402639 544.306
## 74087 -37.30402 -8.402639 544.421
## 74088 -37.30375 -8.402639 544.373
## 74089 -37.30347 -8.402639 544.243
## 74090 -37.30319 -8.402639 543.273
## 74091 -37.30291 -8.402639 542.500
## 74092 -37.30263 -8.402639 541.689
## 74093 -37.30236 -8.402639 542.472
## 74094 -37.30208 -8.402639 543.545
## 74095 -37.30180 -8.402639 544.741
## 74096 -37.30152 -8.402639 544.888
## 74097 -37.30125 -8.402639 544.628
## 74098 -37.30097 -8.402639 544.161
## 74099 -37.30069 -8.402639 543.613
## 74100 -37.30041 -8.402639 543.228
## 74101 -37.30013 -8.402639 542.675
## 74102 -37.29986 -8.402639 542.697
## 74103 -37.29958 -8.402639 542.858
## 74104 -37.29930 -8.402639 543.355
## 74105 -37.29902 -8.402639 543.817
## 74106 -37.29875 -8.402639 543.935
## 74107 -37.29847 -8.402639 544.264
## 74108 -37.29819 -8.402639 544.172
## 74109 -37.29791 -8.402639 544.167
## 74110 -37.29763 -8.402639 544.168
## 74111 -37.29736 -8.402639 544.559
## 74112 -37.29708 -8.402639 545.290
## 74113 -37.29680 -8.402639 545.375
## 74114 -37.29652 -8.402639 545.285
## 74115 -37.29625 -8.402639 545.538
## 74116 -37.29597 -8.402639 545.967
## 74117 -37.29569 -8.402639 546.258
## 74118 -37.29541 -8.402639 546.725
## 74119 -37.29513 -8.402639 546.700
## 74120 -37.29486 -8.402639 547.171
## 74121 -37.29458 -8.402639 547.700
## 74122 -37.29430 -8.402639 547.693
## 74123 -37.29402 -8.402639 547.499
## 74124 -37.29375 -8.402639 547.332
## 74125 -37.29347 -8.402639 547.613
## 74126 -37.29319 -8.402639 548.513
## 74127 -37.29291 -8.402639 549.331
## 74128 -37.29263 -8.402639 549.877
## 74129 -37.29236 -8.402639 549.764
## 74130 -37.29208 -8.402639 549.507
## 74131 -37.29180 -8.402639 549.516
## 74132 -37.29152 -8.402639 549.986
## 74133 -37.29125 -8.402639 550.367
## 74134 -37.29097 -8.402639 550.564
## 74135 -37.29069 -8.402639 550.734
## 74136 -37.29041 -8.402639 550.949
## 74137 -37.29013 -8.402639 551.012
## 74138 -37.28986 -8.402639 551.002
## 74139 -37.28958 -8.402639 550.938
## 74140 -37.28930 -8.402639 551.495
## 74141 -37.28902 -8.402639 552.337
## 74142 -37.28875 -8.402639 553.068
## 74143 -37.28847 -8.402639 554.131
## 74144 -37.28819 -8.402639 555.770
## 74145 -37.28791 -8.402639 557.376
## 74146 -37.28763 -8.402639 559.256
## 74147 -37.28736 -8.402639 560.613
## 74148 -37.28708 -8.402639 561.764
## 74149 -37.28680 -8.402639 562.944
## 74150 -37.28652 -8.402639 563.864
## 74151 -37.28625 -8.402639 564.411
## 74152 -37.28597 -8.402639 564.592
## 74153 -37.28569 -8.402639 564.321
## 74154 -37.28541 -8.402639 563.908
## 74155 -37.28513 -8.402639 563.582
## 74156 -37.28486 -8.402639 563.360
## 74157 -37.28458 -8.402639 563.476
## 74158 -37.28430 -8.402639 563.540
## 74159 -37.28402 -8.402639 564.335
## 74160 -37.28375 -8.402639 565.439
## 74161 -37.28347 -8.402639 566.376
## 74162 -37.28319 -8.402639 567.013
## 74163 -37.28291 -8.402639 567.456
## 74164 -37.28263 -8.402639 567.964
## 74165 -37.28236 -8.402639 568.138
## 74166 -37.28208 -8.402639 568.082
## 74167 -37.28180 -8.402639 568.088
## 74168 -37.28152 -8.402639 568.054
## 74169 -37.28125 -8.402639 567.780
## 74170 -37.28097 -8.402639 567.042
## 74171 -37.28069 -8.402639 565.765
## 74172 -37.28041 -8.402639 564.450
## 74173 -37.28013 -8.402639 563.306
## 74174 -37.27986 -8.402639 562.966
## 74175 -37.27958 -8.402639 562.914
## 74176 -37.27930 -8.402639 563.360
## 74177 -37.27902 -8.402639 563.279
## 74178 -37.27875 -8.402639 563.152
## 74179 -37.27847 -8.402639 563.412
## 74180 -37.27819 -8.402639 564.494
## 74181 -37.27791 -8.402639 565.490
## 74182 -37.27763 -8.402639 566.395
## 74183 -37.27736 -8.402639 566.444
## 74184 -37.27708 -8.402639 566.502
## 74185 -37.27680 -8.402639 566.992
## 74186 -37.27652 -8.402639 567.842
## 74187 -37.27625 -8.402639 568.702
## 74188 -37.27597 -8.402639 569.412
## 74189 -37.27569 -8.402639 570.129
## 74190 -37.27541 -8.402639 570.806
## 74191 -37.27513 -8.402639 571.347
## 74192 -37.27486 -8.402639 571.599
## 74193 -37.27458 -8.402639 571.655
## 74194 -37.27430 -8.402639 571.221
## 74195 -37.27402 -8.402639 570.411
## 74196 -37.27375 -8.402639 569.391
## 74197 -37.27347 -8.402639 568.122
## 74198 -37.27319 -8.402639 567.155
## 74199 -37.27291 -8.402639 566.465
## 74200 -37.27263 -8.402639 566.126
## 74201 -37.27236 -8.402639 565.734
## 74202 -37.27208 -8.402639 565.292
## 74203 -37.27180 -8.402639 563.999
## 74204 -37.27152 -8.402639 562.721
## 74205 -37.27125 -8.402639 561.284
## 74206 -37.27097 -8.402639 560.016
## 74207 -37.27069 -8.402639 559.584
## 74208 -37.27041 -8.402639 559.638
## 74209 -37.27013 -8.402639 560.097
## 74210 -37.26986 -8.402639 560.627
## 74211 -37.26958 -8.402639 561.132
## 74212 -37.26930 -8.402639 561.235
## 74213 -37.26902 -8.402639 560.718
## 74214 -37.26875 -8.402639 560.080
## 74215 -37.26847 -8.402639 559.197
## 74216 -37.26819 -8.402639 558.367
## 74217 -37.26791 -8.402639 557.951
## 74218 -37.26763 -8.402639 558.316
## 74219 -37.26736 -8.402639 559.741
## 74220 -37.26708 -8.402639 561.528
## 74221 -37.26680 -8.402639 563.493
## 74222 -37.26652 -8.402639 564.768
## 74223 -37.26625 -8.402639 565.575
## 74224 -37.26597 -8.402639 565.883
## 74225 -37.26569 -8.402639 565.816
## 74226 -37.26541 -8.402639 565.129
## 74227 -37.26513 -8.402639 563.836
## 74228 -37.26486 -8.402639 561.590
## 74229 -37.26458 -8.402639 559.373
## 74230 -37.26430 -8.402639 557.572
## 74231 -37.26402 -8.402639 556.531
## 74232 -37.26375 -8.402639 556.229
## 74233 -37.26347 -8.402639 555.873
## 74234 -37.26319 -8.402639 555.981
## 74235 -37.26291 -8.402639 556.192
## 74236 -37.26263 -8.402639 556.898
## 74237 -37.26236 -8.402639 557.090
## 74238 -37.26208 -8.402639 556.989
## 74239 -37.26180 -8.402639 556.574
## 74240 -37.26152 -8.402639 556.069
## 74241 -37.26125 -8.402639 555.278
## 74242 -37.26097 -8.402639 554.291
## 74243 -37.26069 -8.402639 554.142
## 74244 -37.26041 -8.402639 554.393
## 74245 -37.26013 -8.402639 554.404
## 74246 -37.25986 -8.402639 553.767
## 74247 -37.25958 -8.402639 553.094
## 74248 -37.25930 -8.402639 552.949
## 74249 -37.25902 -8.402639 553.745
## 74250 -37.25875 -8.402639 554.549
## 74251 -37.25847 -8.402639 554.890
## 74252 -37.25819 -8.402639 554.692
## 74253 -37.25791 -8.402639 554.347
## 74254 -37.25763 -8.402639 554.273
## 74255 -37.25736 -8.402639 554.714
## 74256 -37.25708 -8.402639 555.219
## 74257 -37.25680 -8.402639 556.262
## 74258 -37.25652 -8.402639 557.105
## 74259 -37.25625 -8.402639 557.674
## 74260 -37.25597 -8.402639 557.990
## 74261 -37.25569 -8.402639 558.019
## 74262 -37.25541 -8.402639 558.208
## 74263 -37.25513 -8.402639 558.348
## 74264 -37.25486 -8.402639 559.050
## 74265 -37.25458 -8.402639 560.039
## 74266 -37.25430 -8.402639 561.115
## 74267 -37.25402 -8.402639 562.313
## 74268 -37.25375 -8.402639 563.226
## 74269 -37.25347 -8.402639 564.100
## 74270 -37.25319 -8.402639 565.063
## 74271 -37.25291 -8.402639 565.967
## 74272 -37.25263 -8.402639 566.887
## 74273 -37.25236 -8.402639 567.382
## 74274 -37.25208 -8.402639 567.741
## 74275 -37.25180 -8.402639 568.309
## 74276 -37.25152 -8.402639 568.682
## 74277 -37.25125 -8.402639 568.725
## 74278 -37.25097 -8.402639 568.204
## 74279 -37.25069 -8.402639 567.138
## 74280 -37.25041 -8.402639 566.128
## 74281 -37.25013 -8.402639 565.303
## 74282 -37.24986 -8.402639 565.266
## 74283 -37.24958 -8.402639 565.655
## 74284 -37.24930 -8.402639 566.574
## 74285 -37.24902 -8.402639 567.525
## 74286 -37.24875 -8.402639 568.512
## 74287 -37.24847 -8.402639 569.227
## 74288 -37.24819 -8.402639 569.614
## 74289 -37.24791 -8.402639 569.963
## 74290 -37.24763 -8.402639 570.262
## 74291 -37.24736 -8.402639 571.179
## 74292 -37.24708 -8.402639 572.174
## 74293 -37.24680 -8.402639 573.519
## 74294 -37.24652 -8.402639 574.745
## 74295 -37.24625 -8.402639 575.887
## 74296 -37.24597 -8.402639 576.959
## 74297 -37.24569 -8.402639 577.905
## 74298 -37.24541 -8.402639 578.677
## 74299 -37.24513 -8.402639 579.107
## 74300 -37.24486 -8.402639 579.267
## 74301 -37.24458 -8.402639 579.274
## 74302 -37.24430 -8.402639 578.973
## 74303 -37.24402 -8.402639 578.630
## 74304 -37.24375 -8.402639 578.121
## 74305 -37.24347 -8.402639 577.193
## 74306 -37.24319 -8.402639 576.009
## 74307 -37.24291 -8.402639 575.129
## 74308 -37.24263 -8.402639 574.794
## 74309 -37.24236 -8.402639 575.318
## 74310 -37.24208 -8.402639 576.188
## 74311 -37.24180 -8.402639 577.496
## 74312 -37.24152 -8.402639 578.305
## 74313 -37.24125 -8.402639 578.738
## 74314 -37.24097 -8.402639 578.790
## 74315 -37.24069 -8.402639 578.806
## 74316 -37.24041 -8.402639 578.819
## 74317 -37.24013 -8.402639 578.444
## 74318 -37.23986 -8.402639 578.356
## 74319 -37.23958 -8.402639 578.319
## 74320 -37.23930 -8.402639 578.724
## 74321 -37.23902 -8.402639 579.042
## 74322 -37.23875 -8.402639 579.225
## 74323 -37.23847 -8.402639 579.316
## 74324 -37.23819 -8.402639 578.971
## 74325 -37.23791 -8.402639 578.648
## 74326 -37.23763 -8.402639 578.515
## 74327 -37.23736 -8.402639 578.788
## 74328 -37.23708 -8.402639 579.217
## 74329 -37.23680 -8.402639 578.832
## 74330 -37.23652 -8.402639 578.277
## 74331 -37.23625 -8.402639 577.400
## 74332 -37.23597 -8.402639 576.430
## 74333 -37.23569 -8.402639 575.661
## 74334 -37.23541 -8.402639 574.677
## 74335 -37.23513 -8.402639 573.581
## 74336 -37.23486 -8.402639 571.820
## 74337 -37.23458 -8.402639 569.838
## 74338 -37.23430 -8.402639 568.134
## 74339 -37.23402 -8.402639 566.931
## 74340 -37.23375 -8.402639 566.269
## 74341 -37.23347 -8.402639 566.248
## 74342 -37.23319 -8.402639 566.611
## 74343 -37.23291 -8.402639 567.278
## 74344 -37.23263 -8.402639 567.422
## 74345 -37.23236 -8.402639 567.142
## 74346 -37.23208 -8.402639 566.797
## 75273 -37.35097 -8.402917 524.115
## 75274 -37.35069 -8.402917 524.074
## 75275 -37.35041 -8.402917 524.121
## 75276 -37.35013 -8.402917 523.997
## 75277 -37.34986 -8.402917 523.724
## 75278 -37.34958 -8.402917 523.375
## 75279 -37.34930 -8.402917 523.549
## 75280 -37.34902 -8.402917 523.720
## 75281 -37.34875 -8.402917 524.307
## 75282 -37.34847 -8.402917 524.793
## 75283 -37.34819 -8.402917 525.208
## 75284 -37.34791 -8.402917 525.382
## 75285 -37.34763 -8.402917 525.235
## 75286 -37.34736 -8.402917 525.228
## 75287 -37.34708 -8.402917 525.095
## 75288 -37.34680 -8.402917 524.948
## 75289 -37.34652 -8.402917 525.641
## 75290 -37.34625 -8.402917 526.291
## 75291 -37.34597 -8.402917 526.973
## 75292 -37.34569 -8.402917 527.699
## 75293 -37.34541 -8.402917 528.224
## 75342 -37.33180 -8.402917 532.206
## 75343 -37.33152 -8.402917 532.238
## 75344 -37.33125 -8.402917 532.058
## 75345 -37.33097 -8.402917 531.606
## 75346 -37.33069 -8.402917 530.989
## 75347 -37.33041 -8.402917 530.347
## 75348 -37.33013 -8.402917 529.896
## 75349 -37.32986 -8.402917 529.904
## 75350 -37.32958 -8.402917 530.155
## 75351 -37.32930 -8.402917 530.661
## 75352 -37.32902 -8.402917 531.013
## 75353 -37.32875 -8.402917 531.528
## 75354 -37.32847 -8.402917 532.309
## 75355 -37.32819 -8.402917 532.770
## 75356 -37.32791 -8.402917 533.379
## 75357 -37.32763 -8.402917 533.857
## 75358 -37.32736 -8.402917 533.912
## 75359 -37.32708 -8.402917 533.860
## 75360 -37.32680 -8.402917 533.672
## 75361 -37.32652 -8.402917 533.521
## 75362 -37.32625 -8.402917 533.422
## 75363 -37.32597 -8.402917 533.323
## 75364 -37.32569 -8.402917 534.060
## 75365 -37.32541 -8.402917 534.675
## 75366 -37.32513 -8.402917 535.222
## 75367 -37.32486 -8.402917 535.112
## 75368 -37.32458 -8.402917 534.975
## 75369 -37.32430 -8.402917 534.946
## 75370 -37.32402 -8.402917 535.012
## 75371 -37.32375 -8.402917 535.262
## 75372 -37.32347 -8.402917 535.387
## 75373 -37.32319 -8.402917 535.655
## 75374 -37.32291 -8.402917 535.674
## 75375 -37.32263 -8.402917 535.551
## 75376 -37.32236 -8.402917 535.247
## 75377 -37.32208 -8.402917 534.867
## 75378 -37.32180 -8.402917 534.705
## 75379 -37.32152 -8.402917 534.148
## 75380 -37.32125 -8.402917 533.983
## 75381 -37.32097 -8.402917 533.925
## 75382 -37.32069 -8.402917 534.454
## 75383 -37.32041 -8.402917 535.001
## 75384 -37.32013 -8.402917 535.581
## 75385 -37.31986 -8.402917 535.849
## 75386 -37.31958 -8.402917 536.008
## 75387 -37.31930 -8.402917 535.976
## 75388 -37.31902 -8.402917 535.781
## 75389 -37.31875 -8.402917 535.521
## 75390 -37.31847 -8.402917 535.187
## 75391 -37.31819 -8.402917 535.233
## 75392 -37.31791 -8.402917 535.376
## 75393 -37.31763 -8.402917 535.769
## 75394 -37.31736 -8.402917 536.617
## 75395 -37.31708 -8.402917 537.638
## 75396 -37.31680 -8.402917 538.725
## 75397 -37.31652 -8.402917 539.827
## 75398 -37.31625 -8.402917 540.738
## 75399 -37.31597 -8.402917 541.402
## 75400 -37.31569 -8.402917 541.626
## 75401 -37.31541 -8.402917 541.609
## 75402 -37.31513 -8.402917 541.524
## 75403 -37.31486 -8.402917 541.286
## 75404 -37.31458 -8.402917 541.065
## 75405 -37.31430 -8.402917 540.751
## 75406 -37.31402 -8.402917 540.373
## 75407 -37.31375 -8.402917 539.881
## 75408 -37.31347 -8.402917 539.203
## 75409 -37.31319 -8.402917 538.571
## 75410 -37.31291 -8.402917 537.979
## 75411 -37.31263 -8.402917 537.719
## 75412 -37.31236 -8.402917 538.041
## 75413 -37.31208 -8.402917 538.512
## 75414 -37.31180 -8.402917 538.911
## 75415 -37.31152 -8.402917 538.717
## 75416 -37.31125 -8.402917 538.547
## 75417 -37.31097 -8.402917 538.419
## 75418 -37.31069 -8.402917 538.980
## 75419 -37.31041 -8.402917 539.421
## 75420 -37.31013 -8.402917 539.565
## 75421 -37.30986 -8.402917 538.833
## 75422 -37.30958 -8.402917 537.908
## 75423 -37.30930 -8.402917 537.154
## 75424 -37.30902 -8.402917 536.654
## 75425 -37.30875 -8.402917 536.503
## 75426 -37.30847 -8.402917 536.564
## 75427 -37.30819 -8.402917 536.797
## 75428 -37.30791 -8.402917 536.982
## 75429 -37.30763 -8.402917 536.943
## 75430 -37.30736 -8.402917 536.439
## 75431 -37.30708 -8.402917 536.057
## 75432 -37.30680 -8.402917 536.211
## 75433 -37.30652 -8.402917 537.457
## 75434 -37.30625 -8.402917 539.184
## 75435 -37.30597 -8.402917 541.420
## 75436 -37.30569 -8.402917 543.029
## 75437 -37.30541 -8.402917 544.612
## 75438 -37.30513 -8.402917 545.669
## 75439 -37.30486 -8.402917 545.931
## 75440 -37.30458 -8.402917 545.751
## 75441 -37.30430 -8.402917 545.381
## 75442 -37.30402 -8.402917 545.228
## 75443 -37.30375 -8.402917 545.008
## 75444 -37.30347 -8.402917 544.481
## 75445 -37.30319 -8.402917 543.288
## 75446 -37.30291 -8.402917 542.210
## 75447 -37.30263 -8.402917 541.920
## 75448 -37.30236 -8.402917 542.799
## 75449 -37.30208 -8.402917 544.201
## 75450 -37.30180 -8.402917 545.429
## 75451 -37.30152 -8.402917 545.881
## 75452 -37.30125 -8.402917 545.893
## 75453 -37.30097 -8.402917 545.731
## 75454 -37.30069 -8.402917 545.176
## 75455 -37.30041 -8.402917 544.743
## 75456 -37.30013 -8.402917 544.402
## 75457 -37.29986 -8.402917 544.288
## 75458 -37.29958 -8.402917 544.289
## 75459 -37.29930 -8.402917 544.120
## 75460 -37.29902 -8.402917 544.407
## 75461 -37.29875 -8.402917 544.460
## 75462 -37.29847 -8.402917 544.472
## 75463 -37.29819 -8.402917 544.560
## 75464 -37.29791 -8.402917 544.668
## 75465 -37.29763 -8.402917 544.900
## 75466 -37.29736 -8.402917 545.348
## 75467 -37.29708 -8.402917 545.865
## 75468 -37.29680 -8.402917 546.362
## 75469 -37.29652 -8.402917 546.791
## 75470 -37.29625 -8.402917 547.129
## 75471 -37.29597 -8.402917 547.418
## 75472 -37.29569 -8.402917 547.524
## 75473 -37.29541 -8.402917 547.651
## 75474 -37.29513 -8.402917 547.992
## 75475 -37.29486 -8.402917 548.301
## 75476 -37.29458 -8.402917 548.666
## 75477 -37.29430 -8.402917 548.635
## 75478 -37.29402 -8.402917 548.329
## 75479 -37.29375 -8.402917 547.893
## 75480 -37.29347 -8.402917 547.525
## 75481 -37.29319 -8.402917 548.159
## 75482 -37.29291 -8.402917 548.737
## 75483 -37.29263 -8.402917 549.106
## 75484 -37.29236 -8.402917 548.864
## 75485 -37.29208 -8.402917 548.518
## 75486 -37.29180 -8.402917 548.410
## 75487 -37.29152 -8.402917 548.882
## 75488 -37.29125 -8.402917 549.521
## 75489 -37.29097 -8.402917 550.332
## 75490 -37.29069 -8.402917 550.453
## 75491 -37.29041 -8.402917 550.608
## 75492 -37.29013 -8.402917 550.646
## 75493 -37.28986 -8.402917 550.637
## 75494 -37.28958 -8.402917 550.659
## 75495 -37.28930 -8.402917 550.794
## 75496 -37.28902 -8.402917 551.085
## 75497 -37.28875 -8.402917 551.691
## 75498 -37.28847 -8.402917 552.724
## 75499 -37.28819 -8.402917 554.561
## 75500 -37.28791 -8.402917 556.584
## 75501 -37.28763 -8.402917 558.450
## 75502 -37.28736 -8.402917 559.876
## 75503 -37.28708 -8.402917 560.933
## 75504 -37.28680 -8.402917 561.625
## 75505 -37.28652 -8.402917 562.335
## 75506 -37.28625 -8.402917 562.675
## 75507 -37.28597 -8.402917 562.676
## 75508 -37.28569 -8.402917 562.501
## 75509 -37.28541 -8.402917 562.169
## 75510 -37.28513 -8.402917 561.896
## 75511 -37.28486 -8.402917 561.777
## 75512 -37.28458 -8.402917 561.973
## 75513 -37.28430 -8.402917 562.745
## 75514 -37.28402 -8.402917 563.937
## 75515 -37.28375 -8.402917 565.350
## 75516 -37.28347 -8.402917 566.684
## 75517 -37.28319 -8.402917 567.240
## 75518 -37.28291 -8.402917 567.576
## 75519 -37.28263 -8.402917 567.724
## 75520 -37.28236 -8.402917 567.832
## 75521 -37.28208 -8.402917 567.896
## 75522 -37.28180 -8.402917 568.022
## 75523 -37.28152 -8.402917 568.116
## 75524 -37.28125 -8.402917 568.059
## 75525 -37.28097 -8.402917 567.662
## 75526 -37.28069 -8.402917 566.596
## 75527 -37.28041 -8.402917 565.392
## 75528 -37.28013 -8.402917 564.352
## 75529 -37.27986 -8.402917 563.860
## 75530 -37.27958 -8.402917 563.616
## 75531 -37.27930 -8.402917 563.370
## 75532 -37.27902 -8.402917 563.028
## 75533 -37.27875 -8.402917 562.886
## 75534 -37.27847 -8.402917 563.274
## 75535 -37.27819 -8.402917 564.390
## 75536 -37.27791 -8.402917 565.680
## 75537 -37.27763 -8.402917 566.553
## 75538 -37.27736 -8.402917 566.445
## 75539 -37.27708 -8.402917 566.126
## 75540 -37.27680 -8.402917 565.831
## 75541 -37.27652 -8.402917 566.730
## 75542 -37.27625 -8.402917 567.641
## 75543 -37.27597 -8.402917 568.695
## 75544 -37.27569 -8.402917 569.378
## 75545 -37.27541 -8.402917 569.980
## 75546 -37.27513 -8.402917 570.394
## 75547 -37.27486 -8.402917 570.593
## 75548 -37.27458 -8.402917 570.553
## 75549 -37.27430 -8.402917 570.301
## 75550 -37.27402 -8.402917 569.659
## 75551 -37.27375 -8.402917 568.919
## 75552 -37.27347 -8.402917 568.103
## 75553 -37.27319 -8.402917 567.385
## 75554 -37.27291 -8.402917 566.687
## 75555 -37.27263 -8.402917 566.009
## 75556 -37.27236 -8.402917 565.294
## 75557 -37.27208 -8.402917 564.469
## 75558 -37.27180 -8.402917 563.429
## 75559 -37.27152 -8.402917 562.082
## 75560 -37.27125 -8.402917 560.816
## 75561 -37.27097 -8.402917 559.725
## 75562 -37.27069 -8.402917 559.617
## 75563 -37.27041 -8.402917 559.772
## 75564 -37.27013 -8.402917 560.211
## 75565 -37.26986 -8.402917 560.769
## 75566 -37.26958 -8.402917 561.249
## 75567 -37.26930 -8.402917 561.409
## 75568 -37.26902 -8.402917 561.240
## 75569 -37.26875 -8.402917 560.682
## 75570 -37.26847 -8.402917 559.983
## 75571 -37.26819 -8.402917 559.037
## 75572 -37.26791 -8.402917 558.478
## 75573 -37.26763 -8.402917 558.536
## 75574 -37.26736 -8.402917 559.784
## 75575 -37.26708 -8.402917 561.439
## 75576 -37.26680 -8.402917 563.013
## 75577 -37.26652 -8.402917 564.368
## 75578 -37.26625 -8.402917 565.210
## 75579 -37.26597 -8.402917 565.587
## 75580 -37.26569 -8.402917 565.475
## 75581 -37.26541 -8.402917 564.781
## 75582 -37.26513 -8.402917 563.434
## 75583 -37.26486 -8.402917 561.384
## 75584 -37.26458 -8.402917 559.260
## 75585 -37.26430 -8.402917 557.701
## 75586 -37.26402 -8.402917 556.715
## 75587 -37.26375 -8.402917 556.427
## 75588 -37.26347 -8.402917 556.620
## 75589 -37.26319 -8.402917 556.876
## 75590 -37.26291 -8.402917 557.283
## 75591 -37.26263 -8.402917 557.600
## 75592 -37.26236 -8.402917 557.613
## 75593 -37.26208 -8.402917 557.396
## 75594 -37.26180 -8.402917 557.022
## 75595 -37.26152 -8.402917 556.393
## 75596 -37.26125 -8.402917 555.813
## 75597 -37.26097 -8.402917 555.645
## 75598 -37.26069 -8.402917 555.385
## 75599 -37.26041 -8.402917 555.420
## 75600 -37.26013 -8.402917 555.135
## 75601 -37.25986 -8.402917 554.449
## 75602 -37.25958 -8.402917 553.674
## 75603 -37.25930 -8.402917 553.347
## 75604 -37.25902 -8.402917 553.848
## 75605 -37.25875 -8.402917 554.535
## 75606 -37.25847 -8.402917 555.010
## 75607 -37.25819 -8.402917 554.908
## 75608 -37.25791 -8.402917 554.622
## 75609 -37.25763 -8.402917 554.505
## 75610 -37.25736 -8.402917 554.869
## 75611 -37.25708 -8.402917 555.466
## 75612 -37.25680 -8.402917 556.129
## 75613 -37.25652 -8.402917 556.903
## 75614 -37.25625 -8.402917 557.547
## 75615 -37.25597 -8.402917 558.221
## 75616 -37.25569 -8.402917 558.309
## 75617 -37.25541 -8.402917 558.565
## 75618 -37.25513 -8.402917 558.985
## 75619 -37.25486 -8.402917 559.780
## 75620 -37.25458 -8.402917 560.772
## 75621 -37.25430 -8.402917 561.865
## 75622 -37.25402 -8.402917 562.941
## 75623 -37.25375 -8.402917 563.993
## 75624 -37.25347 -8.402917 565.123
## 75625 -37.25319 -8.402917 566.125
## 75626 -37.25291 -8.402917 567.106
## 75627 -37.25263 -8.402917 567.860
## 75628 -37.25236 -8.402917 568.308
## 75629 -37.25208 -8.402917 568.590
## 75630 -37.25180 -8.402917 568.888
## 75631 -37.25152 -8.402917 569.226
## 75632 -37.25125 -8.402917 569.359
## 75633 -37.25097 -8.402917 569.235
## 75634 -37.25069 -8.402917 568.170
## 75635 -37.25041 -8.402917 567.143
## 75636 -37.25013 -8.402917 566.378
## 75637 -37.24986 -8.402917 566.260
## 75638 -37.24958 -8.402917 566.594
## 75639 -37.24930 -8.402917 567.241
## 75640 -37.24902 -8.402917 568.298
## 75641 -37.24875 -8.402917 569.306
## 75642 -37.24847 -8.402917 570.208
## 75643 -37.24819 -8.402917 570.476
## 75644 -37.24791 -8.402917 570.717
## 75645 -37.24763 -8.402917 571.085
## 75646 -37.24736 -8.402917 571.838
## 75647 -37.24708 -8.402917 572.769
## 75648 -37.24680 -8.402917 573.584
## 75649 -37.24652 -8.402917 574.740
## 75650 -37.24625 -8.402917 575.711
## 75651 -37.24597 -8.402917 576.607
## 75652 -37.24569 -8.402917 577.674
## 75653 -37.24541 -8.402917 578.505
## 75654 -37.24513 -8.402917 579.049
## 75655 -37.24486 -8.402917 579.181
## 75656 -37.24458 -8.402917 579.096
## 75657 -37.24430 -8.402917 579.045
## 75658 -37.24402 -8.402917 578.983
## 75659 -37.24375 -8.402917 578.854
## 75660 -37.24347 -8.402917 578.580
## 75661 -37.24319 -8.402917 577.581
## 75662 -37.24291 -8.402917 576.755
## 75663 -37.24263 -8.402917 576.329
## 75664 -37.24236 -8.402917 576.631
## 75665 -37.24208 -8.402917 577.268
## 75666 -37.24180 -8.402917 577.957
## 75667 -37.24152 -8.402917 578.457
## 75668 -37.24125 -8.402917 578.857
## 75669 -37.24097 -8.402917 579.307
## 75670 -37.24069 -8.402917 579.524
## 75671 -37.24041 -8.402917 579.797
## 75672 -37.24013 -8.402917 579.994
## 75673 -37.23986 -8.402917 580.161
## 75674 -37.23958 -8.402917 580.284
## 75675 -37.23930 -8.402917 580.339
## 75676 -37.23902 -8.402917 580.510
## 75677 -37.23875 -8.402917 580.547
## 75678 -37.23847 -8.402917 580.353
## 75679 -37.23819 -8.402917 580.096
## 75680 -37.23791 -8.402917 579.728
## 75681 -37.23763 -8.402917 579.501
## 75682 -37.23736 -8.402917 579.559
## 75683 -37.23708 -8.402917 579.609
## 75684 -37.23680 -8.402917 579.534
## 75685 -37.23652 -8.402917 578.812
## 75686 -37.23625 -8.402917 577.972
## 75687 -37.23597 -8.402917 576.951
## 75688 -37.23569 -8.402917 576.137
## 75689 -37.23541 -8.402917 575.088
## 75690 -37.23513 -8.402917 573.716
## 75691 -37.23486 -8.402917 571.815
## 75692 -37.23458 -8.402917 569.882
## 75693 -37.23430 -8.402917 568.290
## 75694 -37.23402 -8.402917 567.238
## 75695 -37.23375 -8.402917 566.832
## 75696 -37.23347 -8.402917 567.060
## 75697 -37.23319 -8.402917 567.568
## 75698 -37.23291 -8.402917 568.308
## 75699 -37.23263 -8.402917 568.907
## 75700 -37.23236 -8.402917 568.634
## 75701 -37.23208 -8.402917 568.163
## 75702 -37.23180 -8.402917 567.377
## 75703 -37.23152 -8.402917 567.067
## 75704 -37.23125 -8.402917 566.518
## 75705 -37.23097 -8.402917 565.784
## 76623 -37.35236 -8.403194 524.654
## 76624 -37.35208 -8.403194 524.409
## 76625 -37.35180 -8.403194 524.264
## 76626 -37.35152 -8.403194 523.947
## 76627 -37.35125 -8.403194 523.653
## 76628 -37.35097 -8.403194 523.266
## 76629 -37.35069 -8.403194 523.231
## 76630 -37.35041 -8.403194 523.231
## 76631 -37.35013 -8.403194 523.061
## 76632 -37.34986 -8.403194 522.574
## 76633 -37.34958 -8.403194 522.369
## 76634 -37.34930 -8.403194 522.137
## 76635 -37.34902 -8.403194 522.840
## 76636 -37.34875 -8.403194 523.572
## 76637 -37.34847 -8.403194 524.912
## 76638 -37.34819 -8.403194 525.993
## 76639 -37.34791 -8.403194 526.515
## 76640 -37.34763 -8.403194 526.766
## 76641 -37.34736 -8.403194 526.541
## 76642 -37.34708 -8.403194 526.274
## 76643 -37.34680 -8.403194 525.682
## 76644 -37.34652 -8.403194 525.530
## 76645 -37.34625 -8.403194 525.853
## 76646 -37.34597 -8.403194 526.322
## 76647 -37.34569 -8.403194 526.941
## 76648 -37.34541 -8.403194 527.185
## 76649 -37.34513 -8.403194 527.116
## 76650 -37.34486 -8.403194 526.743
## 76651 -37.34458 -8.403194 526.390
## 76692 -37.33319 -8.403194 529.731
## 76693 -37.33291 -8.403194 529.148
## 76694 -37.33263 -8.403194 528.894
## 76695 -37.33236 -8.403194 529.259
## 76696 -37.33208 -8.403194 529.739
## 76697 -37.33180 -8.403194 530.259
## 76698 -37.33152 -8.403194 530.706
## 76699 -37.33125 -8.403194 530.661
## 76700 -37.33097 -8.403194 530.352
## 76701 -37.33069 -8.403194 529.900
## 76702 -37.33041 -8.403194 529.421
## 76703 -37.33013 -8.403194 528.948
## 76704 -37.32986 -8.403194 528.921
## 76705 -37.32958 -8.403194 529.061
## 76706 -37.32930 -8.403194 529.218
## 76707 -37.32902 -8.403194 529.763
## 76708 -37.32875 -8.403194 530.437
## 76709 -37.32847 -8.403194 531.448
## 76710 -37.32819 -8.403194 532.373
## 76711 -37.32791 -8.403194 533.055
## 76712 -37.32763 -8.403194 533.713
## 76713 -37.32736 -8.403194 534.075
## 76714 -37.32708 -8.403194 534.155
## 76715 -37.32680 -8.403194 533.931
## 76716 -37.32652 -8.403194 533.707
## 76717 -37.32625 -8.403194 533.610
## 76718 -37.32597 -8.403194 533.561
## 76719 -37.32569 -8.403194 534.102
## 76720 -37.32541 -8.403194 534.720
## 76721 -37.32513 -8.403194 535.204
## 76722 -37.32486 -8.403194 535.229
## 76723 -37.32458 -8.403194 535.332
## 76724 -37.32430 -8.403194 535.638
## 76725 -37.32402 -8.403194 536.202
## 76726 -37.32375 -8.403194 536.572
## 76727 -37.32347 -8.403194 536.859
## 76728 -37.32319 -8.403194 536.962
## 76729 -37.32291 -8.403194 536.917
## 76730 -37.32263 -8.403194 536.393
## 76731 -37.32236 -8.403194 535.922
## 76732 -37.32208 -8.403194 535.590
## 76733 -37.32180 -8.403194 535.620
## 76734 -37.32152 -8.403194 535.610
## 76735 -37.32125 -8.403194 535.508
## 76736 -37.32097 -8.403194 535.697
## 76737 -37.32069 -8.403194 536.106
## 76738 -37.32041 -8.403194 536.580
## 76739 -37.32013 -8.403194 536.695
## 76740 -37.31986 -8.403194 536.682
## 76741 -37.31958 -8.403194 536.675
## 76742 -37.31930 -8.403194 536.829
## 76743 -37.31902 -8.403194 536.704
## 76744 -37.31875 -8.403194 536.495
## 76745 -37.31847 -8.403194 536.248
## 76746 -37.31819 -8.403194 536.141
## 76747 -37.31791 -8.403194 536.368
## 76748 -37.31763 -8.403194 536.851
## 76749 -37.31736 -8.403194 537.698
## 76750 -37.31708 -8.403194 538.760
## 76751 -37.31680 -8.403194 539.919
## 76752 -37.31652 -8.403194 541.118
## 76753 -37.31625 -8.403194 542.041
## 76754 -37.31597 -8.403194 542.458
## 76755 -37.31569 -8.403194 542.618
## 76756 -37.31541 -8.403194 542.555
## 76757 -37.31513 -8.403194 542.552
## 76758 -37.31486 -8.403194 542.523
## 76759 -37.31458 -8.403194 542.419
## 76760 -37.31430 -8.403194 542.126
## 76761 -37.31402 -8.403194 541.726
## 76762 -37.31375 -8.403194 541.162
## 76763 -37.31347 -8.403194 540.498
## 76764 -37.31319 -8.403194 539.599
## 76765 -37.31291 -8.403194 538.891
## 76766 -37.31263 -8.403194 538.300
## 76767 -37.31236 -8.403194 538.417
## 76768 -37.31208 -8.403194 538.681
## 76769 -37.31180 -8.403194 539.158
## 76770 -37.31152 -8.403194 538.977
## 76771 -37.31125 -8.403194 538.658
## 76772 -37.31097 -8.403194 538.535
## 76773 -37.31069 -8.403194 538.947
## 76774 -37.31041 -8.403194 539.397
## 76775 -37.31013 -8.403194 539.326
## 76776 -37.30986 -8.403194 538.653
## 76777 -37.30958 -8.403194 537.927
## 76778 -37.30930 -8.403194 537.570
## 76779 -37.30902 -8.403194 537.656
## 76780 -37.30875 -8.403194 537.765
## 76781 -37.30847 -8.403194 538.164
## 76782 -37.30819 -8.403194 538.342
## 76783 -37.30791 -8.403194 538.421
## 76784 -37.30763 -8.403194 538.116
## 76785 -37.30736 -8.403194 537.314
## 76786 -37.30708 -8.403194 536.805
## 76787 -37.30680 -8.403194 536.590
## 76788 -37.30652 -8.403194 537.612
## 76789 -37.30625 -8.403194 539.171
## 76790 -37.30597 -8.403194 541.143
## 76791 -37.30569 -8.403194 543.063
## 76792 -37.30541 -8.403194 544.655
## 76793 -37.30513 -8.403194 546.120
## 76794 -37.30486 -8.403194 546.687
## 76795 -37.30458 -8.403194 546.681
## 76796 -37.30430 -8.403194 546.397
## 76797 -37.30402 -8.403194 546.085
## 76798 -37.30375 -8.403194 545.770
## 76799 -37.30347 -8.403194 544.795
## 76800 -37.30319 -8.403194 543.312
## 76801 -37.30291 -8.403194 542.224
## 76802 -37.30263 -8.403194 542.083
## 76803 -37.30236 -8.403194 543.352
## 76804 -37.30208 -8.403194 545.066
## 76805 -37.30180 -8.403194 546.207
## 76806 -37.30152 -8.403194 546.893
## 76807 -37.30125 -8.403194 547.051
## 76808 -37.30097 -8.403194 546.897
## 76809 -37.30069 -8.403194 546.541
## 76810 -37.30041 -8.403194 546.117
## 76811 -37.30013 -8.403194 545.951
## 76812 -37.29986 -8.403194 545.865
## 76813 -37.29958 -8.403194 545.742
## 76814 -37.29930 -8.403194 545.369
## 76815 -37.29902 -8.403194 545.046
## 76816 -37.29875 -8.403194 544.950
## 76817 -37.29847 -8.403194 544.938
## 76818 -37.29819 -8.403194 544.922
## 76819 -37.29791 -8.403194 545.195
## 76820 -37.29763 -8.403194 545.497
## 76821 -37.29736 -8.403194 546.181
## 76822 -37.29708 -8.403194 546.704
## 76823 -37.29680 -8.403194 547.388
## 76824 -37.29652 -8.403194 548.262
## 76825 -37.29625 -8.403194 548.721
## 76826 -37.29597 -8.403194 548.748
## 76827 -37.29569 -8.403194 548.809
## 76828 -37.29541 -8.403194 548.881
## 76829 -37.29513 -8.403194 549.093
## 76830 -37.29486 -8.403194 549.524
## 76831 -37.29458 -8.403194 550.027
## 76832 -37.29430 -8.403194 549.881
## 76833 -37.29402 -8.403194 549.339
## 76834 -37.29375 -8.403194 548.762
## 76835 -37.29347 -8.403194 548.062
## 76836 -37.29319 -8.403194 548.160
## 76837 -37.29291 -8.403194 548.528
## 76838 -37.29263 -8.403194 548.864
## 76839 -37.29236 -8.403194 548.511
## 76840 -37.29208 -8.403194 548.122
## 76841 -37.29180 -8.403194 547.897
## 76842 -37.29152 -8.403194 548.480
## 76843 -37.29125 -8.403194 549.164
## 76844 -37.29097 -8.403194 550.125
## 76845 -37.29069 -8.403194 550.541
## 76846 -37.29041 -8.403194 550.640
## 76847 -37.29013 -8.403194 550.649
## 76848 -37.28986 -8.403194 550.588
## 76849 -37.28958 -8.403194 550.509
## 76850 -37.28930 -8.403194 550.476
## 76851 -37.28902 -8.403194 550.141
## 76852 -37.28875 -8.403194 550.587
## 76853 -37.28847 -8.403194 551.702
## 76854 -37.28819 -8.403194 553.589
## 76855 -37.28791 -8.403194 555.589
## 76856 -37.28763 -8.403194 557.640
## 76857 -37.28736 -8.403194 558.871
## 76858 -37.28708 -8.403194 559.770
## 76859 -37.28680 -8.403194 560.102
## 76860 -37.28652 -8.403194 560.339
## 76861 -37.28625 -8.403194 560.441
## 76862 -37.28597 -8.403194 560.426
## 76863 -37.28569 -8.403194 560.202
## 76864 -37.28541 -8.403194 560.054
## 76865 -37.28513 -8.403194 559.974
## 76866 -37.28486 -8.403194 560.139
## 76867 -37.28458 -8.403194 560.711
## 76868 -37.28430 -8.403194 561.857
## 76869 -37.28402 -8.403194 563.670
## 76870 -37.28375 -8.403194 565.277
## 76871 -37.28347 -8.403194 566.772
## 76872 -37.28319 -8.403194 567.346
## 76873 -37.28291 -8.403194 567.554
## 76874 -37.28263 -8.403194 567.306
## 76875 -37.28236 -8.403194 567.264
## 76876 -37.28208 -8.403194 567.304
## 76877 -37.28180 -8.403194 567.542
## 76878 -37.28152 -8.403194 567.828
## 76879 -37.28125 -8.403194 568.024
## 76880 -37.28097 -8.403194 568.052
## 76881 -37.28069 -8.403194 567.280
## 76882 -37.28041 -8.403194 566.247
## 76883 -37.28013 -8.403194 565.262
## 76884 -37.27986 -8.403194 564.691
## 76885 -37.27958 -8.403194 564.257
## 76886 -37.27930 -8.403194 563.610
## 76887 -37.27902 -8.403194 562.901
## 76888 -37.27875 -8.403194 562.761
## 76889 -37.27847 -8.403194 563.215
## 76890 -37.27819 -8.403194 564.526
## 76891 -37.27791 -8.403194 565.677
## 76892 -37.27763 -8.403194 566.697
## 76893 -37.27736 -8.403194 566.444
## 76894 -37.27708 -8.403194 565.911
## 76895 -37.27680 -8.403194 565.340
## 76896 -37.27652 -8.403194 565.696
## 76897 -37.27625 -8.403194 566.625
## 76898 -37.27597 -8.403194 567.852
## 76899 -37.27569 -8.403194 568.525
## 76900 -37.27541 -8.403194 568.965
## 76901 -37.27513 -8.403194 569.175
## 76902 -37.27486 -8.403194 569.315
## 76903 -37.27458 -8.403194 569.326
## 76904 -37.27430 -8.403194 569.118
## 76905 -37.27402 -8.403194 568.697
## 76906 -37.27375 -8.403194 568.194
## 76907 -37.27347 -8.403194 567.970
## 76908 -37.27319 -8.403194 567.479
## 76909 -37.27291 -8.403194 566.778
## 76910 -37.27263 -8.403194 565.821
## 76911 -37.27236 -8.403194 564.878
## 76912 -37.27208 -8.403194 563.993
## 76913 -37.27180 -8.403194 563.078
## 76914 -37.27152 -8.403194 561.953
## 76915 -37.27125 -8.403194 560.873
## 76916 -37.27097 -8.403194 560.201
## 76917 -37.27069 -8.403194 560.163
## 76918 -37.27041 -8.403194 560.463
## 76919 -37.27013 -8.403194 560.696
## 76920 -37.26986 -8.403194 561.086
## 76921 -37.26958 -8.403194 561.521
## 76922 -37.26930 -8.403194 561.714
## 76923 -37.26902 -8.403194 561.705
## 76924 -37.26875 -8.403194 561.180
## 76925 -37.26847 -8.403194 560.602
## 76926 -37.26819 -8.403194 559.684
## 76927 -37.26791 -8.403194 558.977
## 76928 -37.26763 -8.403194 558.812
## 76929 -37.26736 -8.403194 559.746
## 76930 -37.26708 -8.403194 561.206
## 76931 -37.26680 -8.403194 562.754
## 76932 -37.26652 -8.403194 563.844
## 76933 -37.26625 -8.403194 564.754
## 76934 -37.26597 -8.403194 565.172
## 76935 -37.26569 -8.403194 565.025
## 76936 -37.26541 -8.403194 564.256
## 76937 -37.26513 -8.403194 562.996
## 76938 -37.26486 -8.403194 561.074
## 76939 -37.26458 -8.403194 559.130
## 76940 -37.26430 -8.403194 557.478
## 76941 -37.26402 -8.403194 556.818
## 76942 -37.26375 -8.403194 556.605
## 76943 -37.26347 -8.403194 557.161
## 76944 -37.26319 -8.403194 557.655
## 76945 -37.26291 -8.403194 558.080
## 76946 -37.26263 -8.403194 558.177
## 76947 -37.26236 -8.403194 558.048
## 76948 -37.26208 -8.403194 557.892
## 76949 -37.26180 -8.403194 557.384
## 76950 -37.26152 -8.403194 556.737
## 76951 -37.26125 -8.403194 556.276
## 76952 -37.26097 -8.403194 556.485
## 76953 -37.26069 -8.403194 556.664
## 76954 -37.26041 -8.403194 556.616
## 76955 -37.26013 -8.403194 556.188
## 76956 -37.25986 -8.403194 555.270
## 76957 -37.25958 -8.403194 554.417
## 76958 -37.25930 -8.403194 553.796
## 76959 -37.25902 -8.403194 554.029
## 76960 -37.25875 -8.403194 554.514
## 76961 -37.25847 -8.403194 555.288
## 76962 -37.25819 -8.403194 555.073
## 76963 -37.25791 -8.403194 554.877
## 76964 -37.25763 -8.403194 554.799
## 76965 -37.25736 -8.403194 555.033
## 76966 -37.25708 -8.403194 555.686
## 76967 -37.25680 -8.403194 556.074
## 76968 -37.25652 -8.403194 556.708
## 76969 -37.25625 -8.403194 557.359
## 76970 -37.25597 -8.403194 558.093
## 76971 -37.25569 -8.403194 558.570
## 76972 -37.25541 -8.403194 558.942
## 76973 -37.25513 -8.403194 559.554
## 76974 -37.25486 -8.403194 560.545
## 76975 -37.25458 -8.403194 561.546
## 76976 -37.25430 -8.403194 562.670
## 76977 -37.25402 -8.403194 563.542
## 76978 -37.25375 -8.403194 564.671
## 76979 -37.25347 -8.403194 565.905
## 76980 -37.25319 -8.403194 567.015
## 76981 -37.25291 -8.403194 567.892
## 76982 -37.25263 -8.403194 568.571
## 76983 -37.25236 -8.403194 568.883
## 76984 -37.25208 -8.403194 569.124
## 76985 -37.25180 -8.403194 569.158
## 76986 -37.25152 -8.403194 569.509
## 76987 -37.25125 -8.403194 569.709
## 76988 -37.25097 -8.403194 569.802
## 76989 -37.25069 -8.403194 569.061
## 76990 -37.25041 -8.403194 568.084
## 76991 -37.25013 -8.403194 567.295
## 76992 -37.24986 -8.403194 567.202
## 76993 -37.24958 -8.403194 567.456
## 76994 -37.24930 -8.403194 568.042
## 76995 -37.24902 -8.403194 568.920
## 76996 -37.24875 -8.403194 569.956
## 76997 -37.24847 -8.403194 570.904
## 76998 -37.24819 -8.403194 571.217
## 76999 -37.24791 -8.403194 571.407
## 77000 -37.24763 -8.403194 571.817
## 77001 -37.24736 -8.403194 572.493
## 77002 -37.24708 -8.403194 573.293
## 77003 -37.24680 -8.403194 574.040
## 77004 -37.24652 -8.403194 574.690
## 77005 -37.24625 -8.403194 575.554
## 77006 -37.24597 -8.403194 576.353
## 77007 -37.24569 -8.403194 577.372
## 77008 -37.24541 -8.403194 578.297
## 77009 -37.24513 -8.403194 578.892
## 77010 -37.24486 -8.403194 579.105
## 77011 -37.24458 -8.403194 579.066
## 77012 -37.24430 -8.403194 579.006
## 77013 -37.24402 -8.403194 579.283
## 77014 -37.24375 -8.403194 579.435
## 77015 -37.24347 -8.403194 579.685
## 77016 -37.24319 -8.403194 579.063
## 77017 -37.24291 -8.403194 578.464
## 77018 -37.24263 -8.403194 577.834
## 77019 -37.24236 -8.403194 578.001
## 77020 -37.24208 -8.403194 578.456
## 77021 -37.24180 -8.403194 578.594
## 77022 -37.24152 -8.403194 578.788
## 77023 -37.24125 -8.403194 579.160
## 77024 -37.24097 -8.403194 579.789
## 77025 -37.24069 -8.403194 580.580
## 77026 -37.24041 -8.403194 581.153
## 77027 -37.24013 -8.403194 581.759
## 77028 -37.23986 -8.403194 582.191
## 77029 -37.23958 -8.403194 582.282
## 77030 -37.23930 -8.403194 582.112
## 77031 -37.23902 -8.403194 581.910
## 77032 -37.23875 -8.403194 581.812
## 77033 -37.23847 -8.403194 581.542
## 77034 -37.23819 -8.403194 581.130
## 77035 -37.23791 -8.403194 580.709
## 77036 -37.23763 -8.403194 580.291
## 77037 -37.23736 -8.403194 580.238
## 77038 -37.23708 -8.403194 580.119
## 77039 -37.23680 -8.403194 579.937
## 77040 -37.23652 -8.403194 579.354
## 77041 -37.23625 -8.403194 578.442
## 77042 -37.23597 -8.403194 577.445
## 77043 -37.23569 -8.403194 576.514
## 77044 -37.23541 -8.403194 575.420
## 77045 -37.23513 -8.403194 573.935
## 77046 -37.23486 -8.403194 571.923
## 77047 -37.23458 -8.403194 570.101
## 77048 -37.23430 -8.403194 568.511
## 77049 -37.23402 -8.403194 567.813
## 77050 -37.23375 -8.403194 567.497
## 77051 -37.23347 -8.403194 567.718
## 77052 -37.23319 -8.403194 568.366
## 77053 -37.23291 -8.403194 569.126
## 77054 -37.23263 -8.403194 569.977
## 77055 -37.23236 -8.403194 569.932
## 77056 -37.23208 -8.403194 569.622
## 77057 -37.23180 -8.403194 568.875
## 77058 -37.23152 -8.403194 568.228
## 77059 -37.23125 -8.403194 567.530
## 77060 -37.23097 -8.403194 566.642
## 77061 -37.23069 -8.403194 565.613
## 77062 -37.23041 -8.403194 564.974
## 77063 -37.23013 -8.403194 564.908
## 77064 -37.22986 -8.403194 565.400
## 77973 -37.35375 -8.403472 525.740
## 77974 -37.35347 -8.403472 525.016
## 77975 -37.35319 -8.403472 524.488
## 77976 -37.35291 -8.403472 523.840
## 77977 -37.35263 -8.403472 523.393
## 77978 -37.35236 -8.403472 523.335
## 77979 -37.35208 -8.403472 523.437
## 77980 -37.35180 -8.403472 523.569
## 77981 -37.35152 -8.403472 523.417
## 77982 -37.35125 -8.403472 523.302
## 77983 -37.35097 -8.403472 523.131
## 77984 -37.35069 -8.403472 523.112
## 77985 -37.35041 -8.403472 523.029
## 77986 -37.35013 -8.403472 522.699
## 77987 -37.34986 -8.403472 522.659
## 77988 -37.34958 -8.403472 522.916
## 77989 -37.34930 -8.403472 523.102
## 77990 -37.34902 -8.403472 523.420
## 77991 -37.34875 -8.403472 523.844
## 77992 -37.34847 -8.403472 524.787
## 77993 -37.34819 -8.403472 526.659
## 77994 -37.34791 -8.403472 527.756
## 77995 -37.34763 -8.403472 528.318
## 77996 -37.34736 -8.403472 527.848
## 77997 -37.34708 -8.403472 527.225
## 77998 -37.34680 -8.403472 526.371
## 77999 -37.34652 -8.403472 525.883
## 78000 -37.34625 -8.403472 525.754
## 78001 -37.34597 -8.403472 525.825
## 78002 -37.34569 -8.403472 526.396
## 78003 -37.34541 -8.403472 526.576
## 78004 -37.34513 -8.403472 526.382
## 78005 -37.34486 -8.403472 526.166
## 78006 -37.34458 -8.403472 525.709
## 78007 -37.34430 -8.403472 525.180
## 78008 -37.34402 -8.403472 525.059
## 78009 -37.34375 -8.403472 525.071
## 78010 -37.34347 -8.403472 525.438
## 78041 -37.33486 -8.403472 531.178
## 78042 -37.33458 -8.403472 531.856
## 78043 -37.33430 -8.403472 532.004
## 78044 -37.33402 -8.403472 531.392
## 78045 -37.33375 -8.403472 530.630
## 78046 -37.33347 -8.403472 529.552
## 78047 -37.33319 -8.403472 528.801
## 78048 -37.33291 -8.403472 528.335
## 78049 -37.33263 -8.403472 528.141
## 78050 -37.33236 -8.403472 528.546
## 78051 -37.33208 -8.403472 529.173
## 78052 -37.33180 -8.403472 529.802
## 78053 -37.33152 -8.403472 530.254
## 78054 -37.33125 -8.403472 530.221
## 78055 -37.33097 -8.403472 529.942
## 78056 -37.33069 -8.403472 529.828
## 78057 -37.33041 -8.403472 529.779
## 78058 -37.33013 -8.403472 529.654
## 78059 -37.32986 -8.403472 529.298
## 78060 -37.32958 -8.403472 529.128
## 78061 -37.32930 -8.403472 529.103
## 78062 -37.32902 -8.403472 529.717
## 78063 -37.32875 -8.403472 530.429
## 78064 -37.32847 -8.403472 531.425
## 78065 -37.32819 -8.403472 532.349
## 78066 -37.32791 -8.403472 533.033
## 78067 -37.32763 -8.403472 533.797
## 78068 -37.32736 -8.403472 534.079
## 78069 -37.32708 -8.403472 534.166
## 78070 -37.32680 -8.403472 533.884
## 78071 -37.32652 -8.403472 534.026
## 78072 -37.32625 -8.403472 534.209
## 78073 -37.32597 -8.403472 534.507
## 78074 -37.32569 -8.403472 534.556
## 78075 -37.32541 -8.403472 534.541
## 78076 -37.32513 -8.403472 534.694
## 78077 -37.32486 -8.403472 535.197
## 78078 -37.32458 -8.403472 535.783
## 78079 -37.32430 -8.403472 536.399
## 78080 -37.32402 -8.403472 537.187
## 78081 -37.32375 -8.403472 538.023
## 78082 -37.32347 -8.403472 538.589
## 78083 -37.32319 -8.403472 538.524
## 78084 -37.32291 -8.403472 538.203
## 78085 -37.32263 -8.403472 537.530
## 78086 -37.32236 -8.403472 537.094
## 78087 -37.32208 -8.403472 536.762
## 78088 -37.32180 -8.403472 536.672
## 78089 -37.32152 -8.403472 536.944
## 78090 -37.32125 -8.403472 537.078
## 78091 -37.32097 -8.403472 537.338
## 78092 -37.32069 -8.403472 537.444
## 78093 -37.32041 -8.403472 537.433
## 78094 -37.32013 -8.403472 537.324
## 78095 -37.31986 -8.403472 537.124
## 78096 -37.31958 -8.403472 536.889
## 78097 -37.31930 -8.403472 536.946
## 78098 -37.31902 -8.403472 537.014
## 78099 -37.31875 -8.403472 537.170
## 78100 -37.31847 -8.403472 537.091
## 78101 -37.31819 -8.403472 537.015
## 78102 -37.31791 -8.403472 537.309
## 78103 -37.31763 -8.403472 537.831
## 78104 -37.31736 -8.403472 538.771
## 78105 -37.31708 -8.403472 539.901
## 78106 -37.31680 -8.403472 541.130
## 78107 -37.31652 -8.403472 542.313
## 78108 -37.31625 -8.403472 543.164
## 78109 -37.31597 -8.403472 543.537
## 78110 -37.31569 -8.403472 543.611
## 78111 -37.31541 -8.403472 543.375
## 78112 -37.31513 -8.403472 543.216
## 78113 -37.31486 -8.403472 543.402
## 78114 -37.31458 -8.403472 543.474
## 78115 -37.31430 -8.403472 543.426
## 78116 -37.31402 -8.403472 542.820
## 78117 -37.31375 -8.403472 542.123
## 78118 -37.31347 -8.403472 541.318
## 78119 -37.31319 -8.403472 540.535
## 78120 -37.31291 -8.403472 539.960
## 78121 -37.31263 -8.403472 539.424
## 78122 -37.31236 -8.403472 539.271
## 78123 -37.31208 -8.403472 539.276
## 78124 -37.31180 -8.403472 539.479
## 78125 -37.31152 -8.403472 539.292
## 78126 -37.31125 -8.403472 538.894
## 78127 -37.31097 -8.403472 538.724
## 78128 -37.31069 -8.403472 538.943
## 78129 -37.31041 -8.403472 539.241
## 78130 -37.31013 -8.403472 539.131
## 78131 -37.30986 -8.403472 538.758
## 78132 -37.30958 -8.403472 538.456
## 78133 -37.30930 -8.403472 538.429
## 78134 -37.30902 -8.403472 538.804
## 78135 -37.30875 -8.403472 539.221
## 78136 -37.30847 -8.403472 539.775
## 78137 -37.30819 -8.403472 539.957
## 78138 -37.30791 -8.403472 539.931
## 78139 -37.30763 -8.403472 539.415
## 78140 -37.30736 -8.403472 538.662
## 78141 -37.30708 -8.403472 537.988
## 78142 -37.30680 -8.403472 537.745
## 78143 -37.30652 -8.403472 538.406
## 78144 -37.30625 -8.403472 539.445
## 78145 -37.30597 -8.403472 541.153
## 78146 -37.30569 -8.403472 542.965
## 78147 -37.30541 -8.403472 544.556
## 78148 -37.30513 -8.403472 545.901
## 78149 -37.30486 -8.403472 546.883
## 78150 -37.30458 -8.403472 547.308
## 78151 -37.30430 -8.403472 547.462
## 78152 -37.30402 -8.403472 546.929
## 78153 -37.30375 -8.403472 546.145
## 78154 -37.30347 -8.403472 544.926
## 78155 -37.30319 -8.403472 543.638
## 78156 -37.30291 -8.403472 542.788
## 78157 -37.30263 -8.403472 542.707
## 78158 -37.30236 -8.403472 544.195
## 78159 -37.30208 -8.403472 546.091
## 78160 -37.30180 -8.403472 547.729
## 78161 -37.30152 -8.403472 548.052
## 78162 -37.30125 -8.403472 547.823
## 78163 -37.30097 -8.403472 547.484
## 78164 -37.30069 -8.403472 547.403
## 78165 -37.30041 -8.403472 547.279
## 78166 -37.30013 -8.403472 547.256
## 78167 -37.29986 -8.403472 547.005
## 78168 -37.29958 -8.403472 546.781
## 78169 -37.29930 -8.403472 546.234
## 78170 -37.29902 -8.403472 545.759
## 78171 -37.29875 -8.403472 545.408
## 78172 -37.29847 -8.403472 545.066
## 78173 -37.29819 -8.403472 545.530
## 78174 -37.29791 -8.403472 546.238
## 78175 -37.29763 -8.403472 546.935
## 78176 -37.29736 -8.403472 547.269
## 78177 -37.29708 -8.403472 547.499
## 78178 -37.29680 -8.403472 548.021
## 78179 -37.29652 -8.403472 549.114
## 78180 -37.29625 -8.403472 549.872
## 78181 -37.29597 -8.403472 550.035
## 78182 -37.29569 -8.403472 549.913
## 78183 -37.29541 -8.403472 549.682
## 78184 -37.29513 -8.403472 549.693
## 78185 -37.29486 -8.403472 550.160
## 78186 -37.29458 -8.403472 550.405
## 78187 -37.29430 -8.403472 550.516
## 78188 -37.29402 -8.403472 549.840
## 78189 -37.29375 -8.403472 549.157
## 78190 -37.29347 -8.403472 548.335
## 78191 -37.29319 -8.403472 548.320
## 78192 -37.29291 -8.403472 548.599
## 78193 -37.29263 -8.403472 548.819
## 78194 -37.29236 -8.403472 548.715
## 78195 -37.29208 -8.403472 548.527
## 78196 -37.29180 -8.403472 548.495
## 78197 -37.29152 -8.403472 548.955
## 78198 -37.29125 -8.403472 549.382
## 78199 -37.29097 -8.403472 550.249
## 78200 -37.29069 -8.403472 550.668
## 78201 -37.29041 -8.403472 550.806
## 78202 -37.29013 -8.403472 550.829
## 78203 -37.28986 -8.403472 550.550
## 78204 -37.28958 -8.403472 550.366
## 78205 -37.28930 -8.403472 549.983
## 78206 -37.28902 -8.403472 549.586
## 78207 -37.28875 -8.403472 550.025
## 78208 -37.28847 -8.403472 551.095
## 78209 -37.28819 -8.403472 552.768
## 78210 -37.28791 -8.403472 554.550
## 78211 -37.28763 -8.403472 556.303
## 78212 -37.28736 -8.403472 557.485
## 78213 -37.28708 -8.403472 558.199
## 78214 -37.28680 -8.403472 558.485
## 78215 -37.28652 -8.403472 558.200
## 78216 -37.28625 -8.403472 557.821
## 78217 -37.28597 -8.403472 557.665
## 78218 -37.28569 -8.403472 557.744
## 78219 -37.28541 -8.403472 558.106
## 78220 -37.28513 -8.403472 558.302
## 78221 -37.28486 -8.403472 558.965
## 78222 -37.28458 -8.403472 560.036
## 78223 -37.28430 -8.403472 561.818
## 78224 -37.28402 -8.403472 563.702
## 78225 -37.28375 -8.403472 565.331
## 78226 -37.28347 -8.403472 566.802
## 78227 -37.28319 -8.403472 567.254
## 78228 -37.28291 -8.403472 567.188
## 78229 -37.28263 -8.403472 566.858
## 78230 -37.28236 -8.403472 566.531
## 78231 -37.28208 -8.403472 566.371
## 78232 -37.28180 -8.403472 566.459
## 78233 -37.28152 -8.403472 567.149
## 78234 -37.28125 -8.403472 567.803
## 78235 -37.28097 -8.403472 568.125
## 78236 -37.28069 -8.403472 567.646
## 78237 -37.28041 -8.403472 566.927
## 78238 -37.28013 -8.403472 566.310
## 78239 -37.27986 -8.403472 565.395
## 78240 -37.27958 -8.403472 564.817
## 78241 -37.27930 -8.403472 563.557
## 78242 -37.27902 -8.403472 563.224
## 78243 -37.27875 -8.403472 563.432
## 78244 -37.27847 -8.403472 564.000
## 78245 -37.27819 -8.403472 565.011
## 78246 -37.27791 -8.403472 565.738
## 78247 -37.27763 -8.403472 566.541
## 78248 -37.27736 -8.403472 566.120
## 78249 -37.27708 -8.403472 565.427
## 78250 -37.27680 -8.403472 564.495
## 78251 -37.27652 -8.403472 564.977
## 78252 -37.27625 -8.403472 566.055
## 78253 -37.27597 -8.403472 567.313
## 78254 -37.27569 -8.403472 567.788
## 78255 -37.27541 -8.403472 567.943
## 78256 -37.27513 -8.403472 568.069
## 78257 -37.27486 -8.403472 568.041
## 78258 -37.27458 -8.403472 567.909
## 78259 -37.27430 -8.403472 567.586
## 78260 -37.27402 -8.403472 567.643
## 78261 -37.27375 -8.403472 567.663
## 78262 -37.27347 -8.403472 567.801
## 78263 -37.27319 -8.403472 567.336
## 78264 -37.27291 -8.403472 566.681
## 78265 -37.27263 -8.403472 565.792
## 78266 -37.27236 -8.403472 564.715
## 78267 -37.27208 -8.403472 563.751
## 78268 -37.27180 -8.403472 562.894
## 78269 -37.27152 -8.403472 562.185
## 78270 -37.27125 -8.403472 561.732
## 78271 -37.27097 -8.403472 561.450
## 78272 -37.27069 -8.403472 561.393
## 78273 -37.27041 -8.403472 561.618
## 78274 -37.27013 -8.403472 561.866
## 78275 -37.26986 -8.403472 562.100
## 78276 -37.26958 -8.403472 562.263
## 78277 -37.26930 -8.403472 562.268
## 78278 -37.26902 -8.403472 562.330
## 78279 -37.26875 -8.403472 561.993
## 78280 -37.26847 -8.403472 561.405
## 78281 -37.26819 -8.403472 560.366
## 78282 -37.26791 -8.403472 559.495
## 78283 -37.26763 -8.403472 559.320
## 78284 -37.26736 -8.403472 559.778
## 78285 -37.26708 -8.403472 560.814
## 78286 -37.26680 -8.403472 561.946
## 78287 -37.26652 -8.403472 563.532
## 78288 -37.26625 -8.403472 564.901
## 78289 -37.26597 -8.403472 565.537
## 78290 -37.26569 -8.403472 565.042
## 78291 -37.26541 -8.403472 563.844
## 78292 -37.26513 -8.403472 562.267
## 78293 -37.26486 -8.403472 560.896
## 78294 -37.26458 -8.403472 559.293
## 78295 -37.26430 -8.403472 558.059
## 78296 -37.26402 -8.403472 557.193
## 78297 -37.26375 -8.403472 556.698
## 78298 -37.26347 -8.403472 557.215
## 78299 -37.26319 -8.403472 557.816
## 78300 -37.26291 -8.403472 558.444
## 78301 -37.26263 -8.403472 558.760
## 78302 -37.26236 -8.403472 558.470
## 78303 -37.26208 -8.403472 558.175
## 78304 -37.26180 -8.403472 557.646
## 78305 -37.26152 -8.403472 557.230
## 78306 -37.26125 -8.403472 557.198
## 78307 -37.26097 -8.403472 557.632
## 78308 -37.26069 -8.403472 557.627
## 78309 -37.26041 -8.403472 557.375
## 78310 -37.26013 -8.403472 556.702
## 78311 -37.25986 -8.403472 555.849
## 78312 -37.25958 -8.403472 555.020
## 78313 -37.25930 -8.403472 554.388
## 78314 -37.25902 -8.403472 554.152
## 78315 -37.25875 -8.403472 554.145
## 78316 -37.25847 -8.403472 554.739
## 78317 -37.25819 -8.403472 554.758
## 78318 -37.25791 -8.403472 554.915
## 78319 -37.25763 -8.403472 554.985
## 78320 -37.25736 -8.403472 555.370
## 78321 -37.25708 -8.403472 556.137
## 78322 -37.25680 -8.403472 556.573
## 78323 -37.25652 -8.403472 557.174
## 78324 -37.25625 -8.403472 557.724
## 78325 -37.25597 -8.403472 558.435
## 78326 -37.25569 -8.403472 559.130
## 78327 -37.25541 -8.403472 559.754
## 78328 -37.25513 -8.403472 560.605
## 78329 -37.25486 -8.403472 561.420
## 78330 -37.25458 -8.403472 562.368
## 78331 -37.25430 -8.403472 563.175
## 78332 -37.25402 -8.403472 564.170
## 78333 -37.25375 -8.403472 565.535
## 78334 -37.25347 -8.403472 566.895
## 78335 -37.25319 -8.403472 567.704
## 78336 -37.25291 -8.403472 568.203
## 78337 -37.25263 -8.403472 568.633
## 78338 -37.25236 -8.403472 568.990
## 78339 -37.25208 -8.403472 569.198
## 78340 -37.25180 -8.403472 569.243
## 78341 -37.25152 -8.403472 569.578
## 78342 -37.25125 -8.403472 569.871
## 78343 -37.25097 -8.403472 570.033
## 78344 -37.25069 -8.403472 569.453
## 78345 -37.25041 -8.403472 568.681
## 78346 -37.25013 -8.403472 568.063
## 78347 -37.24986 -8.403472 567.664
## 78348 -37.24958 -8.403472 567.725
## 78349 -37.24930 -8.403472 568.018
## 78350 -37.24902 -8.403472 569.016
## 78351 -37.24875 -8.403472 570.149
## 78352 -37.24847 -8.403472 571.145
## 78353 -37.24819 -8.403472 571.446
## 78354 -37.24791 -8.403472 571.659
## 78355 -37.24763 -8.403472 572.020
## 78356 -37.24736 -8.403472 572.680
## 78357 -37.24708 -8.403472 573.488
## 78358 -37.24680 -8.403472 574.162
## 78359 -37.24652 -8.403472 574.578
## 78360 -37.24625 -8.403472 575.206
## 78361 -37.24597 -8.403472 575.931
## 78362 -37.24569 -8.403472 577.220
## 78363 -37.24541 -8.403472 578.445
## 78364 -37.24513 -8.403472 579.296
## 78365 -37.24486 -8.403472 579.380
## 78366 -37.24458 -8.403472 579.306
## 78367 -37.24430 -8.403472 579.280
## 78368 -37.24402 -8.403472 579.699
## 78369 -37.24375 -8.403472 580.068
## 78370 -37.24347 -8.403472 580.523
## 78371 -37.24319 -8.403472 580.185
## 78372 -37.24291 -8.403472 579.775
## 78373 -37.24263 -8.403472 579.463
## 78374 -37.24236 -8.403472 579.383
## 78375 -37.24208 -8.403472 579.647
## 78376 -37.24180 -8.403472 579.620
## 78377 -37.24152 -8.403472 579.629
## 78378 -37.24125 -8.403472 579.929
## 78379 -37.24097 -8.403472 580.524
## 78380 -37.24069 -8.403472 581.802
## 78381 -37.24041 -8.403472 583.082
## 78382 -37.24013 -8.403472 584.144
## 78383 -37.23986 -8.403472 584.126
## 78384 -37.23958 -8.403472 583.864
## 78385 -37.23930 -8.403472 583.305
## 78386 -37.23902 -8.403472 583.054
## 78387 -37.23875 -8.403472 582.769
## 78388 -37.23847 -8.403472 582.354
## 78389 -37.23819 -8.403472 582.032
## 78390 -37.23791 -8.403472 581.719
## 78391 -37.23763 -8.403472 581.328
## 78392 -37.23736 -8.403472 580.911
## 78393 -37.23708 -8.403472 580.499
## 78394 -37.23680 -8.403472 580.172
## 78395 -37.23652 -8.403472 579.468
## 78396 -37.23625 -8.403472 578.578
## 78397 -37.23597 -8.403472 577.705
## 78398 -37.23569 -8.403472 576.510
## 78399 -37.23541 -8.403472 575.219
## 78400 -37.23513 -8.403472 573.504
## 78401 -37.23486 -8.403472 571.994
## 78402 -37.23458 -8.403472 570.573
## 78403 -37.23430 -8.403472 569.483
## 78404 -37.23402 -8.403472 568.684
## 78405 -37.23375 -8.403472 568.273
## 78406 -37.23347 -8.403472 568.507
## 78407 -37.23319 -8.403472 568.876
## 78408 -37.23291 -8.403472 569.190
## 78409 -37.23263 -8.403472 569.703
## 78410 -37.23236 -8.403472 570.309
## 78411 -37.23208 -8.403472 570.585
## 78412 -37.23180 -8.403472 570.289
## 78413 -37.23152 -8.403472 569.425
## 78414 -37.23125 -8.403472 568.571
## 78415 -37.23097 -8.403472 567.508
## 78416 -37.23069 -8.403472 566.498
## 78417 -37.23041 -8.403472 565.791
## 78418 -37.23013 -8.403472 565.568
## 78419 -37.22986 -8.403472 565.600
## 78420 -37.22958 -8.403472 565.845
## 78421 -37.22930 -8.403472 565.803
## 78422 -37.22902 -8.403472 565.485
## 79324 -37.35486 -8.403750 524.684
## 79325 -37.35458 -8.403750 524.994
## 79326 -37.35430 -8.403750 525.072
## 79327 -37.35402 -8.403750 524.942
## 79328 -37.35375 -8.403750 524.476
## 79329 -37.35347 -8.403750 523.906
## 79330 -37.35319 -8.403750 523.185
## 79331 -37.35291 -8.403750 522.601
## 79332 -37.35263 -8.403750 522.245
## 79333 -37.35236 -8.403750 522.346
## 79334 -37.35208 -8.403750 522.651
## 79335 -37.35180 -8.403750 522.935
## 79336 -37.35152 -8.403750 523.233
## 79337 -37.35125 -8.403750 523.366
## 79338 -37.35097 -8.403750 523.544
## 79339 -37.35069 -8.403750 523.598
## 79340 -37.35041 -8.403750 523.751
## 79341 -37.35013 -8.403750 523.957
## 79342 -37.34986 -8.403750 524.293
## 79343 -37.34958 -8.403750 524.680
## 79344 -37.34930 -8.403750 525.292
## 79345 -37.34902 -8.403750 525.188
## 79346 -37.34875 -8.403750 525.485
## 79347 -37.34847 -8.403750 526.013
## 79348 -37.34819 -8.403750 527.285
## 79349 -37.34791 -8.403750 528.432
## 79350 -37.34763 -8.403750 529.109
## 79351 -37.34736 -8.403750 528.779
## 79352 -37.34708 -8.403750 528.037
## 79353 -37.34680 -8.403750 527.037
## 79354 -37.34652 -8.403750 526.633
## 79355 -37.34625 -8.403750 526.272
## 79356 -37.34597 -8.403750 526.201
## 79357 -37.34569 -8.403750 526.258
## 79358 -37.34541 -8.403750 526.434
## 79359 -37.34513 -8.403750 526.508
## 79360 -37.34486 -8.403750 526.342
## 79361 -37.34458 -8.403750 526.068
## 79362 -37.34430 -8.403750 525.883
## 79363 -37.34402 -8.403750 525.581
## 79364 -37.34375 -8.403750 525.469
## 79365 -37.34347 -8.403750 525.427
## 79366 -37.34319 -8.403750 525.616
## 79367 -37.34291 -8.403750 525.861
## 79368 -37.34263 -8.403750 526.227
## 79390 -37.33652 -8.403750 529.228
## 79391 -37.33625 -8.403750 528.913
## 79392 -37.33597 -8.403750 528.819
## 79393 -37.33569 -8.403750 528.717
## 79394 -37.33541 -8.403750 528.954
## 79395 -37.33513 -8.403750 529.450
## 79396 -37.33486 -8.403750 530.301
## 79397 -37.33458 -8.403750 531.098
## 79398 -37.33430 -8.403750 531.299
## 79399 -37.33402 -8.403750 531.131
## 79400 -37.33375 -8.403750 530.478
## 79401 -37.33347 -8.403750 529.557
## 79402 -37.33319 -8.403750 529.221
## 79403 -37.33291 -8.403750 528.945
## 79404 -37.33263 -8.403750 528.968
## 79405 -37.33236 -8.403750 529.469
## 79406 -37.33208 -8.403750 530.104
## 79407 -37.33180 -8.403750 530.591
## 79408 -37.33152 -8.403750 530.914
## 79409 -37.33125 -8.403750 530.945
## 79410 -37.33097 -8.403750 530.811
## 79411 -37.33069 -8.403750 531.037
## 79412 -37.33041 -8.403750 531.133
## 79413 -37.33013 -8.403750 531.130
## 79414 -37.32986 -8.403750 530.843
## 79415 -37.32958 -8.403750 530.593
## 79416 -37.32930 -8.403750 530.717
## 79417 -37.32902 -8.403750 530.932
## 79418 -37.32875 -8.403750 531.478
## 79419 -37.32847 -8.403750 532.262
## 79420 -37.32819 -8.403750 532.681
## 79421 -37.32791 -8.403750 533.169
## 79422 -37.32763 -8.403750 533.556
## 79423 -37.32736 -8.403750 533.727
## 79424 -37.32708 -8.403750 533.861
## 79425 -37.32680 -8.403750 533.949
## 79426 -37.32652 -8.403750 534.388
## 79427 -37.32625 -8.403750 534.731
## 79428 -37.32597 -8.403750 534.986
## 79429 -37.32569 -8.403750 534.883
## 79430 -37.32541 -8.403750 534.779
## 79431 -37.32513 -8.403750 534.850
## 79432 -37.32486 -8.403750 535.333
## 79433 -37.32458 -8.403750 536.071
## 79434 -37.32430 -8.403750 536.955
## 79435 -37.32402 -8.403750 538.124
## 79436 -37.32375 -8.403750 539.159
## 79437 -37.32347 -8.403750 539.807
## 79438 -37.32319 -8.403750 539.909
## 79439 -37.32291 -8.403750 539.590
## 79440 -37.32263 -8.403750 539.073
## 79441 -37.32236 -8.403750 538.644
## 79442 -37.32208 -8.403750 538.273
## 79443 -37.32180 -8.403750 538.314
## 79444 -37.32152 -8.403750 538.107
## 79445 -37.32125 -8.403750 538.200
## 79446 -37.32097 -8.403750 538.315
## 79447 -37.32069 -8.403750 538.089
## 79448 -37.32041 -8.403750 537.815
## 79449 -37.32013 -8.403750 537.489
## 79450 -37.31986 -8.403750 537.138
## 79451 -37.31958 -8.403750 536.848
## 79452 -37.31930 -8.403750 536.608
## 79453 -37.31902 -8.403750 536.910
## 79454 -37.31875 -8.403750 537.199
## 79455 -37.31847 -8.403750 537.352
## 79456 -37.31819 -8.403750 537.752
## 79457 -37.31791 -8.403750 538.119
## 79458 -37.31763 -8.403750 538.732
## 79459 -37.31736 -8.403750 539.744
## 79460 -37.31708 -8.403750 540.940
## 79461 -37.31680 -8.403750 542.148
## 79462 -37.31652 -8.403750 543.275
## 79463 -37.31625 -8.403750 544.108
## 79464 -37.31597 -8.403750 544.649
## 79465 -37.31569 -8.403750 544.516
## 79466 -37.31541 -8.403750 544.227
## 79467 -37.31513 -8.403750 543.985
## 79468 -37.31486 -8.403750 544.048
## 79469 -37.31458 -8.403750 544.135
## 79470 -37.31430 -8.403750 543.948
## 79471 -37.31402 -8.403750 543.504
## 79472 -37.31375 -8.403750 542.815
## 79473 -37.31347 -8.403750 541.945
## 79474 -37.31319 -8.403750 541.404
## 79475 -37.31291 -8.403750 540.884
## 79476 -37.31263 -8.403750 540.540
## 79477 -37.31236 -8.403750 540.441
## 79478 -37.31208 -8.403750 540.379
## 79479 -37.31180 -8.403750 540.314
## 79480 -37.31152 -8.403750 539.732
## 79481 -37.31125 -8.403750 539.226
## 79482 -37.31097 -8.403750 538.748
## 79483 -37.31069 -8.403750 538.945
## 79484 -37.31041 -8.403750 539.166
## 79485 -37.31013 -8.403750 539.347
## 79486 -37.30986 -8.403750 539.326
## 79487 -37.30958 -8.403750 539.326
## 79488 -37.30930 -8.403750 539.569
## 79489 -37.30902 -8.403750 540.050
## 79490 -37.30875 -8.403750 540.649
## 79491 -37.30847 -8.403750 541.141
## 79492 -37.30819 -8.403750 541.415
## 79493 -37.30791 -8.403750 541.387
## 79494 -37.30763 -8.403750 541.048
## 79495 -37.30736 -8.403750 540.392
## 79496 -37.30708 -8.403750 539.759
## 79497 -37.30680 -8.403750 539.470
## 79498 -37.30652 -8.403750 539.673
## 79499 -37.30625 -8.403750 540.367
## 79500 -37.30597 -8.403750 541.673
## 79501 -37.30569 -8.403750 542.844
## 79502 -37.30541 -8.403750 544.309
## 79503 -37.30513 -8.403750 545.666
## 79504 -37.30486 -8.403750 546.730
## 79505 -37.30458 -8.403750 547.410
## 79506 -37.30430 -8.403750 547.592
## 79507 -37.30402 -8.403750 547.342
## 79508 -37.30375 -8.403750 546.649
## 79509 -37.30347 -8.403750 545.568
## 79510 -37.30319 -8.403750 544.547
## 79511 -37.30291 -8.403750 543.792
## 79512 -37.30263 -8.403750 544.020
## 79513 -37.30236 -8.403750 545.472
## 79514 -37.30208 -8.403750 547.416
## 79515 -37.30180 -8.403750 549.022
## 79516 -37.30152 -8.403750 549.043
## 79517 -37.30125 -8.403750 548.667
## 79518 -37.30097 -8.403750 548.169
## 79519 -37.30069 -8.403750 547.932
## 79520 -37.30041 -8.403750 547.841
## 79521 -37.30013 -8.403750 547.760
## 79522 -37.29986 -8.403750 547.563
## 79523 -37.29958 -8.403750 547.300
## 79524 -37.29930 -8.403750 546.696
## 79525 -37.29902 -8.403750 546.420
## 79526 -37.29875 -8.403750 546.061
## 79527 -37.29847 -8.403750 545.980
## 79528 -37.29819 -8.403750 546.653
## 79529 -37.29791 -8.403750 547.485
## 79530 -37.29763 -8.403750 548.203
## 79531 -37.29736 -8.403750 548.372
## 79532 -37.29708 -8.403750 548.452
## 79533 -37.29680 -8.403750 548.615
## 79534 -37.29652 -8.403750 549.413
## 79535 -37.29625 -8.403750 550.222
## 79536 -37.29597 -8.403750 550.824
## 79537 -37.29569 -8.403750 550.601
## 79538 -37.29541 -8.403750 550.221
## 79539 -37.29513 -8.403750 550.014
## 79540 -37.29486 -8.403750 550.208
## 79541 -37.29458 -8.403750 550.460
## 79542 -37.29430 -8.403750 550.248
## 79543 -37.29402 -8.403750 549.702
## 79544 -37.29375 -8.403750 548.942
## 79545 -37.29347 -8.403750 548.184
## 79546 -37.29319 -8.403750 548.523
## 79547 -37.29291 -8.403750 548.923
## 79548 -37.29263 -8.403750 549.337
## 79549 -37.29236 -8.403750 549.505
## 79550 -37.29208 -8.403750 549.624
## 79551 -37.29180 -8.403750 549.874
## 79552 -37.29152 -8.403750 550.084
## 79553 -37.29125 -8.403750 550.402
## 79554 -37.29097 -8.403750 550.881
## 79555 -37.29069 -8.403750 550.867
## 79556 -37.29041 -8.403750 550.884
## 79557 -37.29013 -8.403750 550.728
## 79558 -37.28986 -8.403750 550.355
## 79559 -37.28958 -8.403750 549.958
## 79560 -37.28930 -8.403750 549.718
## 79561 -37.28902 -8.403750 549.572
## 79562 -37.28875 -8.403750 549.869
## 79563 -37.28847 -8.403750 550.675
## 79564 -37.28819 -8.403750 552.039
## 79565 -37.28791 -8.403750 553.611
## 79566 -37.28763 -8.403750 554.992
## 79567 -37.28736 -8.403750 555.858
## 79568 -37.28708 -8.403750 556.279
## 79569 -37.28680 -8.403750 556.342
## 79570 -37.28652 -8.403750 555.956
## 79571 -37.28625 -8.403750 555.567
## 79572 -37.28597 -8.403750 555.100
## 79573 -37.28569 -8.403750 555.639
## 79574 -37.28541 -8.403750 556.311
## 79575 -37.28513 -8.403750 557.294
## 79576 -37.28486 -8.403750 558.600
## 79577 -37.28458 -8.403750 560.162
## 79578 -37.28430 -8.403750 562.128
## 79579 -37.28402 -8.403750 563.920
## 79580 -37.28375 -8.403750 565.591
## 79581 -37.28347 -8.403750 566.826
## 79582 -37.28319 -8.403750 566.884
## 79583 -37.28291 -8.403750 566.548
## 79584 -37.28263 -8.403750 566.009
## 79585 -37.28236 -8.403750 565.572
## 79586 -37.28208 -8.403750 565.370
## 79587 -37.28180 -8.403750 565.497
## 79588 -37.28152 -8.403750 566.322
## 79589 -37.28125 -8.403750 567.152
## 79590 -37.28097 -8.403750 567.840
## 79591 -37.28069 -8.403750 567.702
## 79592 -37.28041 -8.403750 567.271
## 79593 -37.28013 -8.403750 566.578
## 79594 -37.27986 -8.403750 565.738
## 79595 -37.27958 -8.403750 564.949
## 79596 -37.27930 -8.403750 564.284
## 79597 -37.27902 -8.403750 564.255
## 79598 -37.27875 -8.403750 564.462
## 79599 -37.27847 -8.403750 565.153
## 79600 -37.27819 -8.403750 565.659
## 79601 -37.27791 -8.403750 566.201
## 79602 -37.27763 -8.403750 566.288
## 79603 -37.27736 -8.403750 565.481
## 79604 -37.27708 -8.403750 564.582
## 79605 -37.27680 -8.403750 563.911
## 79606 -37.27652 -8.403750 564.809
## 79607 -37.27625 -8.403750 565.817
## 79608 -37.27597 -8.403750 566.970
## 79609 -37.27569 -8.403750 567.194
## 79610 -37.27541 -8.403750 567.276
## 79611 -37.27513 -8.403750 567.153
## 79612 -37.27486 -8.403750 566.899
## 79613 -37.27458 -8.403750 566.654
## 79614 -37.27430 -8.403750 566.622
## 79615 -37.27402 -8.403750 566.869
## 79616 -37.27375 -8.403750 567.160
## 79617 -37.27347 -8.403750 567.253
## 79618 -37.27319 -8.403750 566.981
## 79619 -37.27291 -8.403750 566.420
## 79620 -37.27263 -8.403750 565.673
## 79621 -37.27236 -8.403750 564.828
## 79622 -37.27208 -8.403750 564.010
## 79623 -37.27180 -8.403750 563.243
## 79624 -37.27152 -8.403750 563.011
## 79625 -37.27125 -8.403750 562.870
## 79626 -37.27097 -8.403750 562.807
## 79627 -37.27069 -8.403750 563.061
## 79628 -37.27041 -8.403750 563.301
## 79629 -37.27013 -8.403750 563.534
## 79630 -37.26986 -8.403750 563.661
## 79631 -37.26958 -8.403750 563.664
## 79632 -37.26930 -8.403750 563.557
## 79633 -37.26902 -8.403750 563.313
## 79634 -37.26875 -8.403750 562.878
## 79635 -37.26847 -8.403750 562.279
## 79636 -37.26819 -8.403750 561.035
## 79637 -37.26791 -8.403750 560.029
## 79638 -37.26763 -8.403750 559.434
## 79639 -37.26736 -8.403750 559.852
## 79640 -37.26708 -8.403750 560.772
## 79641 -37.26680 -8.403750 561.983
## 79642 -37.26652 -8.403750 563.847
## 79643 -37.26625 -8.403750 565.240
## 79644 -37.26597 -8.403750 566.002
## 79645 -37.26569 -8.403750 565.403
## 79646 -37.26541 -8.403750 564.171
## 79647 -37.26513 -8.403750 562.626
## 79648 -37.26486 -8.403750 561.203
## 79649 -37.26458 -8.403750 559.860
## 79650 -37.26430 -8.403750 558.825
## 79651 -37.26402 -8.403750 557.680
## 79652 -37.26375 -8.403750 557.076
## 79653 -37.26347 -8.403750 557.015
## 79654 -37.26319 -8.403750 557.459
## 79655 -37.26291 -8.403750 558.147
## 79656 -37.26263 -8.403750 558.685
## 79657 -37.26236 -8.403750 558.747
## 79658 -37.26208 -8.403750 558.610
## 79659 -37.26180 -8.403750 558.451
## 79660 -37.26152 -8.403750 558.322
## 79661 -37.26125 -8.403750 558.305
## 79662 -37.26097 -8.403750 558.427
## 79663 -37.26069 -8.403750 558.053
## 79664 -37.26041 -8.403750 557.682
## 79665 -37.26013 -8.403750 557.002
## 79666 -37.25986 -8.403750 556.151
## 79667 -37.25958 -8.403750 555.196
## 79668 -37.25930 -8.403750 554.494
## 79669 -37.25902 -8.403750 553.982
## 79670 -37.25875 -8.403750 553.812
## 79671 -37.25847 -8.403750 553.841
## 79672 -37.25819 -8.403750 554.081
## 79673 -37.25791 -8.403750 554.473
## 79674 -37.25763 -8.403750 555.054
## 79675 -37.25736 -8.403750 555.906
## 79676 -37.25708 -8.403750 556.832
## 79677 -37.25680 -8.403750 557.598
## 79678 -37.25652 -8.403750 558.325
## 79679 -37.25625 -8.403750 558.907
## 79680 -37.25597 -8.403750 559.678
## 79681 -37.25569 -8.403750 560.166
## 79682 -37.25541 -8.403750 560.873
## 79683 -37.25513 -8.403750 561.605
## 79684 -37.25486 -8.403750 562.275
## 79685 -37.25458 -8.403750 563.019
## 79686 -37.25430 -8.403750 563.901
## 79687 -37.25402 -8.403750 565.052
## 79688 -37.25375 -8.403750 566.250
## 79689 -37.25347 -8.403750 567.524
## 79690 -37.25319 -8.403750 567.974
## 79691 -37.25291 -8.403750 568.383
## 79692 -37.25263 -8.403750 568.615
## 79693 -37.25236 -8.403750 568.747
## 79694 -37.25208 -8.403750 568.855
## 79695 -37.25180 -8.403750 569.059
## 79696 -37.25152 -8.403750 569.554
## 79697 -37.25125 -8.403750 569.916
## 79698 -37.25097 -8.403750 570.067
## 79699 -37.25069 -8.403750 569.442
## 79700 -37.25041 -8.403750 568.696
## 79701 -37.25013 -8.403750 567.972
## 79702 -37.24986 -8.403750 567.476
## 79703 -37.24958 -8.403750 567.335
## 79704 -37.24930 -8.403750 567.616
## 79705 -37.24902 -8.403750 568.640
## 79706 -37.24875 -8.403750 569.739
## 79707 -37.24847 -8.403750 570.756
## 79708 -37.24819 -8.403750 571.123
## 79709 -37.24791 -8.403750 571.387
## 79710 -37.24763 -8.403750 571.714
## 79711 -37.24736 -8.403750 572.343
## 79712 -37.24708 -8.403750 573.071
## 79713 -37.24680 -8.403750 573.646
## 79714 -37.24652 -8.403750 574.292
## 79715 -37.24625 -8.403750 574.971
## 79716 -37.24597 -8.403750 575.910
## 79717 -37.24569 -8.403750 577.417
## 79718 -37.24541 -8.403750 578.859
## 79719 -37.24513 -8.403750 579.858
## 79720 -37.24486 -8.403750 580.048
## 79721 -37.24458 -8.403750 579.931
## 79722 -37.24430 -8.403750 579.958
## 79723 -37.24402 -8.403750 580.311
## 79724 -37.24375 -8.403750 580.762
## 79725 -37.24347 -8.403750 581.194
## 79726 -37.24319 -8.403750 580.997
## 79727 -37.24291 -8.403750 580.789
## 79728 -37.24263 -8.403750 580.616
## 79729 -37.24236 -8.403750 580.636
## 79730 -37.24208 -8.403750 580.754
## 79731 -37.24180 -8.403750 580.785
## 79732 -37.24152 -8.403750 580.971
## 79733 -37.24125 -8.403750 581.279
## 79734 -37.24097 -8.403750 581.950
## 79735 -37.24069 -8.403750 583.332
## 79736 -37.24041 -8.403750 584.695
## 79737 -37.24013 -8.403750 585.578
## 79738 -37.23986 -8.403750 585.444
## 79739 -37.23958 -8.403750 584.893
## 79740 -37.23930 -8.403750 584.266
## 79741 -37.23902 -8.403750 583.813
## 79742 -37.23875 -8.403750 583.441
## 79743 -37.23847 -8.403750 583.059
## 79744 -37.23819 -8.403750 582.850
## 79745 -37.23791 -8.403750 582.538
## 79746 -37.23763 -8.403750 582.106
## 79747 -37.23736 -8.403750 581.496
## 79748 -37.23708 -8.403750 580.768
## 79749 -37.23680 -8.403750 580.113
## 79750 -37.23652 -8.403750 579.133
## 79751 -37.23625 -8.403750 578.192
## 79752 -37.23597 -8.403750 577.041
## 79753 -37.23569 -8.403750 575.924
## 79754 -37.23541 -8.403750 574.646
## 79755 -37.23513 -8.403750 573.358
## 79756 -37.23486 -8.403750 572.217
## 79757 -37.23458 -8.403750 571.194
## 79758 -37.23430 -8.403750 570.257
## 79759 -37.23402 -8.403750 569.588
## 79760 -37.23375 -8.403750 569.082
## 79761 -37.23347 -8.403750 569.054
## 79762 -37.23319 -8.403750 568.768
## 79763 -37.23291 -8.403750 568.927
## 79764 -37.23263 -8.403750 569.342
## 79765 -37.23236 -8.403750 569.993
## 79766 -37.23208 -8.403750 570.565
## 79767 -37.23180 -8.403750 570.542
## 79768 -37.23152 -8.403750 570.392
## 79769 -37.23125 -8.403750 569.712
## 79770 -37.23097 -8.403750 568.689
## 79771 -37.23069 -8.403750 567.973
## 79772 -37.23041 -8.403750 567.219
## 79773 -37.23013 -8.403750 566.718
## 79774 -37.22986 -8.403750 566.558
## 79775 -37.22958 -8.403750 566.514
## 79776 -37.22930 -8.403750 566.182
## 79777 -37.22902 -8.403750 565.867
## 79778 -37.22875 -8.403750 565.456
## 79779 -37.22847 -8.403750 565.282
## 79780 -37.22819 -8.403750 565.840
## 79781 -37.22791 -8.403750 566.504
## 80674 -37.35625 -8.404028 524.890
## 80675 -37.35597 -8.404028 524.465
## 80676 -37.35569 -8.404028 523.680
## 80677 -37.35541 -8.404028 523.087
## 80678 -37.35513 -8.404028 522.892
## 80679 -37.35486 -8.404028 523.232
## 80680 -37.35458 -8.404028 523.630
## 80681 -37.35430 -8.404028 524.033
## 80682 -37.35402 -8.404028 524.078
## 80683 -37.35375 -8.404028 523.756
## 80684 -37.35347 -8.404028 523.283
## 80685 -37.35319 -8.404028 522.565
## 80686 -37.35291 -8.404028 522.078
## 80687 -37.35263 -8.404028 521.799
## 80688 -37.35236 -8.404028 521.974
## 80689 -37.35208 -8.404028 522.250
## 80690 -37.35180 -8.404028 522.967
## 80691 -37.35152 -8.404028 523.475
## 80692 -37.35125 -8.404028 523.901
## 80693 -37.35097 -8.404028 524.378
## 80694 -37.35069 -8.404028 524.624
## 80695 -37.35041 -8.404028 525.026
## 80696 -37.35013 -8.404028 525.796
## 80697 -37.34986 -8.404028 526.504
## 80698 -37.34958 -8.404028 527.011
## 80699 -37.34930 -8.404028 527.518
## 80700 -37.34902 -8.404028 527.505
## 80701 -37.34875 -8.404028 527.385
## 80702 -37.34847 -8.404028 527.553
## 80703 -37.34819 -8.404028 528.136
## 80704 -37.34791 -8.404028 529.135
## 80705 -37.34763 -8.404028 529.953
## 80706 -37.34736 -8.404028 529.672
## 80707 -37.34708 -8.404028 528.948
## 80708 -37.34680 -8.404028 528.114
## 80709 -37.34652 -8.404028 527.639
## 80710 -37.34625 -8.404028 527.095
## 80711 -37.34597 -8.404028 526.746
## 80712 -37.34569 -8.404028 526.501
## 80713 -37.34541 -8.404028 526.703
## 80714 -37.34513 -8.404028 527.157
## 80715 -37.34486 -8.404028 527.234
## 80716 -37.34458 -8.404028 527.180
## 80717 -37.34430 -8.404028 526.959
## 80718 -37.34402 -8.404028 526.748
## 80719 -37.34375 -8.404028 526.348
## 80720 -37.34347 -8.404028 525.951
## 80721 -37.34319 -8.404028 525.389
## 80722 -37.34291 -8.404028 525.290
## 80723 -37.34263 -8.404028 525.249
## 80724 -37.34236 -8.404028 525.429
## 80725 -37.34208 -8.404028 525.813
## 80726 -37.34180 -8.404028 526.904
## 80727 -37.34152 -8.404028 528.231
## 80739 -37.33819 -8.404028 528.543
## 80740 -37.33791 -8.404028 528.491
## 80741 -37.33763 -8.404028 528.504
## 80742 -37.33736 -8.404028 528.501
## 80743 -37.33708 -8.404028 528.491
## 80744 -37.33680 -8.404028 528.524
## 80745 -37.33652 -8.404028 528.333
## 80746 -37.33625 -8.404028 528.049
## 80747 -37.33597 -8.404028 527.834
## 80748 -37.33569 -8.404028 527.856
## 80749 -37.33541 -8.404028 528.161
## 80750 -37.33513 -8.404028 528.552
## 80751 -37.33486 -8.404028 529.464
## 80752 -37.33458 -8.404028 530.318
## 80753 -37.33430 -8.404028 531.076
## 80754 -37.33402 -8.404028 531.135
## 80755 -37.33375 -8.404028 530.840
## 80756 -37.33347 -8.404028 530.463
## 80757 -37.33319 -8.404028 530.552
## 80758 -37.33291 -8.404028 530.569
## 80759 -37.33263 -8.404028 530.872
## 80760 -37.33236 -8.404028 531.379
## 80761 -37.33208 -8.404028 531.791
## 80762 -37.33180 -8.404028 532.299
## 80763 -37.33152 -8.404028 532.256
## 80764 -37.33125 -8.404028 532.315
## 80765 -37.33097 -8.404028 532.439
## 80766 -37.33069 -8.404028 532.742
## 80767 -37.33041 -8.404028 532.913
## 80768 -37.33013 -8.404028 533.132
## 80769 -37.32986 -8.404028 532.787
## 80770 -37.32958 -8.404028 532.508
## 80771 -37.32930 -8.404028 532.453
## 80772 -37.32902 -8.404028 532.636
## 80773 -37.32875 -8.404028 532.856
## 80774 -37.32847 -8.404028 533.237
## 80775 -37.32819 -8.404028 533.261
## 80776 -37.32791 -8.404028 533.398
## 80777 -37.32763 -8.404028 533.311
## 80778 -37.32736 -8.404028 533.336
## 80779 -37.32708 -8.404028 533.595
## 80780 -37.32680 -8.404028 534.199
## 80781 -37.32652 -8.404028 534.850
## 80782 -37.32625 -8.404028 535.287
## 80783 -37.32597 -8.404028 535.450
## 80784 -37.32569 -8.404028 535.303
## 80785 -37.32541 -8.404028 535.170
## 80786 -37.32513 -8.404028 535.030
## 80787 -37.32486 -8.404028 535.571
## 80788 -37.32458 -8.404028 536.430
## 80789 -37.32430 -8.404028 537.446
## 80790 -37.32402 -8.404028 538.836
## 80791 -37.32375 -8.404028 540.060
## 80792 -37.32347 -8.404028 540.856
## 80793 -37.32319 -8.404028 541.001
## 80794 -37.32291 -8.404028 540.771
## 80795 -37.32263 -8.404028 540.500
## 80796 -37.32236 -8.404028 540.114
## 80797 -37.32208 -8.404028 539.722
## 80798 -37.32180 -8.404028 539.347
## 80799 -37.32152 -8.404028 539.119
## 80800 -37.32125 -8.404028 539.050
## 80801 -37.32097 -8.404028 539.003
## 80802 -37.32069 -8.404028 538.536
## 80803 -37.32041 -8.404028 538.086
## 80804 -37.32013 -8.404028 537.584
## 80805 -37.31986 -8.404028 537.263
## 80806 -37.31958 -8.404028 537.048
## 80807 -37.31930 -8.404028 536.727
## 80808 -37.31902 -8.404028 536.982
## 80809 -37.31875 -8.404028 537.296
## 80810 -37.31847 -8.404028 537.997
## 80811 -37.31819 -8.404028 538.438
## 80812 -37.31791 -8.404028 538.856
## 80813 -37.31763 -8.404028 539.550
## 80814 -37.31736 -8.404028 540.542
## 80815 -37.31708 -8.404028 541.679
## 80816 -37.31680 -8.404028 543.010
## 80817 -37.31652 -8.404028 543.998
## 80818 -37.31625 -8.404028 544.873
## 80819 -37.31597 -8.404028 545.484
## 80820 -37.31569 -8.404028 545.463
## 80821 -37.31541 -8.404028 545.114
## 80822 -37.31513 -8.404028 544.659
## 80823 -37.31486 -8.404028 544.687
## 80824 -37.31458 -8.404028 544.733
## 80825 -37.31430 -8.404028 544.588
## 80826 -37.31402 -8.404028 544.091
## 80827 -37.31375 -8.404028 543.451
## 80828 -37.31347 -8.404028 542.760
## 80829 -37.31319 -8.404028 542.202
## 80830 -37.31291 -8.404028 541.735
## 80831 -37.31263 -8.404028 541.682
## 80832 -37.31236 -8.404028 541.666
## 80833 -37.31208 -8.404028 541.714
## 80834 -37.31180 -8.404028 541.071
## 80835 -37.31152 -8.404028 540.364
## 80836 -37.31125 -8.404028 539.711
## 80837 -37.31097 -8.404028 539.130
## 80838 -37.31069 -8.404028 539.077
## 80839 -37.31041 -8.404028 539.228
## 80840 -37.31013 -8.404028 539.726
## 80841 -37.30986 -8.404028 540.038
## 80842 -37.30958 -8.404028 540.404
## 80843 -37.30930 -8.404028 540.648
## 80844 -37.30902 -8.404028 541.295
## 80845 -37.30875 -8.404028 541.993
## 80846 -37.30847 -8.404028 542.507
## 80847 -37.30819 -8.404028 542.714
## 80848 -37.30791 -8.404028 542.696
## 80849 -37.30763 -8.404028 542.557
## 80850 -37.30736 -8.404028 542.085
## 80851 -37.30708 -8.404028 541.588
## 80852 -37.30680 -8.404028 541.152
## 80853 -37.30652 -8.404028 541.039
## 80854 -37.30625 -8.404028 541.378
## 80855 -37.30597 -8.404028 541.826
## 80856 -37.30569 -8.404028 542.779
## 80857 -37.30541 -8.404028 544.092
## 80858 -37.30513 -8.404028 545.388
## 80859 -37.30486 -8.404028 546.510
## 80860 -37.30458 -8.404028 547.359
## 80861 -37.30430 -8.404028 547.788
## 80862 -37.30402 -8.404028 547.744
## 80863 -37.30375 -8.404028 547.340
## 80864 -37.30347 -8.404028 546.629
## 80865 -37.30319 -8.404028 545.773
## 80866 -37.30291 -8.404028 545.104
## 80867 -37.30263 -8.404028 545.360
## 80868 -37.30236 -8.404028 546.846
## 80869 -37.30208 -8.404028 548.661
## 80870 -37.30180 -8.404028 549.985
## 80871 -37.30152 -8.404028 549.875
## 80872 -37.30125 -8.404028 549.283
## 80873 -37.30097 -8.404028 548.610
## 80874 -37.30069 -8.404028 548.309
## 80875 -37.30041 -8.404028 548.177
## 80876 -37.30013 -8.404028 548.020
## 80877 -37.29986 -8.404028 547.926
## 80878 -37.29958 -8.404028 547.800
## 80879 -37.29930 -8.404028 547.495
## 80880 -37.29902 -8.404028 547.083
## 80881 -37.29875 -8.404028 546.725
## 80882 -37.29847 -8.404028 546.917
## 80883 -37.29819 -8.404028 547.746
## 80884 -37.29791 -8.404028 548.649
## 80885 -37.29763 -8.404028 549.460
## 80886 -37.29736 -8.404028 549.330
## 80887 -37.29708 -8.404028 549.150
## 80888 -37.29680 -8.404028 549.008
## 80889 -37.29652 -8.404028 549.479
## 80890 -37.29625 -8.404028 550.368
## 80891 -37.29597 -8.404028 551.256
## 80892 -37.29569 -8.404028 551.142
## 80893 -37.29541 -8.404028 550.752
## 80894 -37.29513 -8.404028 550.156
## 80895 -37.29486 -8.404028 550.306
## 80896 -37.29458 -8.404028 550.515
## 80897 -37.29430 -8.404028 550.319
## 80898 -37.29402 -8.404028 549.578
## 80899 -37.29375 -8.404028 548.868
## 80900 -37.29347 -8.404028 548.487
## 80901 -37.29319 -8.404028 548.877
## 80902 -37.29291 -8.404028 549.410
## 80903 -37.29263 -8.404028 550.087
## 80904 -37.29236 -8.404028 550.527
## 80905 -37.29208 -8.404028 550.977
## 80906 -37.29180 -8.404028 551.298
## 80907 -37.29152 -8.404028 551.539
## 80908 -37.29125 -8.404028 551.755
## 80909 -37.29097 -8.404028 551.521
## 80910 -37.29069 -8.404028 551.338
## 80911 -37.29041 -8.404028 551.200
## 80912 -37.29013 -8.404028 550.843
## 80913 -37.28986 -8.404028 550.411
## 80914 -37.28958 -8.404028 549.898
## 80915 -37.28930 -8.404028 549.781
## 80916 -37.28902 -8.404028 549.953
## 80917 -37.28875 -8.404028 550.062
## 80918 -37.28847 -8.404028 550.540
## 80919 -37.28819 -8.404028 551.616
## 80920 -37.28791 -8.404028 552.874
## 80921 -37.28763 -8.404028 553.906
## 80922 -37.28736 -8.404028 554.320
## 80923 -37.28708 -8.404028 554.461
## 80924 -37.28680 -8.404028 554.384
## 80925 -37.28652 -8.404028 554.052
## 80926 -37.28625 -8.404028 553.724
## 80927 -37.28597 -8.404028 553.528
## 80928 -37.28569 -8.404028 554.085
## 80929 -37.28541 -8.404028 554.951
## 80930 -37.28513 -8.404028 556.673
## 80931 -37.28486 -8.404028 558.461
## 80932 -37.28458 -8.404028 560.455
## 80933 -37.28430 -8.404028 562.158
## 80934 -37.28402 -8.404028 564.068
## 80935 -37.28375 -8.404028 565.654
## 80936 -37.28347 -8.404028 566.519
## 80937 -37.28319 -8.404028 566.318
## 80938 -37.28291 -8.404028 565.766
## 80939 -37.28263 -8.404028 565.031
## 80940 -37.28236 -8.404028 564.610
## 80941 -37.28208 -8.404028 564.415
## 80942 -37.28180 -8.404028 564.623
## 80943 -37.28152 -8.404028 565.443
## 80944 -37.28125 -8.404028 566.393
## 80945 -37.28097 -8.404028 567.195
## 80946 -37.28069 -8.404028 567.512
## 80947 -37.28041 -8.404028 567.397
## 80948 -37.28013 -8.404028 566.756
## 80949 -37.27986 -8.404028 565.960
## 80950 -37.27958 -8.404028 565.008
## 80951 -37.27930 -8.404028 565.186
## 80952 -37.27902 -8.404028 565.361
## 80953 -37.27875 -8.404028 565.548
## 80954 -37.27847 -8.404028 565.985
## 80955 -37.27819 -8.404028 566.422
## 80956 -37.27791 -8.404028 566.784
## 80957 -37.27763 -8.404028 566.260
## 80958 -37.27736 -8.404028 565.054
## 80959 -37.27708 -8.404028 564.061
## 80960 -37.27680 -8.404028 564.058
## 80961 -37.27652 -8.404028 564.981
## 80962 -37.27625 -8.404028 565.896
## 80963 -37.27597 -8.404028 566.618
## 80964 -37.27569 -8.404028 566.817
## 80965 -37.27541 -8.404028 566.865
## 80966 -37.27513 -8.404028 566.519
## 80967 -37.27486 -8.404028 566.113
## 80968 -37.27458 -8.404028 565.818
## 80969 -37.27430 -8.404028 565.934
## 80970 -37.27402 -8.404028 566.452
## 80971 -37.27375 -8.404028 566.897
## 80972 -37.27347 -8.404028 567.068
## 80973 -37.27319 -8.404028 566.777
## 80974 -37.27291 -8.404028 566.320
## 80975 -37.27263 -8.404028 565.804
## 80976 -37.27236 -8.404028 565.265
## 80977 -37.27208 -8.404028 564.750
## 80978 -37.27180 -8.404028 564.229
## 80979 -37.27152 -8.404028 564.207
## 80980 -37.27125 -8.404028 564.242
## 80981 -37.27097 -8.404028 564.550
## 80982 -37.27069 -8.404028 564.795
## 80983 -37.27041 -8.404028 565.019
## 80984 -37.27013 -8.404028 565.231
## 80985 -37.26986 -8.404028 565.241
## 80986 -37.26958 -8.404028 565.103
## 80987 -37.26930 -8.404028 564.719
## 80988 -37.26902 -8.404028 564.226
## 80989 -37.26875 -8.404028 563.620
## 80990 -37.26847 -8.404028 562.844
## 80991 -37.26819 -8.404028 561.537
## 80992 -37.26791 -8.404028 560.463
## 80993 -37.26763 -8.404028 559.711
## 80994 -37.26736 -8.404028 559.996
## 80995 -37.26708 -8.404028 560.961
## 80996 -37.26680 -8.404028 562.506
## 80997 -37.26652 -8.404028 564.383
## 80998 -37.26625 -8.404028 565.820
## 80999 -37.26597 -8.404028 566.497
## 81000 -37.26569 -8.404028 565.832
## 81001 -37.26541 -8.404028 564.604
## 81002 -37.26513 -8.404028 563.020
## 81003 -37.26486 -8.404028 561.594
## 81004 -37.26458 -8.404028 560.422
## 81005 -37.26430 -8.404028 559.308
## 81006 -37.26402 -8.404028 558.213
## 81007 -37.26375 -8.404028 557.524
## 81008 -37.26347 -8.404028 556.792
## 81009 -37.26319 -8.404028 557.120
## 81010 -37.26291 -8.404028 557.715
## 81011 -37.26263 -8.404028 558.562
## 81012 -37.26236 -8.404028 558.986
## 81013 -37.26208 -8.404028 559.207
## 81014 -37.26180 -8.404028 559.168
## 81015 -37.26152 -8.404028 559.411
## 81016 -37.26125 -8.404028 559.288
## 81017 -37.26097 -8.404028 558.783
## 81018 -37.26069 -8.404028 558.220
## 81019 -37.26041 -8.404028 557.750
## 81020 -37.26013 -8.404028 557.183
## 81021 -37.25986 -8.404028 556.296
## 81022 -37.25958 -8.404028 555.257
## 81023 -37.25930 -8.404028 554.403
## 81024 -37.25902 -8.404028 553.823
## 81025 -37.25875 -8.404028 553.457
## 81026 -37.25847 -8.404028 553.146
## 81027 -37.25819 -8.404028 553.498
## 81028 -37.25791 -8.404028 554.102
## 81029 -37.25763 -8.404028 555.206
## 81030 -37.25736 -8.404028 556.502
## 81031 -37.25708 -8.404028 557.584
## 81032 -37.25680 -8.404028 558.815
## 81033 -37.25652 -8.404028 559.537
## 81034 -37.25625 -8.404028 560.153
## 81035 -37.25597 -8.404028 560.618
## 81036 -37.25569 -8.404028 561.251
## 81037 -37.25541 -8.404028 562.036
## 81038 -37.25513 -8.404028 562.670
## 81039 -37.25486 -8.404028 563.185
## 81040 -37.25458 -8.404028 563.764
## 81041 -37.25430 -8.404028 564.609
## 81042 -37.25402 -8.404028 565.900
## 81043 -37.25375 -8.404028 566.848
## 81044 -37.25347 -8.404028 567.596
## 81045 -37.25319 -8.404028 568.020
## 81046 -37.25291 -8.404028 568.406
## 81047 -37.25263 -8.404028 568.482
## 81048 -37.25236 -8.404028 568.468
## 81049 -37.25208 -8.404028 568.526
## 81050 -37.25180 -8.404028 568.955
## 81051 -37.25152 -8.404028 569.578
## 81052 -37.25125 -8.404028 569.965
## 81053 -37.25097 -8.404028 569.989
## 81054 -37.25069 -8.404028 569.399
## 81055 -37.25041 -8.404028 568.652
## 81056 -37.25013 -8.404028 567.847
## 81057 -37.24986 -8.404028 567.244
## 81058 -37.24958 -8.404028 566.987
## 81059 -37.24930 -8.404028 567.285
## 81060 -37.24902 -8.404028 568.195
## 81061 -37.24875 -8.404028 569.245
## 81062 -37.24847 -8.404028 570.161
## 81063 -37.24819 -8.404028 570.635
## 81064 -37.24791 -8.404028 570.978
## 81065 -37.24763 -8.404028 571.242
## 81066 -37.24736 -8.404028 571.891
## 81067 -37.24708 -8.404028 572.536
## 81068 -37.24680 -8.404028 573.330
## 81069 -37.24652 -8.404028 574.012
## 81070 -37.24625 -8.404028 574.862
## 81071 -37.24597 -8.404028 575.960
## 81072 -37.24569 -8.404028 577.816
## 81073 -37.24541 -8.404028 579.493
## 81074 -37.24513 -8.404028 580.695
## 81075 -37.24486 -8.404028 580.939
## 81076 -37.24458 -8.404028 580.695
## 81077 -37.24430 -8.404028 580.656
## 81078 -37.24402 -8.404028 581.003
## 81079 -37.24375 -8.404028 581.410
## 81080 -37.24347 -8.404028 581.685
## 81081 -37.24319 -8.404028 581.691
## 81082 -37.24291 -8.404028 581.677
## 81083 -37.24263 -8.404028 581.719
## 81084 -37.24236 -8.404028 581.881
## 81085 -37.24208 -8.404028 581.996
## 81086 -37.24180 -8.404028 582.288
## 81087 -37.24152 -8.404028 582.513
## 81088 -37.24125 -8.404028 582.790
## 81089 -37.24097 -8.404028 583.516
## 81090 -37.24069 -8.404028 584.775
## 81091 -37.24041 -8.404028 585.983
## 81092 -37.24013 -8.404028 586.677
## 81093 -37.23986 -8.404028 586.266
## 81094 -37.23958 -8.404028 585.635
## 81095 -37.23930 -8.404028 584.819
## 81096 -37.23902 -8.404028 584.293
## 81097 -37.23875 -8.404028 583.903
## 81098 -37.23847 -8.404028 583.705
## 81099 -37.23819 -8.404028 583.531
## 81100 -37.23791 -8.404028 583.190
## 81101 -37.23763 -8.404028 582.738
## 81102 -37.23736 -8.404028 581.887
## 81103 -37.23708 -8.404028 580.842
## 81104 -37.23680 -8.404028 579.580
## 81105 -37.23652 -8.404028 578.574
## 81106 -37.23625 -8.404028 577.576
## 81107 -37.23597 -8.404028 576.369
## 81108 -37.23569 -8.404028 575.152
## 81109 -37.23541 -8.404028 573.933
## 81110 -37.23513 -8.404028 573.037
## 81111 -37.23486 -8.404028 572.301
## 81112 -37.23458 -8.404028 571.566
## 81113 -37.23430 -8.404028 570.875
## 81114 -37.23402 -8.404028 570.208
## 81115 -37.23375 -8.404028 569.509
## 81116 -37.23347 -8.404028 568.821
## 81117 -37.23319 -8.404028 568.361
## 81118 -37.23291 -8.404028 568.407
## 81119 -37.23263 -8.404028 568.661
## 81120 -37.23236 -8.404028 569.413
## 81121 -37.23208 -8.404028 570.260
## 81122 -37.23180 -8.404028 571.057
## 81123 -37.23152 -8.404028 571.234
## 81124 -37.23125 -8.404028 570.918
## 81125 -37.23097 -8.404028 570.285
## 81126 -37.23069 -8.404028 569.620
## 81127 -37.23041 -8.404028 568.859
## 81128 -37.23013 -8.404028 568.173
## 81129 -37.22986 -8.404028 567.880
## 81130 -37.22958 -8.404028 567.710
## 81131 -37.22930 -8.404028 567.361
## 81132 -37.22902 -8.404028 566.876
## 81133 -37.22875 -8.404028 566.423
## 81134 -37.22847 -8.404028 566.557
## 81135 -37.22819 -8.404028 567.148
## 81136 -37.22791 -8.404028 567.850
## 81137 -37.22763 -8.404028 568.390
## 81138 -37.22736 -8.404028 568.142
## 81139 -37.22708 -8.404028 567.908
## 81140 -37.22680 -8.404028 567.448
## 82025 -37.35736 -8.404306 524.695
## 82026 -37.35708 -8.404306 524.776
## 82027 -37.35680 -8.404306 524.726
## 82028 -37.35652 -8.404306 524.552
## 82029 -37.35625 -8.404306 524.278
## 82030 -37.35597 -8.404306 523.740
## 82031 -37.35569 -8.404306 522.838
## 82032 -37.35541 -8.404306 522.169
## 82033 -37.35513 -8.404306 521.962
## 82034 -37.35486 -8.404306 522.574
## 82035 -37.35458 -8.404306 523.366
## 82036 -37.35430 -8.404306 524.058
## 82037 -37.35402 -8.404306 524.151
## 82038 -37.35375 -8.404306 523.994
## 82039 -37.35347 -8.404306 523.627
## 82040 -37.35319 -8.404306 523.097
## 82041 -37.35291 -8.404306 522.765
## 82042 -37.35263 -8.404306 522.647
## 82043 -37.35236 -8.404306 522.659
## 82044 -37.35208 -8.404306 522.836
## 82045 -37.35180 -8.404306 523.075
## 82046 -37.35152 -8.404306 523.997
## 82047 -37.35125 -8.404306 525.098
## 82048 -37.35097 -8.404306 526.082
## 82049 -37.35069 -8.404306 526.116
## 82050 -37.35041 -8.404306 526.458
## 82051 -37.35013 -8.404306 527.212
## 82052 -37.34986 -8.404306 528.282
## 82053 -37.34958 -8.404306 529.208
## 82054 -37.34930 -8.404306 529.932
## 82055 -37.34902 -8.404306 529.706
## 82056 -37.34875 -8.404306 529.594
## 82057 -37.34847 -8.404306 529.390
## 82058 -37.34819 -8.404306 529.375
## 82059 -37.34791 -8.404306 530.149
## 82060 -37.34763 -8.404306 530.677
## 82061 -37.34736 -8.404306 530.653
## 82062 -37.34708 -8.404306 530.109
## 82063 -37.34680 -8.404306 529.691
## 82064 -37.34652 -8.404306 528.864
## 82065 -37.34625 -8.404306 528.053
## 82066 -37.34597 -8.404306 527.482
## 82067 -37.34569 -8.404306 527.131
## 82068 -37.34541 -8.404306 527.321
## 82069 -37.34513 -8.404306 527.732
## 82070 -37.34486 -8.404306 528.138
## 82071 -37.34458 -8.404306 528.387
## 82072 -37.34430 -8.404306 528.584
## 82073 -37.34402 -8.404306 528.105
## 82074 -37.34375 -8.404306 527.444
## 82075 -37.34347 -8.404306 526.712
## 82076 -37.34319 -8.404306 525.741
## 82077 -37.34291 -8.404306 525.238
## 82078 -37.34263 -8.404306 524.763
## 82079 -37.34236 -8.404306 524.856
## 82080 -37.34208 -8.404306 524.995
## 82081 -37.34180 -8.404306 525.934
## 82082 -37.34152 -8.404306 527.016
## 82083 -37.34125 -8.404306 528.065
## 82084 -37.34097 -8.404306 528.911
## 82085 -37.34069 -8.404306 528.986
## 82088 -37.33986 -8.404306 528.313
## 82089 -37.33958 -8.404306 528.316
## 82090 -37.33930 -8.404306 527.959
## 82091 -37.33902 -8.404306 527.931
## 82092 -37.33875 -8.404306 527.929
## 82093 -37.33847 -8.404306 527.815
## 82094 -37.33819 -8.404306 527.466
## 82095 -37.33791 -8.404306 527.301
## 82096 -37.33763 -8.404306 527.213
## 82097 -37.33736 -8.404306 527.493
## 82098 -37.33708 -8.404306 527.714
## 82099 -37.33680 -8.404306 528.094
## 82100 -37.33652 -8.404306 528.044
## 82101 -37.33625 -8.404306 528.042
## 82102 -37.33597 -8.404306 527.928
## 82103 -37.33569 -8.404306 527.926
## 82104 -37.33541 -8.404306 528.108
## 82105 -37.33513 -8.404306 528.555
## 82106 -37.33486 -8.404306 529.387
## 82107 -37.33458 -8.404306 530.290
## 82108 -37.33430 -8.404306 531.065
## 82109 -37.33402 -8.404306 531.695
## 82110 -37.33375 -8.404306 531.971
## 82111 -37.33347 -8.404306 532.061
## 82112 -37.33319 -8.404306 532.543
## 82113 -37.33291 -8.404306 533.098
## 82114 -37.33263 -8.404306 533.650
## 82115 -37.33236 -8.404306 533.932
## 82116 -37.33208 -8.404306 534.102
## 82117 -37.33180 -8.404306 533.952
## 82118 -37.33152 -8.404306 533.840
## 82119 -37.33125 -8.404306 533.836
## 82120 -37.33097 -8.404306 533.887
## 82121 -37.33069 -8.404306 534.165
## 82122 -37.33041 -8.404306 534.422
## 82123 -37.33013 -8.404306 534.597
## 82124 -37.32986 -8.404306 534.220
## 82125 -37.32958 -8.404306 533.895
## 82126 -37.32930 -8.404306 533.649
## 82127 -37.32902 -8.404306 534.018
## 82128 -37.32875 -8.404306 534.519
## 82129 -37.32847 -8.404306 534.754
## 82130 -37.32819 -8.404306 533.906
## 82131 -37.32791 -8.404306 533.290
## 82132 -37.32763 -8.404306 532.708
## 82133 -37.32736 -8.404306 533.008
## 82134 -37.32708 -8.404306 533.374
## 82135 -37.32680 -8.404306 534.406
## 82136 -37.32652 -8.404306 535.138
## 82137 -37.32625 -8.404306 535.786
## 82138 -37.32597 -8.404306 536.117
## 82139 -37.32569 -8.404306 535.847
## 82140 -37.32541 -8.404306 535.628
## 82141 -37.32513 -8.404306 535.372
## 82142 -37.32486 -8.404306 535.981
## 82143 -37.32458 -8.404306 536.858
## 82144 -37.32430 -8.404306 538.055
## 82145 -37.32402 -8.404306 539.343
## 82146 -37.32375 -8.404306 540.296
## 82147 -37.32347 -8.404306 541.057
## 82148 -37.32319 -8.404306 541.518
## 82149 -37.32291 -8.404306 541.455
## 82150 -37.32263 -8.404306 541.421
## 82151 -37.32236 -8.404306 541.026
## 82152 -37.32208 -8.404306 540.678
## 82153 -37.32180 -8.404306 540.298
## 82154 -37.32152 -8.404306 540.007
## 82155 -37.32125 -8.404306 539.825
## 82156 -37.32097 -8.404306 539.700
## 82157 -37.32069 -8.404306 539.105
## 82158 -37.32041 -8.404306 538.686
## 82159 -37.32013 -8.404306 538.130
## 82160 -37.31986 -8.404306 538.061
## 82161 -37.31958 -8.404306 538.036
## 82162 -37.31930 -8.404306 537.947
## 82163 -37.31902 -8.404306 537.810
## 82164 -37.31875 -8.404306 537.999
## 82165 -37.31847 -8.404306 538.450
## 82166 -37.31819 -8.404306 539.032
## 82167 -37.31791 -8.404306 539.564
## 82168 -37.31763 -8.404306 540.338
## 82169 -37.31736 -8.404306 541.063
## 82170 -37.31708 -8.404306 542.098
## 82171 -37.31680 -8.404306 543.016
## 82172 -37.31652 -8.404306 544.263
## 82173 -37.31625 -8.404306 545.600
## 82174 -37.31597 -8.404306 546.433
## 82175 -37.31569 -8.404306 546.334
## 82176 -37.31541 -8.404306 546.148
## 82177 -37.31513 -8.404306 545.688
## 82178 -37.31486 -8.404306 545.636
## 82179 -37.31458 -8.404306 545.651
## 82180 -37.31430 -8.404306 545.478
## 82181 -37.31402 -8.404306 544.913
## 82182 -37.31375 -8.404306 544.109
## 82183 -37.31347 -8.404306 543.430
## 82184 -37.31319 -8.404306 542.858
## 82185 -37.31291 -8.404306 542.396
## 82186 -37.31263 -8.404306 542.317
## 82187 -37.31236 -8.404306 542.512
## 82188 -37.31208 -8.404306 542.800
## 82189 -37.31180 -8.404306 542.404
## 82190 -37.31152 -8.404306 541.391
## 82191 -37.31125 -8.404306 540.371
## 82192 -37.31097 -8.404306 539.502
## 82193 -37.31069 -8.404306 539.345
## 82194 -37.31041 -8.404306 539.554
## 82195 -37.31013 -8.404306 540.092
## 82196 -37.30986 -8.404306 540.590
## 82197 -37.30958 -8.404306 541.066
## 82198 -37.30930 -8.404306 541.681
## 82199 -37.30902 -8.404306 542.400
## 82200 -37.30875 -8.404306 543.036
## 82201 -37.30847 -8.404306 543.572
## 82202 -37.30819 -8.404306 543.674
## 82203 -37.30791 -8.404306 543.702
## 82204 -37.30763 -8.404306 543.527
## 82205 -37.30736 -8.404306 543.228
## 82206 -37.30708 -8.404306 542.889
## 82207 -37.30680 -8.404306 542.767
## 82208 -37.30652 -8.404306 542.178
## 82209 -37.30625 -8.404306 541.956
## 82210 -37.30597 -8.404306 541.950
## 82211 -37.30569 -8.404306 542.887
## 82212 -37.30541 -8.404306 544.182
## 82213 -37.30513 -8.404306 545.509
## 82214 -37.30486 -8.404306 546.617
## 82215 -37.30458 -8.404306 547.428
## 82216 -37.30430 -8.404306 547.995
## 82217 -37.30402 -8.404306 548.336
## 82218 -37.30375 -8.404306 548.322
## 82219 -37.30347 -8.404306 547.877
## 82220 -37.30319 -8.404306 547.205
## 82221 -37.30291 -8.404306 546.665
## 82222 -37.30263 -8.404306 547.046
## 82223 -37.30236 -8.404306 548.118
## 82224 -37.30208 -8.404306 549.314
## 82225 -37.30180 -8.404306 550.261
## 82226 -37.30152 -8.404306 550.359
## 82227 -37.30125 -8.404306 550.033
## 82228 -37.30097 -8.404306 549.506
## 82229 -37.30069 -8.404306 548.771
## 82230 -37.30041 -8.404306 548.425
## 82231 -37.30013 -8.404306 548.110
## 82232 -37.29986 -8.404306 548.369
## 82233 -37.29958 -8.404306 548.478
## 82234 -37.29930 -8.404306 548.517
## 82235 -37.29902 -8.404306 547.817
## 82236 -37.29875 -8.404306 547.267
## 82237 -37.29847 -8.404306 547.292
## 82238 -37.29819 -8.404306 548.295
## 82239 -37.29791 -8.404306 549.439
## 82240 -37.29763 -8.404306 550.310
## 82241 -37.29736 -8.404306 550.002
## 82242 -37.29708 -8.404306 549.680
## 82243 -37.29680 -8.404306 549.298
## 82244 -37.29652 -8.404306 549.700
## 82245 -37.29625 -8.404306 550.437
## 82246 -37.29597 -8.404306 551.280
## 82247 -37.29569 -8.404306 551.731
## 82248 -37.29541 -8.404306 551.747
## 82249 -37.29513 -8.404306 551.571
## 82250 -37.29486 -8.404306 551.293
## 82251 -37.29458 -8.404306 550.934
## 82252 -37.29430 -8.404306 550.419
## 82253 -37.29402 -8.404306 549.976
## 82254 -37.29375 -8.404306 549.437
## 82255 -37.29347 -8.404306 549.211
## 82256 -37.29319 -8.404306 549.389
## 82257 -37.29291 -8.404306 549.895
## 82258 -37.29263 -8.404306 550.681
## 82259 -37.29236 -8.404306 551.341
## 82260 -37.29208 -8.404306 551.973
## 82261 -37.29180 -8.404306 552.716
## 82262 -37.29152 -8.404306 552.902
## 82263 -37.29125 -8.404306 553.004
## 82264 -37.29097 -8.404306 552.686
## 82265 -37.29069 -8.404306 552.340
## 82266 -37.29041 -8.404306 551.978
## 82267 -37.29013 -8.404306 551.453
## 82268 -37.28986 -8.404306 551.051
## 82269 -37.28958 -8.404306 550.651
## 82270 -37.28930 -8.404306 550.470
## 82271 -37.28902 -8.404306 550.651
## 82272 -37.28875 -8.404306 550.882
## 82273 -37.28847 -8.404306 551.284
## 82274 -37.28819 -8.404306 551.756
## 82275 -37.28791 -8.404306 552.373
## 82276 -37.28763 -8.404306 552.855
## 82277 -37.28736 -8.404306 553.125
## 82278 -37.28708 -8.404306 553.142
## 82279 -37.28680 -8.404306 552.893
## 82280 -37.28652 -8.404306 552.891
## 82281 -37.28625 -8.404306 553.145
## 82282 -37.28597 -8.404306 553.155
## 82283 -37.28569 -8.404306 553.383
## 82284 -37.28541 -8.404306 554.175
## 82285 -37.28513 -8.404306 555.869
## 82286 -37.28486 -8.404306 557.957
## 82287 -37.28458 -8.404306 560.184
## 82288 -37.28430 -8.404306 562.267
## 82289 -37.28402 -8.404306 563.881
## 82290 -37.28375 -8.404306 565.191
## 82291 -37.28347 -8.404306 565.826
## 82292 -37.28319 -8.404306 565.548
## 82293 -37.28291 -8.404306 565.037
## 82294 -37.28263 -8.404306 564.266
## 82295 -37.28236 -8.404306 563.885
## 82296 -37.28208 -8.404306 563.695
## 82297 -37.28180 -8.404306 564.125
## 82298 -37.28152 -8.404306 564.778
## 82299 -37.28125 -8.404306 565.456
## 82300 -37.28097 -8.404306 566.265
## 82301 -37.28069 -8.404306 567.189
## 82302 -37.28041 -8.404306 567.573
## 82303 -37.28013 -8.404306 567.284
## 82304 -37.27986 -8.404306 566.381
## 82305 -37.27958 -8.404306 565.367
## 82306 -37.27930 -8.404306 565.320
## 82307 -37.27902 -8.404306 565.861
## 82308 -37.27875 -8.404306 566.568
## 82309 -37.27847 -8.404306 567.191
## 82310 -37.27819 -8.404306 567.112
## 82311 -37.27791 -8.404306 567.119
## 82312 -37.27763 -8.404306 566.202
## 82313 -37.27736 -8.404306 565.347
## 82314 -37.27708 -8.404306 564.364
## 82315 -37.27680 -8.404306 564.757
## 82316 -37.27652 -8.404306 565.355
## 82317 -37.27625 -8.404306 566.159
## 82318 -37.27597 -8.404306 566.619
## 82319 -37.27569 -8.404306 566.771
## 82320 -37.27541 -8.404306 566.637
## 82321 -37.27513 -8.404306 566.194
## 82322 -37.27486 -8.404306 565.938
## 82323 -37.27458 -8.404306 565.844
## 82324 -37.27430 -8.404306 566.129
## 82325 -37.27402 -8.404306 566.648
## 82326 -37.27375 -8.404306 567.121
## 82327 -37.27347 -8.404306 567.397
## 82328 -37.27319 -8.404306 567.018
## 82329 -37.27291 -8.404306 566.606
## 82330 -37.27263 -8.404306 566.071
## 82331 -37.27236 -8.404306 566.023
## 82332 -37.27208 -8.404306 565.952
## 82333 -37.27180 -8.404306 565.958
## 82334 -37.27152 -8.404306 565.645
## 82335 -37.27125 -8.404306 565.577
## 82336 -37.27097 -8.404306 565.778
## 82337 -37.27069 -8.404306 566.088
## 82338 -37.27041 -8.404306 566.306
## 82339 -37.27013 -8.404306 566.349
## 82340 -37.26986 -8.404306 566.290
## 82341 -37.26958 -8.404306 566.109
## 82342 -37.26930 -8.404306 565.686
## 82343 -37.26902 -8.404306 564.818
## 82344 -37.26875 -8.404306 563.787
## 82345 -37.26847 -8.404306 562.833
## 82346 -37.26819 -8.404306 561.667
## 82347 -37.26791 -8.404306 560.661
## 82348 -37.26763 -8.404306 559.904
## 82349 -37.26736 -8.404306 560.359
## 82350 -37.26708 -8.404306 561.534
## 82351 -37.26680 -8.404306 563.175
## 82352 -37.26652 -8.404306 564.888
## 82353 -37.26625 -8.404306 566.103
## 82354 -37.26597 -8.404306 566.787
## 82355 -37.26569 -8.404306 566.125
## 82356 -37.26541 -8.404306 564.658
## 82357 -37.26513 -8.404306 563.019
## 82358 -37.26486 -8.404306 561.766
## 82359 -37.26458 -8.404306 560.688
## 82360 -37.26430 -8.404306 559.769
## 82361 -37.26402 -8.404306 558.793
## 82362 -37.26375 -8.404306 557.982
## 82363 -37.26347 -8.404306 557.260
## 82364 -37.26319 -8.404306 557.260
## 82365 -37.26291 -8.404306 557.502
## 82366 -37.26263 -8.404306 558.160
## 82367 -37.26236 -8.404306 559.112
## 82368 -37.26208 -8.404306 559.658
## 82369 -37.26180 -8.404306 560.565
## 82370 -37.26152 -8.404306 560.392
## 82371 -37.26125 -8.404306 559.726
## 82372 -37.26097 -8.404306 558.844
## 82373 -37.26069 -8.404306 558.339
## 82374 -37.26041 -8.404306 557.680
## 82375 -37.26013 -8.404306 557.185
## 82376 -37.25986 -8.404306 556.331
## 82377 -37.25958 -8.404306 555.410
## 82378 -37.25930 -8.404306 554.580
## 82379 -37.25902 -8.404306 553.886
## 82380 -37.25875 -8.404306 553.515
## 82381 -37.25847 -8.404306 553.104
## 82382 -37.25819 -8.404306 553.513
## 82383 -37.25791 -8.404306 554.335
## 82384 -37.25763 -8.404306 555.575
## 82385 -37.25736 -8.404306 557.005
## 82386 -37.25708 -8.404306 558.269
## 82387 -37.25680 -8.404306 559.598
## 82388 -37.25652 -8.404306 560.292
## 82389 -37.25625 -8.404306 560.709
## 82390 -37.25597 -8.404306 561.179
## 82391 -37.25569 -8.404306 561.987
## 82392 -37.25541 -8.404306 562.974
## 82393 -37.25513 -8.404306 563.574
## 82394 -37.25486 -8.404306 564.254
## 82395 -37.25458 -8.404306 564.910
## 82396 -37.25430 -8.404306 565.752
## 82397 -37.25402 -8.404306 566.680
## 82398 -37.25375 -8.404306 567.039
## 82399 -37.25347 -8.404306 567.504
## 82400 -37.25319 -8.404306 568.102
## 82401 -37.25291 -8.404306 568.363
## 82402 -37.25263 -8.404306 568.446
## 82403 -37.25236 -8.404306 568.600
## 82404 -37.25208 -8.404306 568.868
## 82405 -37.25180 -8.404306 569.420
## 82406 -37.25152 -8.404306 569.957
## 82407 -37.25125 -8.404306 570.270
## 82408 -37.25097 -8.404306 570.271
## 82409 -37.25069 -8.404306 569.759
## 82410 -37.25041 -8.404306 568.947
## 82411 -37.25013 -8.404306 568.071
## 82412 -37.24986 -8.404306 567.525
## 82413 -37.24958 -8.404306 567.234
## 82414 -37.24930 -8.404306 567.493
## 82415 -37.24902 -8.404306 568.153
## 82416 -37.24875 -8.404306 568.931
## 82417 -37.24847 -8.404306 569.797
## 82418 -37.24819 -8.404306 570.500
## 82419 -37.24791 -8.404306 570.910
## 82420 -37.24763 -8.404306 571.260
## 82421 -37.24736 -8.404306 571.794
## 82422 -37.24708 -8.404306 572.408
## 82423 -37.24680 -8.404306 573.167
## 82424 -37.24652 -8.404306 573.877
## 82425 -37.24625 -8.404306 574.878
## 82426 -37.24597 -8.404306 576.128
## 82427 -37.24569 -8.404306 578.313
## 82428 -37.24541 -8.404306 580.529
## 82429 -37.24513 -8.404306 582.018
## 82430 -37.24486 -8.404306 582.060
## 82431 -37.24458 -8.404306 581.648
## 82432 -37.24430 -8.404306 581.462
## 82433 -37.24402 -8.404306 581.748
## 82434 -37.24375 -8.404306 581.995
## 82435 -37.24347 -8.404306 582.223
## 82436 -37.24319 -8.404306 582.476
## 82437 -37.24291 -8.404306 582.660
## 82438 -37.24263 -8.404306 582.797
## 82439 -37.24236 -8.404306 583.170
## 82440 -37.24208 -8.404306 583.556
## 82441 -37.24180 -8.404306 583.839
## 82442 -37.24152 -8.404306 584.045
## 82443 -37.24125 -8.404306 584.355
## 82444 -37.24097 -8.404306 585.017
## 82445 -37.24069 -8.404306 585.733
## 82446 -37.24041 -8.404306 586.417
## 82447 -37.24013 -8.404306 586.801
## 82448 -37.23986 -8.404306 586.419
## 82449 -37.23958 -8.404306 585.774
## 82450 -37.23930 -8.404306 584.920
## 82451 -37.23902 -8.404306 584.574
## 82452 -37.23875 -8.404306 584.451
## 82453 -37.23847 -8.404306 584.364
## 82454 -37.23819 -8.404306 584.108
## 82455 -37.23791 -8.404306 583.635
## 82456 -37.23763 -8.404306 583.083
## 82457 -37.23736 -8.404306 581.961
## 82458 -37.23708 -8.404306 580.723
## 82459 -37.23680 -8.404306 579.164
## 82460 -37.23652 -8.404306 578.008
## 82461 -37.23625 -8.404306 576.953
## 82462 -37.23597 -8.404306 575.673
## 82463 -37.23569 -8.404306 574.543
## 82464 -37.23541 -8.404306 573.365
## 82465 -37.23513 -8.404306 572.562
## 82466 -37.23486 -8.404306 571.954
## 82467 -37.23458 -8.404306 571.312
## 82468 -37.23430 -8.404306 570.868
## 82469 -37.23402 -8.404306 570.068
## 82470 -37.23375 -8.404306 569.306
## 82471 -37.23347 -8.404306 568.457
## 82472 -37.23319 -8.404306 567.813
## 82473 -37.23291 -8.404306 567.871
## 82474 -37.23263 -8.404306 568.113
## 82475 -37.23236 -8.404306 569.124
## 82476 -37.23208 -8.404306 570.296
## 82477 -37.23180 -8.404306 571.351
## 82478 -37.23152 -8.404306 571.954
## 82479 -37.23125 -8.404306 572.028
## 82480 -37.23097 -8.404306 571.810
## 82481 -37.23069 -8.404306 571.041
## 82482 -37.23041 -8.404306 570.099
## 82483 -37.23013 -8.404306 569.249
## 82484 -37.22986 -8.404306 569.037
## 82485 -37.22958 -8.404306 568.928
## 82486 -37.22930 -8.404306 568.549
## 82487 -37.22902 -8.404306 567.950
## 82488 -37.22875 -8.404306 567.380
## 82489 -37.22847 -8.404306 567.530
## 82490 -37.22819 -8.404306 568.061
## 82491 -37.22791 -8.404306 568.707
## 82492 -37.22763 -8.404306 569.298
## 82493 -37.22736 -8.404306 569.254
## 82494 -37.22708 -8.404306 569.210
## 82495 -37.22680 -8.404306 569.054
## 82496 -37.22652 -8.404306 568.942
## 82497 -37.22625 -8.404306 568.937
## 82498 -37.22597 -8.404306 568.818
## 83375 -37.35875 -8.404583 524.422
## 83376 -37.35847 -8.404583 524.339
## 83377 -37.35819 -8.404583 524.242
## 83378 -37.35791 -8.404583 524.098
## 83379 -37.35763 -8.404583 524.145
## 83380 -37.35736 -8.404583 524.110
## 83381 -37.35708 -8.404583 524.251
## 83382 -37.35680 -8.404583 524.361
## 83383 -37.35652 -8.404583 524.347
## 83384 -37.35625 -8.404583 524.178
## 83385 -37.35597 -8.404583 524.025
## 83386 -37.35569 -8.404583 523.147
## 83387 -37.35541 -8.404583 522.573
## 83388 -37.35513 -8.404583 522.404
## 83389 -37.35486 -8.404583 523.119
## 83390 -37.35458 -8.404583 524.063
## 83391 -37.35430 -8.404583 524.860
## 83392 -37.35402 -8.404583 525.107
## 83393 -37.35375 -8.404583 525.085
## 83394 -37.35347 -8.404583 524.887
## 83395 -37.35319 -8.404583 524.685
## 83396 -37.35291 -8.404583 524.468
## 83397 -37.35263 -8.404583 524.265
## 83398 -37.35236 -8.404583 524.003
## 83399 -37.35208 -8.404583 523.941
## 83400 -37.35180 -8.404583 524.204
## 83401 -37.35152 -8.404583 525.185
## 83402 -37.35125 -8.404583 526.378
## 83403 -37.35097 -8.404583 527.298
## 83404 -37.35069 -8.404583 527.866
## 83405 -37.35041 -8.404583 528.150
## 83406 -37.35013 -8.404583 528.609
## 83407 -37.34986 -8.404583 529.661
## 83408 -37.34958 -8.404583 530.744
## 83409 -37.34930 -8.404583 531.477
## 83410 -37.34902 -8.404583 531.468
## 83411 -37.34875 -8.404583 531.257
## 83412 -37.34847 -8.404583 531.196
## 83413 -37.34819 -8.404583 531.378
## 83414 -37.34791 -8.404583 531.753
## 83415 -37.34763 -8.404583 532.011
## 83416 -37.34736 -8.404583 531.959
## 83417 -37.34708 -8.404583 531.621
## 83418 -37.34680 -8.404583 530.994
## 83419 -37.34652 -8.404583 530.074
## 83420 -37.34625 -8.404583 529.161
## 83421 -37.34597 -8.404583 528.469
## 83422 -37.34569 -8.404583 528.164
## 83423 -37.34541 -8.404583 528.211
## 83424 -37.34513 -8.404583 528.533
## 83425 -37.34486 -8.404583 529.114
## 83426 -37.34458 -8.404583 529.616
## 83427 -37.34430 -8.404583 529.755
## 83428 -37.34402 -8.404583 529.246
## 83429 -37.34375 -8.404583 528.435
## 83430 -37.34347 -8.404583 527.604
## 83431 -37.34319 -8.404583 526.617
## 83432 -37.34291 -8.404583 525.870
## 83433 -37.34263 -8.404583 525.314
## 83434 -37.34236 -8.404583 525.016
## 83435 -37.34208 -8.404583 524.999
## 83436 -37.34180 -8.404583 525.332
## 83437 -37.34152 -8.404583 526.073
## 83438 -37.34125 -8.404583 526.872
## 83439 -37.34097 -8.404583 527.531
## 83440 -37.34069 -8.404583 527.657
## 83441 -37.34041 -8.404583 527.572
## 83442 -37.34013 -8.404583 527.389
## 83443 -37.33986 -8.404583 527.302
## 83444 -37.33958 -8.404583 527.241
## 83445 -37.33930 -8.404583 527.208
## 83446 -37.33902 -8.404583 527.254
## 83447 -37.33875 -8.404583 527.309
## 83448 -37.33847 -8.404583 527.281
## 83449 -37.33819 -8.404583 527.132
## 83450 -37.33791 -8.404583 526.978
## 83451 -37.33763 -8.404583 526.992
## 83452 -37.33736 -8.404583 527.343
## 83453 -37.33708 -8.404583 527.790
## 83454 -37.33680 -8.404583 528.204
## 83455 -37.33652 -8.404583 528.483
## 83456 -37.33625 -8.404583 528.677
## 83457 -37.33597 -8.404583 528.808
## 83458 -37.33569 -8.404583 528.853
## 83459 -37.33541 -8.404583 528.993
## 83460 -37.33513 -8.404583 529.342
## 83461 -37.33486 -8.404583 530.058
## 83462 -37.33458 -8.404583 530.913
## 83463 -37.33430 -8.404583 531.782
## 83464 -37.33402 -8.404583 532.542
## 83465 -37.33375 -8.404583 533.288
## 83466 -37.33347 -8.404583 534.046
## 83467 -37.33319 -8.404583 534.979
## 83468 -37.33291 -8.404583 535.809
## 83469 -37.33263 -8.404583 536.370
## 83470 -37.33236 -8.404583 536.352
## 83471 -37.33208 -8.404583 536.081
## 83472 -37.33180 -8.404583 535.792
## 83473 -37.33152 -8.404583 535.430
## 83474 -37.33125 -8.404583 535.243
## 83475 -37.33097 -8.404583 535.153
## 83476 -37.33069 -8.404583 535.231
## 83477 -37.33041 -8.404583 535.315
## 83478 -37.33013 -8.404583 535.298
## 83479 -37.32986 -8.404583 534.980
## 83480 -37.32958 -8.404583 534.683
## 83481 -37.32930 -8.404583 534.645
## 83482 -37.32902 -8.404583 535.125
## 83483 -37.32875 -8.404583 535.555
## 83484 -37.32847 -8.404583 535.658
## 83485 -37.32819 -8.404583 534.710
## 83486 -37.32791 -8.404583 533.644
## 83487 -37.32763 -8.404583 532.908
## 83488 -37.32736 -8.404583 533.107
## 83489 -37.32708 -8.404583 533.742
## 83490 -37.32680 -8.404583 534.620
## 83491 -37.32652 -8.404583 535.514
## 83492 -37.32625 -8.404583 536.256
## 83493 -37.32597 -8.404583 536.698
## 83494 -37.32569 -8.404583 536.531
## 83495 -37.32541 -8.404583 536.251
## 83496 -37.32513 -8.404583 536.148
## 83497 -37.32486 -8.404583 536.660
## 83498 -37.32458 -8.404583 537.481
## 83499 -37.32430 -8.404583 538.502
## 83500 -37.32402 -8.404583 539.488
## 83501 -37.32375 -8.404583 540.378
## 83502 -37.32347 -8.404583 541.081
## 83503 -37.32319 -8.404583 541.487
## 83504 -37.32291 -8.404583 541.641
## 83505 -37.32263 -8.404583 541.600
## 83506 -37.32236 -8.404583 541.431
## 83507 -37.32208 -8.404583 541.196
## 83508 -37.32180 -8.404583 540.956
## 83509 -37.32152 -8.404583 540.756
## 83510 -37.32125 -8.404583 540.560
## 83511 -37.32097 -8.404583 540.340
## 83512 -37.32069 -8.404583 540.004
## 83513 -37.32041 -8.404583 539.717
## 83514 -37.32013 -8.404583 539.583
## 83515 -37.31986 -8.404583 539.732
## 83516 -37.31958 -8.404583 539.938
## 83517 -37.31930 -8.404583 540.029
## 83518 -37.31902 -8.404583 539.851
## 83519 -37.31875 -8.404583 539.643
## 83520 -37.31847 -8.404583 539.550
## 83521 -37.31819 -8.404583 539.789
## 83522 -37.31791 -8.404583 540.208
## 83523 -37.31763 -8.404583 540.754
## 83524 -37.31736 -8.404583 541.255
## 83525 -37.31708 -8.404583 541.966
## 83526 -37.31680 -8.404583 542.927
## 83527 -37.31652 -8.404583 544.519
## 83528 -37.31625 -8.404583 546.077
## 83529 -37.31597 -8.404583 547.238
## 83530 -37.31569 -8.404583 547.455
## 83531 -37.31541 -8.404583 547.239
## 83532 -37.31513 -8.404583 546.889
## 83533 -37.31486 -8.404583 546.852
## 83534 -37.31458 -8.404583 546.796
## 83535 -37.31430 -8.404583 546.541
## 83536 -37.31402 -8.404583 545.865
## 83537 -37.31375 -8.404583 545.055
## 83538 -37.31347 -8.404583 544.227
## 83539 -37.31319 -8.404583 543.527
## 83540 -37.31291 -8.404583 543.031
## 83541 -37.31263 -8.404583 542.867
## 83542 -37.31236 -8.404583 543.238
## 83543 -37.31208 -8.404583 543.590
## 83544 -37.31180 -8.404583 543.480
## 83545 -37.31152 -8.404583 542.535
## 83546 -37.31125 -8.404583 541.381
## 83547 -37.31097 -8.404583 540.356
## 83548 -37.31069 -8.404583 540.021
## 83549 -37.31041 -8.404583 540.081
## 83550 -37.31013 -8.404583 540.473
## 83551 -37.30986 -8.404583 541.033
## 83552 -37.30958 -8.404583 541.751
## 83553 -37.30930 -8.404583 542.544
## 83554 -37.30902 -8.404583 543.338
## 83555 -37.30875 -8.404583 543.988
## 83556 -37.30847 -8.404583 544.404
## 83557 -37.30819 -8.404583 544.519
## 83558 -37.30791 -8.404583 544.416
## 83559 -37.30763 -8.404583 544.191
## 83560 -37.30736 -8.404583 543.999
## 83561 -37.30708 -8.404583 543.762
## 83562 -37.30680 -8.404583 543.401
## 83563 -37.30652 -8.404583 542.819
## 83564 -37.30625 -8.404583 542.436
## 83565 -37.30597 -8.404583 542.434
## 83566 -37.30569 -8.404583 543.235
## 83567 -37.30541 -8.404583 544.395
## 83568 -37.30513 -8.404583 545.715
## 83569 -37.30486 -8.404583 546.902
## 83570 -37.30458 -8.404583 547.948
## 83571 -37.30430 -8.404583 548.846
## 83572 -37.30402 -8.404583 549.302
## 83573 -37.30375 -8.404583 549.499
## 83574 -37.30347 -8.404583 549.336
## 83575 -37.30319 -8.404583 548.774
## 83576 -37.30291 -8.404583 548.283
## 83577 -37.30263 -8.404583 548.233
## 83578 -37.30236 -8.404583 548.933
## 83579 -37.30208 -8.404583 549.878
## 83580 -37.30180 -8.404583 550.628
## 83581 -37.30152 -8.404583 550.766
## 83582 -37.30125 -8.404583 550.549
## 83583 -37.30097 -8.404583 550.099
## 83584 -37.30069 -8.404583 549.541
## 83585 -37.30041 -8.404583 549.072
## 83586 -37.30013 -8.404583 548.862
## 83587 -37.29986 -8.404583 549.184
## 83588 -37.29958 -8.404583 549.504
## 83589 -37.29930 -8.404583 549.444
## 83590 -37.29902 -8.404583 548.669
## 83591 -37.29875 -8.404583 547.910
## 83592 -37.29847 -8.404583 547.574
## 83593 -37.29819 -8.404583 548.463
## 83594 -37.29791 -8.404583 549.595
## 83595 -37.29763 -8.404583 550.435
## 83596 -37.29736 -8.404583 550.209
## 83597 -37.29708 -8.404583 549.774
## 83598 -37.29680 -8.404583 549.352
## 83599 -37.29652 -8.404583 550.027
## 83600 -37.29625 -8.404583 550.898
## 83601 -37.29597 -8.404583 551.809
## 83602 -37.29569 -8.404583 552.456
## 83603 -37.29541 -8.404583 552.860
## 83604 -37.29513 -8.404583 552.983
## 83605 -37.29486 -8.404583 552.765
## 83606 -37.29458 -8.404583 552.331
## 83607 -37.29430 -8.404583 551.755
## 83608 -37.29402 -8.404583 551.145
## 83609 -37.29375 -8.404583 550.578
## 83610 -37.29347 -8.404583 550.208
## 83611 -37.29319 -8.404583 550.173
## 83612 -37.29291 -8.404583 550.472
## 83613 -37.29263 -8.404583 551.099
## 83614 -37.29236 -8.404583 552.012
## 83615 -37.29208 -8.404583 552.971
## 83616 -37.29180 -8.404583 553.733
## 83617 -37.29152 -8.404583 554.083
## 83618 -37.29125 -8.404583 554.147
## 83619 -37.29097 -8.404583 553.967
## 83620 -37.29069 -8.404583 553.668
## 83621 -37.29041 -8.404583 553.245
## 83622 -37.29013 -8.404583 552.745
## 83623 -37.28986 -8.404583 552.266
## 83624 -37.28958 -8.404583 551.862
## 83625 -37.28930 -8.404583 551.591
## 83626 -37.28902 -8.404583 551.606
## 83627 -37.28875 -8.404583 551.770
## 83628 -37.28847 -8.404583 552.037
## 83629 -37.28819 -8.404583 552.223
## 83630 -37.28791 -8.404583 552.365
## 83631 -37.28763 -8.404583 552.434
## 83632 -37.28736 -8.404583 552.429
## 83633 -37.28708 -8.404583 552.391
## 83634 -37.28680 -8.404583 552.431
## 83635 -37.28652 -8.404583 552.702
## 83636 -37.28625 -8.404583 553.071
## 83637 -37.28597 -8.404583 553.490
## 83638 -37.28569 -8.404583 553.771
## 83639 -37.28541 -8.404583 554.324
## 83640 -37.28513 -8.404583 555.406
## 83641 -37.28486 -8.404583 557.269
## 83642 -37.28458 -8.404583 559.414
## 83643 -37.28430 -8.404583 561.487
## 83644 -37.28402 -8.404583 563.135
## 83645 -37.28375 -8.404583 564.318
## 83646 -37.28347 -8.404583 564.904
## 83647 -37.28319 -8.404583 564.748
## 83648 -37.28291 -8.404583 564.238
## 83649 -37.28263 -8.404583 563.673
## 83650 -37.28236 -8.404583 563.394
## 83651 -37.28208 -8.404583 563.367
## 83652 -37.28180 -8.404583 563.629
## 83653 -37.28152 -8.404583 564.148
## 83654 -37.28125 -8.404583 564.850
## 83655 -37.28097 -8.404583 565.651
## 83656 -37.28069 -8.404583 566.596
## 83657 -37.28041 -8.404583 567.282
## 83658 -37.28013 -8.404583 567.432
## 83659 -37.27986 -8.404583 566.668
## 83660 -37.27958 -8.404583 565.803
## 83661 -37.27930 -8.404583 565.443
## 83662 -37.27902 -8.404583 566.041
## 83663 -37.27875 -8.404583 566.913
## 83664 -37.27847 -8.404583 567.712
## 83665 -37.27819 -8.404583 567.839
## 83666 -37.27791 -8.404583 567.638
## 83667 -37.27763 -8.404583 567.134
## 83668 -37.27736 -8.404583 566.471
## 83669 -37.27708 -8.404583 565.855
## 83670 -37.27680 -8.404583 565.590
## 83671 -37.27652 -8.404583 565.850
## 83672 -37.27625 -8.404583 566.296
## 83673 -37.27597 -8.404583 566.740
## 83674 -37.27569 -8.404583 566.760
## 83675 -37.27541 -8.404583 566.657
## 83676 -37.27513 -8.404583 566.500
## 83677 -37.27486 -8.404583 566.438
## 83678 -37.27458 -8.404583 566.499
## 83679 -37.27430 -8.404583 566.786
## 83680 -37.27402 -8.404583 567.325
## 83681 -37.27375 -8.404583 567.844
## 83682 -37.27347 -8.404583 568.144
## 83683 -37.27319 -8.404583 567.881
## 83684 -37.27291 -8.404583 567.469
## 83685 -37.27263 -8.404583 567.153
## 83686 -37.27236 -8.404583 567.273
## 83687 -37.27208 -8.404583 567.473
## 83688 -37.27180 -8.404583 567.541
## 83689 -37.27152 -8.404583 567.301
## 83690 -37.27125 -8.404583 567.020
## 83691 -37.27097 -8.404583 566.826
## 83692 -37.27069 -8.404583 566.889
## 83693 -37.27041 -8.404583 566.985
## 83694 -37.27013 -8.404583 566.985
## 83695 -37.26986 -8.404583 566.769
## 83696 -37.26958 -8.404583 566.341
## 83697 -37.26930 -8.404583 565.676
## 83698 -37.26902 -8.404583 564.778
## 83699 -37.26875 -8.404583 563.710
## 83700 -37.26847 -8.404583 562.586
## 83701 -37.26819 -8.404583 561.424
## 83702 -37.26791 -8.404583 560.593
## 83703 -37.26763 -8.404583 560.375
## 83704 -37.26736 -8.404583 561.048
## 83705 -37.26708 -8.404583 562.254
## 83706 -37.26680 -8.404583 563.763
## 83707 -37.26652 -8.404583 565.277
## 83708 -37.26625 -8.404583 566.371
## 83709 -37.26597 -8.404583 566.736
## 83710 -37.26569 -8.404583 565.833
## 83711 -37.26541 -8.404583 564.398
## 83712 -37.26513 -8.404583 562.856
## 83713 -37.26486 -8.404583 561.740
## 83714 -37.26458 -8.404583 560.793
## 83715 -37.26430 -8.404583 559.933
## 83716 -37.26402 -8.404583 559.072
## 83717 -37.26375 -8.404583 558.390
## 83718 -37.26347 -8.404583 557.940
## 83719 -37.26319 -8.404583 557.767
## 83720 -37.26291 -8.404583 557.926
## 83721 -37.26263 -8.404583 558.486
## 83722 -37.26236 -8.404583 559.580
## 83723 -37.26208 -8.404583 560.608
## 83724 -37.26180 -8.404583 561.520
## 83725 -37.26152 -8.404583 560.866
## 83726 -37.26125 -8.404583 560.032
## 83727 -37.26097 -8.404583 559.063
## 83728 -37.26069 -8.404583 558.395
## 83729 -37.26041 -8.404583 557.791
## 83730 -37.26013 -8.404583 557.175
## 83731 -37.25986 -8.404583 556.448
## 83732 -37.25958 -8.404583 555.683
## 83733 -37.25930 -8.404583 554.918
## 83734 -37.25902 -8.404583 554.230
## 83735 -37.25875 -8.404583 553.784
## 83736 -37.25847 -8.404583 553.702
## 83737 -37.25819 -8.404583 554.193
## 83738 -37.25791 -8.404583 555.050
## 83739 -37.25763 -8.404583 556.171
## 83740 -37.25736 -8.404583 557.419
## 83741 -37.25708 -8.404583 558.628
## 83742 -37.25680 -8.404583 559.608
## 83743 -37.25652 -8.404583 560.193
## 83744 -37.25625 -8.404583 560.710
## 83745 -37.25597 -8.404583 561.323
## 83746 -37.25569 -8.404583 562.366
## 83747 -37.25541 -8.404583 563.495
## 83748 -37.25513 -8.404583 564.547
## 83749 -37.25486 -8.404583 565.423
## 83750 -37.25458 -8.404583 566.125
## 83751 -37.25430 -8.404583 566.548
## 83752 -37.25402 -8.404583 566.963
## 83753 -37.25375 -8.404583 567.186
## 83754 -37.25347 -8.404583 567.445
## 83755 -37.25319 -8.404583 567.860
## 83756 -37.25291 -8.404583 568.314
## 83757 -37.25263 -8.404583 568.737
## 83758 -37.25236 -8.404583 569.129
## 83759 -37.25208 -8.404583 569.523
## 83760 -37.25180 -8.404583 569.984
## 83761 -37.25152 -8.404583 570.496
## 83762 -37.25125 -8.404583 570.868
## 83763 -37.25097 -8.404583 570.936
## 83764 -37.25069 -8.404583 570.463
## 83765 -37.25041 -8.404583 569.750
## 83766 -37.25013 -8.404583 568.994
## 83767 -37.24986 -8.404583 568.440
## 83768 -37.24958 -8.404583 568.112
## 83769 -37.24930 -8.404583 568.125
## 83770 -37.24902 -8.404583 568.529
## 83771 -37.24875 -8.404583 569.146
## 83772 -37.24847 -8.404583 569.845
## 83773 -37.24819 -8.404583 570.448
## 83774 -37.24791 -8.404583 571.009
## 83775 -37.24763 -8.404583 571.516
## 83776 -37.24736 -8.404583 571.972
## 83777 -37.24708 -8.404583 572.485
## 83778 -37.24680 -8.404583 573.116
## 83779 -37.24652 -8.404583 573.912
## 83780 -37.24625 -8.404583 575.051
## 83781 -37.24597 -8.404583 576.628
## 83782 -37.24569 -8.404583 579.019
## 83783 -37.24541 -8.404583 581.284
## 83784 -37.24513 -8.404583 582.833
## 83785 -37.24486 -8.404583 582.998
## 83786 -37.24458 -8.404583 582.639
## 83787 -37.24430 -8.404583 582.289
## 83788 -37.24402 -8.404583 582.366
## 83789 -37.24375 -8.404583 582.619
## 83790 -37.24347 -8.404583 582.973
## 83791 -37.24319 -8.404583 583.314
## 83792 -37.24291 -8.404583 583.680
## 83793 -37.24263 -8.404583 584.075
## 83794 -37.24236 -8.404583 584.551
## 83795 -37.24208 -8.404583 584.990
## 83796 -37.24180 -8.404583 585.311
## 83797 -37.24152 -8.404583 585.459
## 83798 -37.24125 -8.404583 585.607
## 83799 -37.24097 -8.404583 585.845
## 83800 -37.24069 -8.404583 586.272
## 83801 -37.24041 -8.404583 586.601
## 83802 -37.24013 -8.404583 586.627
## 83803 -37.23986 -8.404583 586.136
## 83804 -37.23958 -8.404583 585.489
## 83805 -37.23930 -8.404583 584.962
## 83806 -37.23902 -8.404583 584.820
## 83807 -37.23875 -8.404583 584.786
## 83808 -37.23847 -8.404583 584.729
## 83809 -37.23819 -8.404583 584.459
## 83810 -37.23791 -8.404583 583.928
## 83811 -37.23763 -8.404583 583.044
## 83812 -37.23736 -8.404583 581.707
## 83813 -37.23708 -8.404583 580.196
## 83814 -37.23680 -8.404583 578.732
## 83815 -37.23652 -8.404583 577.512
## 83816 -37.23625 -8.404583 576.401
## 83817 -37.23597 -8.404583 575.329
## 83818 -37.23569 -8.404583 574.166
## 83819 -37.23541 -8.404583 573.054
## 83820 -37.23513 -8.404583 572.089
## 83821 -37.23486 -8.404583 571.367
## 83822 -37.23458 -8.404583 570.717
## 83823 -37.23430 -8.404583 570.017
## 83824 -37.23402 -8.404583 569.280
## 83825 -37.23375 -8.404583 568.515
## 83826 -37.23347 -8.404583 567.876
## 83827 -37.23319 -8.404583 567.464
## 83828 -37.23291 -8.404583 567.449
## 83829 -37.23263 -8.404583 567.969
## 83830 -37.23236 -8.404583 569.210
## 83831 -37.23208 -8.404583 570.648
## 83832 -37.23180 -8.404583 571.904
## 83833 -37.23152 -8.404583 572.641
## 83834 -37.23125 -8.404583 572.921
## 83835 -37.23097 -8.404583 572.743
## 83836 -37.23069 -8.404583 572.033
## 83837 -37.23041 -8.404583 571.157
## 83838 -37.23013 -8.404583 570.384
## 83839 -37.22986 -8.404583 570.033
## 83840 -37.22958 -8.404583 569.770
## 83841 -37.22930 -8.404583 569.380
## 83842 -37.22902 -8.404583 568.717
## 83843 -37.22875 -8.404583 568.167
## 83844 -37.22847 -8.404583 567.947
## 83845 -37.22819 -8.404583 568.380
## 83846 -37.22791 -8.404583 569.048
## 83847 -37.22763 -8.404583 569.705
## 83848 -37.22736 -8.404583 570.078
## 83849 -37.22708 -8.404583 570.341
## 83850 -37.22680 -8.404583 570.572
## 83851 -37.22652 -8.404583 570.739
## 83852 -37.22625 -8.404583 570.883
## 83853 -37.22597 -8.404583 570.894
## 83854 -37.22569 -8.404583 570.774
## 83855 -37.22541 -8.404583 570.332
## 83856 -37.22513 -8.404583 569.415
## 83857 -37.22486 -8.404583 567.881
## 84726 -37.35986 -8.404861 523.357
## 84727 -37.35958 -8.404861 523.075
## 84728 -37.35930 -8.404861 523.226
## 84729 -37.35902 -8.404861 523.685
## 84730 -37.35875 -8.404861 523.930
## 84731 -37.35847 -8.404861 524.066
## 84732 -37.35819 -8.404861 523.995
## 84733 -37.35791 -8.404861 523.387
## 84734 -37.35763 -8.404861 523.350
## 84735 -37.35736 -8.404861 523.549
## 84736 -37.35708 -8.404861 523.832
## 84737 -37.35680 -8.404861 524.142
## 84738 -37.35652 -8.404861 524.406
## 84739 -37.35625 -8.404861 524.469
## 84740 -37.35597 -8.404861 524.535
## 84741 -37.35569 -8.404861 523.973
## 84742 -37.35541 -8.404861 523.774
## 84743 -37.35513 -8.404861 523.671
## 84744 -37.35486 -8.404861 524.436
## 84745 -37.35458 -8.404861 525.245
## 84746 -37.35430 -8.404861 526.298
## 84747 -37.35402 -8.404861 526.585
## 84748 -37.35375 -8.404861 526.637
## 84749 -37.35347 -8.404861 526.681
## 84750 -37.35319 -8.404861 526.735
## 84751 -37.35291 -8.404861 526.654
## 84752 -37.35263 -8.404861 526.280
## 84753 -37.35236 -8.404861 525.881
## 84754 -37.35208 -8.404861 525.623
## 84755 -37.35180 -8.404861 525.744
## 84756 -37.35152 -8.404861 526.733
## 84757 -37.35125 -8.404861 527.813
## 84758 -37.35097 -8.404861 528.920
## 84759 -37.35069 -8.404861 529.514
## 84760 -37.35041 -8.404861 529.877
## 84761 -37.35013 -8.404861 529.889
## 84762 -37.34986 -8.404861 530.849
## 84763 -37.34958 -8.404861 531.966
## 84764 -37.34930 -8.404861 532.765
## 84765 -37.34902 -8.404861 532.927
## 84766 -37.34875 -8.404861 532.716
## 84767 -37.34847 -8.404861 532.702
## 84768 -37.34819 -8.404861 533.226
## 84769 -37.34791 -8.404861 533.318
## 84770 -37.34763 -8.404861 533.362
## 84771 -37.34736 -8.404861 533.167
## 84772 -37.34708 -8.404861 532.886
## 84773 -37.34680 -8.404861 532.169
## 84774 -37.34652 -8.404861 531.173
## 84775 -37.34625 -8.404861 530.198
## 84776 -37.34597 -8.404861 529.441
## 84777 -37.34569 -8.404861 529.182
## 84778 -37.34541 -8.404861 529.125
## 84779 -37.34513 -8.404861 529.378
## 84780 -37.34486 -8.404861 529.971
## 84781 -37.34458 -8.404861 530.574
## 84782 -37.34430 -8.404861 530.759
## 84783 -37.34402 -8.404861 530.165
## 84784 -37.34375 -8.404861 529.293
## 84785 -37.34347 -8.404861 528.405
## 84786 -37.34319 -8.404861 527.599
## 84787 -37.34291 -8.404861 526.836
## 84788 -37.34263 -8.404861 526.253
## 84789 -37.34236 -8.404861 525.742
## 84790 -37.34208 -8.404861 525.557
## 84791 -37.34180 -8.404861 525.363
## 84792 -37.34152 -8.404861 525.730
## 84793 -37.34125 -8.404861 526.139
## 84794 -37.34097 -8.404861 526.606
## 84795 -37.34069 -8.404861 526.732
## 84796 -37.34041 -8.404861 526.710
## 84797 -37.34013 -8.404861 526.650
## 84798 -37.33986 -8.404861 526.829
## 84799 -37.33958 -8.404861 526.747
## 84800 -37.33930 -8.404861 527.005
## 84801 -37.33902 -8.404861 527.173
## 84802 -37.33875 -8.404861 527.243
## 84803 -37.33847 -8.404861 527.460
## 84804 -37.33819 -8.404861 527.343
## 84805 -37.33791 -8.404861 527.484
## 84806 -37.33763 -8.404861 527.449
## 84807 -37.33736 -8.404861 527.960
## 84808 -37.33708 -8.404861 528.573
## 84809 -37.33680 -8.404861 529.052
## 84810 -37.33652 -8.404861 529.517
## 84811 -37.33625 -8.404861 529.855
## 84812 -37.33597 -8.404861 530.161
## 84813 -37.33569 -8.404861 530.246
## 84814 -37.33541 -8.404861 530.418
## 84815 -37.33513 -8.404861 530.566
## 84816 -37.33486 -8.404861 531.189
## 84817 -37.33458 -8.404861 531.850
## 84818 -37.33430 -8.404861 532.824
## 84819 -37.33402 -8.404861 533.577
## 84820 -37.33375 -8.404861 534.633
## 84821 -37.33347 -8.404861 536.022
## 84822 -37.33319 -8.404861 537.224
## 84823 -37.33291 -8.404861 538.240
## 84824 -37.33263 -8.404861 538.797
## 84825 -37.33236 -8.404861 538.470
## 84826 -37.33208 -8.404861 537.913
## 84827 -37.33180 -8.404861 537.300
## 84828 -37.33152 -8.404861 536.861
## 84829 -37.33125 -8.404861 536.497
## 84830 -37.33097 -8.404861 536.239
## 84831 -37.33069 -8.404861 536.103
## 84832 -37.33041 -8.404861 535.927
## 84833 -37.33013 -8.404861 535.810
## 84834 -37.32986 -8.404861 535.519
## 84835 -37.32958 -8.404861 535.329
## 84836 -37.32930 -8.404861 535.527
## 84837 -37.32902 -8.404861 536.106
## 84838 -37.32875 -8.404861 536.432
## 84839 -37.32847 -8.404861 536.434
## 84840 -37.32819 -8.404861 535.458
## 84841 -37.32791 -8.404861 534.260
## 84842 -37.32763 -8.404861 533.376
## 84843 -37.32736 -8.404861 533.679
## 84844 -37.32708 -8.404861 534.467
## 84845 -37.32680 -8.404861 535.297
## 84846 -37.32652 -8.404861 536.281
## 84847 -37.32625 -8.404861 536.992
## 84848 -37.32597 -8.404861 537.521
## 84849 -37.32569 -8.404861 537.445
## 84850 -37.32541 -8.404861 537.136
## 84851 -37.32513 -8.404861 537.150
## 84852 -37.32486 -8.404861 537.490
## 84853 -37.32458 -8.404861 538.069
## 84854 -37.32430 -8.404861 538.897
## 84855 -37.32402 -8.404861 539.521
## 84856 -37.32375 -8.404861 540.366
## 84857 -37.32347 -8.404861 541.037
## 84858 -37.32319 -8.404861 541.402
## 84859 -37.32291 -8.404861 541.674
## 84860 -37.32263 -8.404861 541.711
## 84861 -37.32236 -8.404861 541.753
## 84862 -37.32208 -8.404861 541.657
## 84863 -37.32180 -8.404861 541.517
## 84864 -37.32152 -8.404861 541.510
## 84865 -37.32125 -8.404861 541.341
## 84866 -37.32097 -8.404861 541.090
## 84867 -37.32069 -8.404861 541.049
## 84868 -37.32041 -8.404861 540.988
## 84869 -37.32013 -8.404861 541.278
## 84870 -37.31986 -8.404861 541.701
## 84871 -37.31958 -8.404861 542.116
## 84872 -37.31930 -8.404861 542.395
## 84873 -37.31902 -8.404861 542.154
## 84874 -37.31875 -8.404861 541.605
## 84875 -37.31847 -8.404861 541.007
## 84876 -37.31819 -8.404861 540.821
## 84877 -37.31791 -8.404861 541.088
## 84878 -37.31763 -8.404861 541.378
## 84879 -37.31736 -8.404861 541.691
## 84880 -37.31708 -8.404861 542.171
## 84881 -37.31680 -8.404861 543.207
## 84882 -37.31652 -8.404861 545.051
## 84883 -37.31625 -8.404861 546.779
## 84884 -37.31597 -8.404861 548.180
## 84885 -37.31569 -8.404861 548.659
## 84886 -37.31541 -8.404861 548.420
## 84887 -37.31513 -8.404861 548.191
## 84888 -37.31486 -8.404861 548.014
## 84889 -37.31458 -8.404861 547.813
## 84890 -37.31430 -8.404861 547.510
## 84891 -37.31402 -8.404861 546.776
## 84892 -37.31375 -8.404861 546.074
## 84893 -37.31347 -8.404861 545.075
## 84894 -37.31319 -8.404861 544.321
## 84895 -37.31291 -8.404861 543.806
## 84896 -37.31263 -8.404861 543.553
## 84897 -37.31236 -8.404861 543.956
## 84898 -37.31208 -8.404861 544.240
## 84899 -37.31180 -8.404861 544.475
## 84900 -37.31152 -8.404861 543.607
## 84901 -37.31125 -8.404861 542.403
## 84902 -37.31097 -8.404861 541.284
## 84903 -37.31069 -8.404861 540.822
## 84904 -37.31041 -8.404861 540.681
## 84905 -37.31013 -8.404861 540.917
## 84906 -37.30986 -8.404861 541.550
## 84907 -37.30958 -8.404861 542.569
## 84908 -37.30930 -8.404861 543.418
## 84909 -37.30902 -8.404861 544.364
## 84910 -37.30875 -8.404861 545.009
## 84911 -37.30847 -8.404861 545.293
## 84912 -37.30819 -8.404861 545.344
## 84913 -37.30791 -8.404861 545.013
## 84914 -37.30763 -8.404861 544.723
## 84915 -37.30736 -8.404861 544.449
## 84916 -37.30708 -8.404861 544.233
## 84917 -37.30680 -8.404861 543.671
## 84918 -37.30652 -8.404861 543.075
## 84919 -37.30625 -8.404861 542.805
## 84920 -37.30597 -8.404861 542.881
## 84921 -37.30569 -8.404861 543.617
## 84922 -37.30541 -8.404861 544.609
## 84923 -37.30513 -8.404861 545.873
## 84924 -37.30486 -8.404861 547.205
## 84925 -37.30458 -8.404861 548.616
## 84926 -37.30430 -8.404861 549.683
## 84927 -37.30402 -8.404861 550.387
## 84928 -37.30375 -8.404861 550.777
## 84929 -37.30347 -8.404861 550.953
## 84930 -37.30319 -8.404861 550.453
## 84931 -37.30291 -8.404861 549.753
## 84932 -37.30263 -8.404861 549.265
## 84933 -37.30236 -8.404861 549.622
## 84934 -37.30208 -8.404861 550.292
## 84935 -37.30180 -8.404861 550.941
## 84936 -37.30152 -8.404861 551.103
## 84937 -37.30125 -8.404861 550.964
## 84938 -37.30097 -8.404861 550.519
## 84939 -37.30069 -8.404861 550.174
## 84940 -37.30041 -8.404861 549.773
## 84941 -37.30013 -8.404861 549.683
## 84942 -37.29986 -8.404861 550.034
## 84943 -37.29958 -8.404861 550.364
## 84944 -37.29930 -8.404861 550.349
## 84945 -37.29902 -8.404861 549.410
## 84946 -37.29875 -8.404861 548.497
## 84947 -37.29847 -8.404861 547.775
## 84948 -37.29819 -8.404861 548.463
## 84949 -37.29791 -8.404861 549.476
## 84950 -37.29763 -8.404861 550.346
## 84951 -37.29736 -8.404861 550.172
## 84952 -37.29708 -8.404861 549.848
## 84953 -37.29680 -8.404861 549.712
## 84954 -37.29652 -8.404861 550.429
## 84955 -37.29625 -8.404861 551.481
## 84956 -37.29597 -8.404861 552.548
## 84957 -37.29569 -8.404861 553.392
## 84958 -37.29541 -8.404861 553.888
## 84959 -37.29513 -8.404861 554.413
## 84960 -37.29486 -8.404861 554.384
## 84961 -37.29458 -8.404861 554.101
## 84962 -37.29430 -8.404861 553.380
## 84963 -37.29402 -8.404861 552.683
## 84964 -37.29375 -8.404861 552.007
## 84965 -37.29347 -8.404861 551.450
## 84966 -37.29319 -8.404861 551.089
## 84967 -37.29291 -8.404861 551.104
## 84968 -37.29263 -8.404861 551.561
## 84969 -37.29236 -8.404861 552.629
## 84970 -37.29208 -8.404861 553.891
## 84971 -37.29180 -8.404861 554.680
## 84972 -37.29152 -8.404861 555.202
## 84973 -37.29125 -8.404861 555.233
## 84974 -37.29097 -8.404861 555.130
## 84975 -37.29069 -8.404861 555.031
## 84976 -37.29041 -8.404861 554.591
## 84977 -37.29013 -8.404861 554.146
## 84978 -37.28986 -8.404861 553.516
## 84979 -37.28958 -8.404861 552.935
## 84980 -37.28930 -8.404861 552.590
## 84981 -37.28902 -8.404861 552.450
## 84982 -37.28875 -8.404861 552.567
## 84983 -37.28847 -8.404861 552.725
## 84984 -37.28819 -8.404861 552.719
## 84985 -37.28791 -8.404861 552.755
## 84986 -37.28763 -8.404861 552.358
## 84987 -37.28736 -8.404861 552.222
## 84988 -37.28708 -8.404861 552.134
## 84989 -37.28680 -8.404861 552.511
## 84990 -37.28652 -8.404861 552.982
## 84991 -37.28625 -8.404861 553.435
## 84992 -37.28597 -8.404861 554.154
## 84993 -37.28569 -8.404861 554.448
## 84994 -37.28541 -8.404861 554.818
## 84995 -37.28513 -8.404861 555.198
## 84996 -37.28486 -8.404861 556.600
## 84997 -37.28458 -8.404861 558.334
## 84998 -37.28430 -8.404861 560.439
## 84999 -37.28402 -8.404861 562.020
## 85000 -37.28375 -8.404861 563.110
## 85001 -37.28347 -8.404861 563.706
## 85002 -37.28319 -8.404861 563.736
## 85003 -37.28291 -8.404861 563.242
## 85004 -37.28263 -8.404861 562.910
## 85005 -37.28236 -8.404861 562.821
## 85006 -37.28208 -8.404861 563.039
## 85007 -37.28180 -8.404861 563.058
## 85008 -37.28152 -8.404861 563.519
## 85009 -37.28125 -8.404861 564.220
## 85010 -37.28097 -8.404861 565.055
## 85011 -37.28069 -8.404861 565.937
## 85012 -37.28041 -8.404861 566.662
## 85013 -37.28013 -8.404861 567.289
## 85014 -37.27986 -8.404861 566.752
## 85015 -37.27958 -8.404861 566.373
## 85016 -37.27930 -8.404861 565.533
## 85017 -37.27902 -8.404861 566.220
## 85018 -37.27875 -8.404861 567.070
## 85019 -37.27847 -8.404861 568.117
## 85020 -37.27819 -8.404861 568.438
## 85021 -37.27791 -8.404861 568.224
## 85022 -37.27763 -8.404861 568.190
## 85023 -37.27736 -8.404861 567.851
## 85024 -37.27708 -8.404861 567.567
## 85025 -37.27680 -8.404861 566.717
## 85026 -37.27652 -8.404861 566.611
## 85027 -37.27625 -8.404861 566.877
## 85028 -37.27597 -8.404861 567.039
## 85029 -37.27569 -8.404861 566.952
## 85030 -37.27541 -8.404861 566.996
## 85031 -37.27513 -8.404861 567.170
## 85032 -37.27486 -8.404861 567.269
## 85033 -37.27458 -8.404861 567.383
## 85034 -37.27430 -8.404861 567.665
## 85035 -37.27402 -8.404861 568.247
## 85036 -37.27375 -8.404861 568.816
## 85037 -37.27347 -8.404861 569.104
## 85038 -37.27319 -8.404861 568.942
## 85039 -37.27291 -8.404861 568.588
## 85040 -37.27263 -8.404861 568.435
## 85041 -37.27236 -8.404861 568.632
## 85042 -37.27208 -8.404861 568.905
## 85043 -37.27180 -8.404861 569.083
## 85044 -37.27152 -8.404861 568.790
## 85045 -37.27125 -8.404861 568.227
## 85046 -37.27097 -8.404861 567.557
## 85047 -37.27069 -8.404861 567.354
## 85048 -37.27041 -8.404861 567.282
## 85049 -37.27013 -8.404861 567.260
## 85050 -37.26986 -8.404861 566.780
## 85051 -37.26958 -8.404861 566.066
## 85052 -37.26930 -8.404861 565.288
## 85053 -37.26902 -8.404861 564.357
## 85054 -37.26875 -8.404861 563.394
## 85055 -37.26847 -8.404861 562.169
## 85056 -37.26819 -8.404861 561.156
## 85057 -37.26791 -8.404861 560.554
## 85058 -37.26763 -8.404861 560.894
## 85059 -37.26736 -8.404861 561.885
## 85060 -37.26708 -8.404861 563.129
## 85061 -37.26680 -8.404861 564.478
## 85062 -37.26652 -8.404861 565.662
## 85063 -37.26625 -8.404861 566.523
## 85064 -37.26597 -8.404861 566.561
## 85065 -37.26569 -8.404861 565.364
## 85066 -37.26541 -8.404861 564.047
## 85067 -37.26513 -8.404861 562.556
## 85068 -37.26486 -8.404861 561.625
## 85069 -37.26458 -8.404861 560.731
## 85070 -37.26430 -8.404861 560.041
## 85071 -37.26402 -8.404861 559.255
## 85072 -37.26375 -8.404861 558.753
## 85073 -37.26347 -8.404861 558.507
## 85074 -37.26319 -8.404861 558.355
## 85075 -37.26291 -8.404861 558.475
## 85076 -37.26263 -8.404861 558.961
## 85077 -37.26236 -8.404861 560.055
## 85078 -37.26208 -8.404861 561.313
## 85079 -37.26180 -8.404861 561.679
## 85080 -37.26152 -8.404861 561.132
## 85081 -37.26125 -8.404861 560.185
## 85082 -37.26097 -8.404861 559.177
## 85083 -37.26069 -8.404861 558.441
## 85084 -37.26041 -8.404861 558.014
## 85085 -37.26013 -8.404861 557.262
## 85086 -37.25986 -8.404861 556.774
## 85087 -37.25958 -8.404861 556.196
## 85088 -37.25930 -8.404861 555.531
## 85089 -37.25902 -8.404861 554.835
## 85090 -37.25875 -8.404861 554.302
## 85091 -37.25847 -8.404861 554.468
## 85092 -37.25819 -8.404861 555.009
## 85093 -37.25791 -8.404861 555.858
## 85094 -37.25763 -8.404861 556.820
## 85095 -37.25736 -8.404861 557.704
## 85096 -37.25708 -8.404861 558.706
## 85097 -37.25680 -8.404861 559.394
## 85098 -37.25652 -8.404861 559.791
## 85099 -37.25625 -8.404861 560.453
## 85100 -37.25597 -8.404861 561.079
## 85101 -37.25569 -8.404861 562.495
## 85102 -37.25541 -8.404861 563.731
## 85103 -37.25513 -8.404861 565.294
## 85104 -37.25486 -8.404861 566.180
## 85105 -37.25458 -8.404861 566.763
## 85106 -37.25430 -8.404861 567.029
## 85107 -37.25402 -8.404861 566.754
## 85108 -37.25375 -8.404861 566.925
## 85109 -37.25347 -8.404861 566.958
## 85110 -37.25319 -8.404861 567.296
## 85111 -37.25291 -8.404861 568.091
## 85112 -37.25263 -8.404861 568.921
## 85113 -37.25236 -8.404861 569.481
## 85114 -37.25208 -8.404861 569.951
## 85115 -37.25180 -8.404861 570.381
## 85116 -37.25152 -8.404861 570.870
## 85117 -37.25125 -8.404861 571.393
## 85118 -37.25097 -8.404861 571.560
## 85119 -37.25069 -8.404861 571.236
## 85120 -37.25041 -8.404861 570.764
## 85121 -37.25013 -8.404861 570.169
## 85122 -37.24986 -8.404861 569.669
## 85123 -37.24958 -8.404861 569.253
## 85124 -37.24930 -8.404861 569.040
## 85125 -37.24902 -8.404861 569.163
## 85126 -37.24875 -8.404861 569.560
## 85127 -37.24847 -8.404861 570.091
## 85128 -37.24819 -8.404861 570.530
## 85129 -37.24791 -8.404861 571.177
## 85130 -37.24763 -8.404861 571.820
## 85131 -37.24736 -8.404861 572.203
## 85132 -37.24708 -8.404861 572.654
## 85133 -37.24680 -8.404861 573.052
## 85134 -37.24652 -8.404861 574.005
## 85135 -37.24625 -8.404861 575.263
## 85136 -37.24597 -8.404861 577.144
## 85137 -37.24569 -8.404861 579.632
## 85138 -37.24541 -8.404861 581.601
## 85139 -37.24513 -8.404861 583.292
## 85140 -37.24486 -8.404861 583.458
## 85141 -37.24458 -8.404861 583.436
## 85142 -37.24430 -8.404861 582.762
## 85143 -37.24402 -8.404861 582.856
## 85144 -37.24375 -8.404861 583.198
## 85145 -37.24347 -8.404861 583.638
## 85146 -37.24319 -8.404861 584.106
## 85147 -37.24291 -8.404861 584.695
## 85148 -37.24263 -8.404861 585.369
## 85149 -37.24236 -8.404861 585.816
## 85150 -37.24208 -8.404861 586.168
## 85151 -37.24180 -8.404861 586.641
## 85152 -37.24152 -8.404861 586.609
## 85153 -37.24125 -8.404861 586.587
## 85154 -37.24097 -8.404861 586.376
## 85155 -37.24069 -8.404861 586.557
## 85156 -37.24041 -8.404861 586.598
## 85157 -37.24013 -8.404861 586.268
## 85158 -37.23986 -8.404861 585.756
## 85159 -37.23958 -8.404861 585.122
## 85160 -37.23930 -8.404861 584.928
## 85161 -37.23902 -8.404861 584.974
## 85162 -37.23875 -8.404861 584.975
## 85163 -37.23847 -8.404861 584.923
## 85164 -37.23819 -8.404861 584.618
## 85165 -37.23791 -8.404861 584.016
## 85166 -37.23763 -8.404861 582.831
## 85167 -37.23736 -8.404861 581.294
## 85168 -37.23708 -8.404861 579.551
## 85169 -37.23680 -8.404861 578.196
## 85170 -37.23652 -8.404861 576.988
## 85171 -37.23625 -8.404861 575.884
## 85172 -37.23597 -8.404861 575.064
## 85173 -37.23569 -8.404861 573.935
## 85174 -37.23541 -8.404861 572.938
## 85175 -37.23513 -8.404861 571.795
## 85176 -37.23486 -8.404861 570.911
## 85177 -37.23458 -8.404861 570.120
## 85178 -37.23430 -8.404861 569.293
## 85179 -37.23402 -8.404861 568.480
## 85180 -37.23375 -8.404861 567.749
## 85181 -37.23347 -8.404861 567.310
## 85182 -37.23319 -8.404861 567.182
## 85183 -37.23291 -8.404861 567.170
## 85184 -37.23263 -8.404861 567.937
## 85185 -37.23236 -8.404861 569.380
## 85186 -37.23208 -8.404861 570.988
## 85187 -37.23180 -8.404861 572.448
## 85188 -37.23152 -8.404861 573.158
## 85189 -37.23125 -8.404861 573.594
## 85190 -37.23097 -8.404861 573.413
## 85191 -37.23069 -8.404861 572.783
## 85192 -37.23041 -8.404861 572.131
## 85193 -37.23013 -8.404861 571.537
## 85194 -37.22986 -8.404861 570.987
## 85195 -37.22958 -8.404861 570.459
## 85196 -37.22930 -8.404861 570.189
## 85197 -37.22902 -8.404861 569.427
## 85198 -37.22875 -8.404861 568.959
## 85199 -37.22847 -8.404861 568.351
## 85200 -37.22819 -8.404861 568.674
## 85201 -37.22791 -8.404861 569.238
## 85202 -37.22763 -8.404861 570.124
## 85203 -37.22736 -8.404861 570.783
## 85204 -37.22708 -8.404861 571.411
## 85205 -37.22680 -8.404861 571.968
## 85206 -37.22652 -8.404861 572.490
## 85207 -37.22625 -8.404861 572.815
## 85208 -37.22597 -8.404861 572.988
## 85209 -37.22569 -8.404861 572.964
## 85210 -37.22541 -8.404861 572.410
## 85211 -37.22513 -8.404861 571.466
## 85212 -37.22486 -8.404861 569.724
## 85213 -37.22458 -8.404861 568.084
## 85214 -37.22430 -8.404861 566.951
## 85215 -37.22402 -8.404861 566.894
## 85216 -37.22375 -8.404861 567.668
## 86076 -37.36125 -8.405139 524.210
## 86077 -37.36097 -8.405139 524.103
## 86078 -37.36069 -8.405139 523.666
## 86079 -37.36041 -8.405139 523.509
## 86080 -37.36013 -8.405139 523.320
## 86081 -37.35986 -8.405139 522.956
## 86082 -37.35958 -8.405139 522.620
## 86083 -37.35930 -8.405139 522.537
## 86084 -37.35902 -8.405139 523.281
## 86085 -37.35875 -8.405139 524.071
## 86086 -37.35847 -8.405139 524.478
## 86087 -37.35819 -8.405139 523.865
## 86088 -37.35791 -8.405139 523.200
## 86089 -37.35763 -8.405139 522.733
## 86090 -37.35736 -8.405139 523.059
## 86091 -37.35708 -8.405139 523.556
## 86092 -37.35680 -8.405139 524.149
## 86093 -37.35652 -8.405139 524.576
## 86094 -37.35625 -8.405139 524.925
## 86095 -37.35597 -8.405139 525.237
## 86096 -37.35569 -8.405139 525.339
## 86097 -37.35541 -8.405139 525.625
## 86098 -37.35513 -8.405139 525.922
## 86099 -37.35486 -8.405139 526.422
## 86100 -37.35458 -8.405139 526.937
## 86101 -37.35430 -8.405139 527.568
## 86102 -37.35402 -8.405139 528.091
## 86103 -37.35375 -8.405139 528.262
## 86104 -37.35347 -8.405139 528.481
## 86105 -37.35319 -8.405139 528.651
## 86106 -37.35291 -8.405139 528.794
## 86107 -37.35263 -8.405139 528.456
## 86108 -37.35236 -8.405139 528.094
## 86109 -37.35208 -8.405139 527.828
## 86110 -37.35180 -8.405139 527.896
## 86111 -37.35152 -8.405139 528.561
## 86112 -37.35125 -8.405139 529.289
## 86113 -37.35097 -8.405139 530.099
## 86114 -37.35069 -8.405139 530.776
## 86115 -37.35041 -8.405139 531.136
## 86116 -37.35013 -8.405139 531.433
## 86117 -37.34986 -8.405139 532.159
## 86118 -37.34958 -8.405139 532.906
## 86119 -37.34930 -8.405139 533.620
## 86120 -37.34902 -8.405139 534.000
## 86121 -37.34875 -8.405139 534.247
## 86122 -37.34847 -8.405139 534.279
## 86123 -37.34819 -8.405139 534.417
## 86124 -37.34791 -8.405139 534.395
## 86125 -37.34763 -8.405139 534.292
## 86126 -37.34736 -8.405139 534.029
## 86127 -37.34708 -8.405139 533.548
## 86128 -37.34680 -8.405139 532.804
## 86129 -37.34652 -8.405139 531.960
## 86130 -37.34625 -8.405139 531.131
## 86131 -37.34597 -8.405139 530.405
## 86132 -37.34569 -8.405139 529.965
## 86133 -37.34541 -8.405139 529.835
## 86134 -37.34513 -8.405139 530.077
## 86135 -37.34486 -8.405139 530.587
## 86136 -37.34458 -8.405139 530.999
## 86137 -37.34430 -8.405139 531.156
## 86138 -37.34402 -8.405139 530.660
## 86139 -37.34375 -8.405139 529.872
## 86140 -37.34347 -8.405139 529.016
## 86141 -37.34319 -8.405139 528.393
## 86142 -37.34291 -8.405139 527.932
## 86143 -37.34263 -8.405139 527.379
## 86144 -37.34236 -8.405139 526.907
## 86145 -37.34208 -8.405139 526.651
## 86146 -37.34180 -8.405139 526.365
## 86147 -37.34152 -8.405139 526.015
## 86148 -37.34125 -8.405139 526.056
## 86149 -37.34097 -8.405139 526.130
## 86150 -37.34069 -8.405139 526.506
## 86151 -37.34041 -8.405139 526.907
## 86152 -37.34013 -8.405139 527.122
## 86153 -37.33986 -8.405139 527.260
## 86154 -37.33958 -8.405139 527.250
## 86155 -37.33930 -8.405139 527.528
## 86156 -37.33902 -8.405139 527.736
## 86157 -37.33875 -8.405139 527.648
## 86158 -37.33847 -8.405139 527.743
## 86159 -37.33819 -8.405139 528.052
## 86160 -37.33791 -8.405139 528.551
## 86161 -37.33763 -8.405139 528.960
## 86162 -37.33736 -8.405139 529.391
## 86163 -37.33708 -8.405139 529.879
## 86164 -37.33680 -8.405139 530.543
## 86165 -37.33652 -8.405139 531.036
## 86166 -37.33625 -8.405139 531.369
## 86167 -37.33597 -8.405139 531.610
## 86168 -37.33569 -8.405139 531.915
## 86169 -37.33541 -8.405139 532.173
## 86170 -37.33513 -8.405139 532.342
## 86171 -37.33486 -8.405139 532.610
## 86172 -37.33458 -8.405139 533.023
## 86173 -37.33430 -8.405139 533.608
## 86174 -37.33402 -8.405139 534.655
## 86175 -37.33375 -8.405139 535.720
## 86176 -37.33347 -8.405139 537.242
## 86177 -37.33319 -8.405139 538.643
## 86178 -37.33291 -8.405139 539.757
## 86179 -37.33263 -8.405139 540.291
## 86180 -37.33236 -8.405139 539.926
## 86181 -37.33208 -8.405139 539.349
## 86182 -37.33180 -8.405139 538.458
## 86183 -37.33152 -8.405139 537.920
## 86184 -37.33125 -8.405139 537.519
## 86185 -37.33097 -8.405139 537.240
## 86186 -37.33069 -8.405139 536.847
## 86187 -37.33041 -8.405139 536.649
## 86188 -37.33013 -8.405139 536.226
## 86189 -37.32986 -8.405139 536.141
## 86190 -37.32958 -8.405139 536.332
## 86191 -37.32930 -8.405139 536.746
## 86192 -37.32902 -8.405139 537.160
## 86193 -37.32875 -8.405139 537.217
## 86194 -37.32847 -8.405139 537.054
## 86195 -37.32819 -8.405139 536.114
## 86196 -37.32791 -8.405139 535.275
## 86197 -37.32763 -8.405139 534.506
## 86198 -37.32736 -8.405139 534.905
## 86199 -37.32708 -8.405139 535.817
## 86200 -37.32680 -8.405139 536.820
## 86201 -37.32652 -8.405139 537.531
## 86202 -37.32625 -8.405139 538.171
## 86203 -37.32597 -8.405139 538.514
## 86204 -37.32569 -8.405139 538.611
## 86205 -37.32541 -8.405139 538.493
## 86206 -37.32513 -8.405139 538.549
## 86207 -37.32486 -8.405139 538.498
## 86208 -37.32458 -8.405139 538.743
## 86209 -37.32430 -8.405139 538.891
## 86210 -37.32402 -8.405139 539.547
## 86211 -37.32375 -8.405139 540.487
## 86212 -37.32347 -8.405139 541.268
## 86213 -37.32319 -8.405139 541.719
## 86214 -37.32291 -8.405139 542.020
## 86215 -37.32263 -8.405139 542.207
## 86216 -37.32236 -8.405139 542.374
## 86217 -37.32208 -8.405139 542.431
## 86218 -37.32180 -8.405139 542.408
## 86219 -37.32152 -8.405139 542.411
## 86220 -37.32125 -8.405139 542.303
## 86221 -37.32097 -8.405139 542.142
## 86222 -37.32069 -8.405139 542.178
## 86223 -37.32041 -8.405139 542.363
## 86224 -37.32013 -8.405139 542.852
## 86225 -37.31986 -8.405139 543.504
## 86226 -37.31958 -8.405139 544.090
## 86227 -37.31930 -8.405139 544.405
## 86228 -37.31902 -8.405139 543.997
## 86229 -37.31875 -8.405139 543.416
## 86230 -37.31847 -8.405139 542.601
## 86231 -37.31819 -8.405139 542.325
## 86232 -37.31791 -8.405139 542.406
## 86233 -37.31763 -8.405139 542.583
## 86234 -37.31736 -8.405139 542.851
## 86235 -37.31708 -8.405139 543.376
## 86236 -37.31680 -8.405139 544.328
## 86237 -37.31652 -8.405139 546.214
## 86238 -37.31625 -8.405139 548.109
## 86239 -37.31597 -8.405139 549.527
## 86240 -37.31569 -8.405139 549.992
## 86241 -37.31541 -8.405139 549.771
## 86242 -37.31513 -8.405139 549.634
## 86243 -37.31486 -8.405139 548.953
## 86244 -37.31458 -8.405139 548.139
## 86245 -37.31430 -8.405139 547.517
## 86246 -37.31402 -8.405139 547.323
## 86247 -37.31375 -8.405139 547.134
## 86248 -37.31347 -8.405139 546.498
## 86249 -37.31319 -8.405139 545.588
## 86250 -37.31291 -8.405139 544.920
## 86251 -37.31263 -8.405139 544.599
## 86252 -37.31236 -8.405139 544.871
## 86253 -37.31208 -8.405139 545.014
## 86254 -37.31180 -8.405139 545.175
## 86255 -37.31152 -8.405139 544.341
## 86256 -37.31125 -8.405139 543.298
## 86257 -37.31097 -8.405139 542.159
## 86258 -37.31069 -8.405139 541.388
## 86259 -37.31041 -8.405139 541.125
## 86260 -37.31013 -8.405139 541.249
## 86261 -37.30986 -8.405139 542.247
## 86262 -37.30958 -8.405139 543.555
## 86263 -37.30930 -8.405139 544.799
## 86264 -37.30902 -8.405139 545.753
## 86265 -37.30875 -8.405139 546.424
## 86266 -37.30847 -8.405139 546.604
## 86267 -37.30819 -8.405139 546.289
## 86268 -37.30791 -8.405139 545.575
## 86269 -37.30763 -8.405139 545.054
## 86270 -37.30736 -8.405139 544.669
## 86271 -37.30708 -8.405139 544.276
## 86272 -37.30680 -8.405139 543.549
## 86273 -37.30652 -8.405139 543.401
## 86274 -37.30625 -8.405139 543.311
## 86275 -37.30597 -8.405139 543.687
## 86276 -37.30569 -8.405139 543.983
## 86277 -37.30541 -8.405139 544.535
## 86278 -37.30513 -8.405139 545.604
## 86279 -37.30486 -8.405139 547.248
## 86280 -37.30458 -8.405139 548.965
## 86281 -37.30430 -8.405139 550.529
## 86282 -37.30402 -8.405139 551.428
## 86283 -37.30375 -8.405139 552.222
## 86284 -37.30347 -8.405139 552.574
## 86285 -37.30319 -8.405139 551.825
## 86286 -37.30291 -8.405139 550.852
## 86287 -37.30263 -8.405139 549.906
## 86288 -37.30236 -8.405139 550.301
## 86289 -37.30208 -8.405139 550.975
## 86290 -37.30180 -8.405139 551.537
## 86291 -37.30152 -8.405139 551.453
## 86292 -37.30125 -8.405139 551.115
## 86293 -37.30097 -8.405139 550.765
## 86294 -37.30069 -8.405139 550.635
## 86295 -37.30041 -8.405139 550.485
## 86296 -37.30013 -8.405139 550.547
## 86297 -37.29986 -8.405139 550.769
## 86298 -37.29958 -8.405139 550.942
## 86299 -37.29930 -8.405139 550.729
## 86300 -37.29902 -8.405139 550.000
## 86301 -37.29875 -8.405139 548.969
## 86302 -37.29847 -8.405139 548.211
## 86303 -37.29819 -8.405139 548.567
## 86304 -37.29791 -8.405139 549.194
## 86305 -37.29763 -8.405139 549.938
## 86306 -37.29736 -8.405139 549.912
## 86307 -37.29708 -8.405139 549.800
## 86308 -37.29680 -8.405139 550.005
## 86309 -37.29652 -8.405139 550.879
## 86310 -37.29625 -8.405139 552.171
## 86311 -37.29597 -8.405139 553.512
## 86312 -37.29569 -8.405139 554.272
## 86313 -37.29541 -8.405139 554.831
## 86314 -37.29513 -8.405139 555.196
## 86315 -37.29486 -8.405139 555.717
## 86316 -37.29458 -8.405139 555.890
## 86317 -37.29430 -8.405139 555.441
## 86318 -37.29402 -8.405139 554.466
## 86319 -37.29375 -8.405139 553.413
## 86320 -37.29347 -8.405139 552.568
## 86321 -37.29319 -8.405139 551.990
## 86322 -37.29291 -8.405139 551.736
## 86323 -37.29263 -8.405139 552.105
## 86324 -37.29236 -8.405139 553.284
## 86325 -37.29208 -8.405139 554.557
## 86326 -37.29180 -8.405139 555.712
## 86327 -37.29152 -8.405139 556.127
## 86328 -37.29125 -8.405139 556.286
## 86329 -37.29097 -8.405139 556.152
## 86330 -37.29069 -8.405139 556.083
## 86331 -37.29041 -8.405139 555.804
## 86332 -37.29013 -8.405139 555.404
## 86333 -37.28986 -8.405139 554.450
## 86334 -37.28958 -8.405139 553.577
## 86335 -37.28930 -8.405139 552.849
## 86336 -37.28902 -8.405139 552.804
## 86337 -37.28875 -8.405139 552.932
## 86338 -37.28847 -8.405139 553.077
## 86339 -37.28819 -8.405139 553.212
## 86340 -37.28791 -8.405139 553.316
## 86341 -37.28763 -8.405139 553.087
## 86342 -37.28736 -8.405139 552.616
## 86343 -37.28708 -8.405139 552.183
## 86344 -37.28680 -8.405139 552.471
## 86345 -37.28652 -8.405139 553.228
## 86346 -37.28625 -8.405139 554.050
## 86347 -37.28597 -8.405139 554.739
## 86348 -37.28569 -8.405139 554.931
## 86349 -37.28541 -8.405139 555.269
## 86350 -37.28513 -8.405139 555.467
## 86351 -37.28486 -8.405139 556.274
## 86352 -37.28458 -8.405139 557.385
## 86353 -37.28430 -8.405139 558.892
## 86354 -37.28402 -8.405139 560.530
## 86355 -37.28375 -8.405139 561.833
## 86356 -37.28347 -8.405139 562.464
## 86357 -37.28319 -8.405139 562.272
## 86358 -37.28291 -8.405139 561.849
## 86359 -37.28263 -8.405139 561.544
## 86360 -37.28236 -8.405139 561.819
## 86361 -37.28208 -8.405139 562.292
## 86362 -37.28180 -8.405139 562.596
## 86363 -37.28152 -8.405139 562.878
## 86364 -37.28125 -8.405139 563.394
## 86365 -37.28097 -8.405139 564.209
## 86366 -37.28069 -8.405139 564.955
## 86367 -37.28041 -8.405139 565.512
## 86368 -37.28013 -8.405139 566.061
## 86369 -37.27986 -8.405139 566.332
## 86370 -37.27958 -8.405139 566.579
## 86371 -37.27930 -8.405139 566.550
## 86372 -37.27902 -8.405139 566.903
## 86373 -37.27875 -8.405139 567.419
## 86374 -37.27847 -8.405139 568.322
## 86375 -37.27819 -8.405139 568.819
## 86376 -37.27791 -8.405139 569.004
## 86377 -37.27763 -8.405139 569.192
## 86378 -37.27736 -8.405139 569.026
## 86379 -37.27708 -8.405139 568.830
## 86380 -37.27680 -8.405139 568.184
## 86381 -37.27652 -8.405139 567.818
## 86382 -37.27625 -8.405139 567.505
## 86383 -37.27597 -8.405139 567.466
## 86384 -37.27569 -8.405139 567.666
## 86385 -37.27541 -8.405139 567.841
## 86386 -37.27513 -8.405139 568.206
## 86387 -37.27486 -8.405139 568.179
## 86388 -37.27458 -8.405139 568.200
## 86389 -37.27430 -8.405139 568.314
## 86390 -37.27402 -8.405139 569.090
## 86391 -37.27375 -8.405139 569.858
## 86392 -37.27347 -8.405139 570.255
## 86393 -37.27319 -8.405139 570.035
## 86394 -37.27291 -8.405139 569.729
## 86395 -37.27263 -8.405139 569.519
## 86396 -37.27236 -8.405139 569.818
## 86397 -37.27208 -8.405139 570.043
## 86398 -37.27180 -8.405139 570.210
## 86399 -37.27152 -8.405139 569.733
## 86400 -37.27125 -8.405139 568.847
## 86401 -37.27097 -8.405139 567.832
## 86402 -37.27069 -8.405139 567.584
## 86403 -37.27041 -8.405139 567.399
## 86404 -37.27013 -8.405139 567.200
## 86405 -37.26986 -8.405139 566.417
## 86406 -37.26958 -8.405139 565.538
## 86407 -37.26930 -8.405139 564.443
## 86408 -37.26902 -8.405139 563.636
## 86409 -37.26875 -8.405139 562.872
## 86410 -37.26847 -8.405139 561.998
## 86411 -37.26819 -8.405139 561.264
## 86412 -37.26791 -8.405139 560.921
## 86413 -37.26763 -8.405139 561.402
## 86414 -37.26736 -8.405139 562.702
## 86415 -37.26708 -8.405139 564.232
## 86416 -37.26680 -8.405139 565.600
## 86417 -37.26652 -8.405139 566.206
## 86418 -37.26625 -8.405139 566.233
## 86419 -37.26597 -8.405139 565.883
## 86420 -37.26569 -8.405139 565.063
## 86421 -37.26541 -8.405139 563.952
## 86422 -37.26513 -8.405139 562.643
## 86423 -37.26486 -8.405139 561.562
## 86424 -37.26458 -8.405139 560.707
## 86425 -37.26430 -8.405139 559.967
## 86426 -37.26402 -8.405139 559.511
## 86427 -37.26375 -8.405139 559.125
## 86428 -37.26347 -8.405139 558.988
## 86429 -37.26319 -8.405139 558.792
## 86430 -37.26291 -8.405139 558.859
## 86431 -37.26263 -8.405139 559.276
## 86432 -37.26236 -8.405139 560.399
## 86433 -37.26208 -8.405139 561.542
## 86434 -37.26180 -8.405139 562.103
## 86435 -37.26152 -8.405139 561.370
## 86436 -37.26125 -8.405139 560.146
## 86437 -37.26097 -8.405139 559.050
## 86438 -37.26069 -8.405139 558.575
## 86439 -37.26041 -8.405139 558.333
## 86440 -37.26013 -8.405139 557.814
## 86441 -37.25986 -8.405139 557.455
## 86442 -37.25958 -8.405139 557.125
## 86443 -37.25930 -8.405139 556.588
## 86444 -37.25902 -8.405139 555.735
## 86445 -37.25875 -8.405139 555.053
## 86446 -37.25847 -8.405139 555.030
## 86447 -37.25819 -8.405139 555.617
## 86448 -37.25791 -8.405139 556.467
## 86449 -37.25763 -8.405139 557.267
## 86450 -37.25736 -8.405139 557.894
## 86451 -37.25708 -8.405139 558.600
## 86452 -37.25680 -8.405139 558.947
## 86453 -37.25652 -8.405139 559.584
## 86454 -37.25625 -8.405139 560.285
## 86455 -37.25597 -8.405139 560.968
## 86456 -37.25569 -8.405139 562.455
## 86457 -37.25541 -8.405139 563.899
## 86458 -37.25513 -8.405139 565.607
## 86459 -37.25486 -8.405139 566.169
## 86460 -37.25458 -8.405139 566.312
## 86461 -37.25430 -8.405139 566.205
## 86462 -37.25402 -8.405139 565.927
## 86463 -37.25375 -8.405139 565.856
## 86464 -37.25347 -8.405139 565.879
## 86465 -37.25319 -8.405139 566.680
## 86466 -37.25291 -8.405139 567.589
## 86467 -37.25263 -8.405139 568.933
## 86468 -37.25236 -8.405139 569.226
## 86469 -37.25208 -8.405139 569.396
## 86470 -37.25180 -8.405139 569.753
## 86471 -37.25152 -8.405139 570.640
## 86472 -37.25125 -8.405139 571.496
## 86473 -37.25097 -8.405139 572.045
## 86474 -37.25069 -8.405139 572.028
## 86475 -37.25041 -8.405139 571.845
## 86476 -37.25013 -8.405139 571.448
## 86477 -37.24986 -8.405139 570.993
## 86478 -37.24958 -8.405139 570.492
## 86479 -37.24930 -8.405139 570.141
## 86480 -37.24902 -8.405139 569.966
## 86481 -37.24875 -8.405139 569.901
## 86482 -37.24847 -8.405139 570.146
## 86483 -37.24819 -8.405139 570.693
## 86484 -37.24791 -8.405139 571.290
## 86485 -37.24763 -8.405139 571.887
## 86486 -37.24736 -8.405139 572.256
## 86487 -37.24708 -8.405139 572.769
## 86488 -37.24680 -8.405139 573.000
## 86489 -37.24652 -8.405139 574.051
## 86490 -37.24625 -8.405139 575.699
## 86491 -37.24597 -8.405139 577.637
## 86492 -37.24569 -8.405139 579.452
## 86493 -37.24541 -8.405139 580.905
## 86494 -37.24513 -8.405139 582.338
## 86495 -37.24486 -8.405139 582.943
## 86496 -37.24458 -8.405139 583.194
## 86497 -37.24430 -8.405139 583.035
## 86498 -37.24402 -8.405139 583.215
## 86499 -37.24375 -8.405139 583.593
## 86500 -37.24347 -8.405139 584.258
## 86501 -37.24319 -8.405139 585.009
## 86502 -37.24291 -8.405139 585.741
## 86503 -37.24263 -8.405139 586.489
## 86504 -37.24236 -8.405139 586.847
## 86505 -37.24208 -8.405139 587.047
## 86506 -37.24180 -8.405139 587.291
## 86507 -37.24152 -8.405139 587.303
## 86508 -37.24125 -8.405139 587.229
## 86509 -37.24097 -8.405139 586.954
## 86510 -37.24069 -8.405139 586.749
## 86511 -37.24041 -8.405139 586.547
## 86512 -37.24013 -8.405139 586.035
## 86513 -37.23986 -8.405139 585.605
## 86514 -37.23958 -8.405139 585.108
## 86515 -37.23930 -8.405139 585.126
## 86516 -37.23902 -8.405139 585.075
## 86517 -37.23875 -8.405139 585.030
## 86518 -37.23847 -8.405139 584.899
## 86519 -37.23819 -8.405139 584.556
## 86520 -37.23791 -8.405139 583.884
## 86521 -37.23763 -8.405139 582.632
## 86522 -37.23736 -8.405139 580.900
## 86523 -37.23708 -8.405139 579.011
## 86524 -37.23680 -8.405139 577.520
## 86525 -37.23652 -8.405139 576.370
## 86526 -37.23625 -8.405139 575.419
## 86527 -37.23597 -8.405139 574.648
## 86528 -37.23569 -8.405139 573.868
## 86529 -37.23541 -8.405139 573.067
## 86530 -37.23513 -8.405139 572.028
## 86531 -37.23486 -8.405139 571.038
## 86532 -37.23458 -8.405139 570.070
## 86533 -37.23430 -8.405139 569.009
## 86534 -37.23402 -8.405139 568.217
## 86535 -37.23375 -8.405139 567.617
## 86536 -37.23347 -8.405139 567.199
## 86537 -37.23319 -8.405139 567.057
## 86538 -37.23291 -8.405139 567.194
## 86539 -37.23263 -8.405139 568.129
## 86540 -37.23236 -8.405139 569.450
## 86541 -37.23208 -8.405139 570.939
## 86542 -37.23180 -8.405139 572.313
## 86543 -37.23152 -8.405139 573.366
## 86544 -37.23125 -8.405139 573.914
## 86545 -37.23097 -8.405139 573.936
## 86546 -37.23069 -8.405139 573.662
## 86547 -37.23041 -8.405139 573.298
## 86548 -37.23013 -8.405139 572.789
## 86549 -37.22986 -8.405139 572.091
## 86550 -37.22958 -8.405139 571.412
## 86551 -37.22930 -8.405139 570.801
## 86552 -37.22902 -8.405139 570.492
## 86553 -37.22875 -8.405139 569.950
## 86554 -37.22847 -8.405139 569.461
## 86555 -37.22819 -8.405139 569.454
## 86556 -37.22791 -8.405139 569.718
## 86557 -37.22763 -8.405139 570.391
## 86558 -37.22736 -8.405139 571.400
## 86559 -37.22708 -8.405139 572.387
## 86560 -37.22680 -8.405139 573.337
## 86561 -37.22652 -8.405139 573.946
## 86562 -37.22625 -8.405139 574.385
## 86563 -37.22597 -8.405139 574.587
## 86564 -37.22569 -8.405139 574.506
## 86565 -37.22541 -8.405139 574.051
## 86566 -37.22513 -8.405139 572.931
## 86567 -37.22486 -8.405139 571.217
## 86568 -37.22458 -8.405139 569.618
## 86569 -37.22430 -8.405139 568.065
## 86570 -37.22402 -8.405139 567.470
## 86571 -37.22375 -8.405139 567.229
## 87427 -37.36236 -8.405417 523.114
## 87428 -37.36208 -8.405417 523.147
## 87429 -37.36180 -8.405417 523.405
## 87430 -37.36152 -8.405417 523.724
## 87431 -37.36125 -8.405417 524.056
## 87432 -37.36097 -8.405417 524.176
## 87433 -37.36069 -8.405417 524.214
## 87434 -37.36041 -8.405417 524.013
## 87435 -37.36013 -8.405417 523.617
## 87436 -37.35986 -8.405417 523.288
## 87437 -37.35958 -8.405417 523.008
## 87438 -37.35930 -8.405417 523.065
## 87439 -37.35902 -8.405417 523.659
## 87440 -37.35875 -8.405417 524.391
## 87441 -37.35847 -8.405417 524.743
## 87442 -37.35819 -8.405417 524.180
## 87443 -37.35791 -8.405417 523.309
## 87444 -37.35763 -8.405417 522.715
## 87445 -37.35736 -8.405417 522.790
## 87446 -37.35708 -8.405417 523.337
## 87447 -37.35680 -8.405417 524.204
## 87448 -37.35652 -8.405417 524.792
## 87449 -37.35625 -8.405417 525.508
## 87450 -37.35597 -8.405417 526.090
## 87451 -37.35569 -8.405417 526.783
## 87452 -37.35541 -8.405417 527.342
## 87453 -37.35513 -8.405417 527.789
## 87454 -37.35486 -8.405417 528.349
## 87455 -37.35458 -8.405417 528.768
## 87456 -37.35430 -8.405417 528.922
## 87457 -37.35402 -8.405417 529.325
## 87458 -37.35375 -8.405417 529.504
## 87459 -37.35347 -8.405417 529.832
## 87460 -37.35319 -8.405417 530.082
## 87461 -37.35291 -8.405417 530.429
## 87462 -37.35263 -8.405417 530.729
## 87463 -37.35236 -8.405417 530.431
## 87464 -37.35208 -8.405417 530.186
## 87465 -37.35180 -8.405417 529.941
## 87466 -37.35152 -8.405417 530.282
## 87467 -37.35125 -8.405417 530.738
## 87468 -37.35097 -8.405417 531.253
## 87469 -37.35069 -8.405417 531.727
## 87470 -37.35041 -8.405417 532.192
## 87471 -37.35013 -8.405417 532.657
## 87472 -37.34986 -8.405417 533.414
## 87473 -37.34958 -8.405417 534.087
## 87474 -37.34930 -8.405417 534.529
## 87475 -37.34902 -8.405417 535.035
## 87476 -37.34875 -8.405417 535.236
## 87477 -37.34847 -8.405417 535.166
## 87478 -37.34819 -8.405417 535.159
## 87479 -37.34791 -8.405417 534.943
## 87480 -37.34763 -8.405417 534.605
## 87481 -37.34736 -8.405417 534.349
## 87482 -37.34708 -8.405417 533.920
## 87483 -37.34680 -8.405417 533.322
## 87484 -37.34652 -8.405417 532.494
## 87485 -37.34625 -8.405417 531.649
## 87486 -37.34597 -8.405417 530.915
## 87487 -37.34569 -8.405417 530.477
## 87488 -37.34541 -8.405417 530.315
## 87489 -37.34513 -8.405417 530.406
## 87490 -37.34486 -8.405417 530.839
## 87491 -37.34458 -8.405417 531.213
## 87492 -37.34430 -8.405417 531.295
## 87493 -37.34402 -8.405417 530.791
## 87494 -37.34375 -8.405417 530.090
## 87495 -37.34347 -8.405417 529.342
## 87496 -37.34319 -8.405417 529.027
## 87497 -37.34291 -8.405417 528.809
## 87498 -37.34263 -8.405417 528.784
## 87499 -37.34236 -8.405417 528.438
## 87500 -37.34208 -8.405417 528.207
## 87501 -37.34180 -8.405417 528.017
## 87502 -37.34152 -8.405417 527.544
## 87503 -37.34125 -8.405417 527.256
## 87504 -37.34097 -8.405417 527.097
## 87505 -37.34069 -8.405417 527.502
## 87506 -37.34041 -8.405417 527.981
## 87507 -37.34013 -8.405417 528.396
## 87508 -37.33986 -8.405417 528.661
## 87509 -37.33958 -8.405417 528.771
## 87510 -37.33930 -8.405417 528.816
## 87511 -37.33902 -8.405417 528.753
## 87512 -37.33875 -8.405417 528.756
## 87513 -37.33847 -8.405417 528.875
## 87514 -37.33819 -8.405417 529.398
## 87515 -37.33791 -8.405417 530.050
## 87516 -37.33763 -8.405417 530.786
## 87517 -37.33736 -8.405417 531.378
## 87518 -37.33708 -8.405417 531.946
## 87519 -37.33680 -8.405417 532.303
## 87520 -37.33652 -8.405417 532.786
## 87521 -37.33625 -8.405417 533.061
## 87522 -37.33597 -8.405417 533.192
## 87523 -37.33569 -8.405417 533.537
## 87524 -37.33541 -8.405417 533.750
## 87525 -37.33513 -8.405417 533.909
## 87526 -37.33486 -8.405417 533.909
## 87527 -37.33458 -8.405417 534.033
## 87528 -37.33430 -8.405417 534.222
## 87529 -37.33402 -8.405417 535.251
## 87530 -37.33375 -8.405417 536.334
## 87531 -37.33347 -8.405417 537.558
## 87532 -37.33319 -8.405417 538.974
## 87533 -37.33291 -8.405417 540.127
## 87534 -37.33263 -8.405417 540.928
## 87535 -37.33236 -8.405417 540.539
## 87536 -37.33208 -8.405417 539.902
## 87537 -37.33180 -8.405417 539.160
## 87538 -37.33152 -8.405417 538.670
## 87539 -37.33125 -8.405417 538.340
## 87540 -37.33097 -8.405417 538.196
## 87541 -37.33069 -8.405417 537.576
## 87542 -37.33041 -8.405417 537.203
## 87543 -37.33013 -8.405417 537.038
## 87544 -37.32986 -8.405417 537.252
## 87545 -37.32958 -8.405417 537.609
## 87546 -37.32930 -8.405417 537.912
## 87547 -37.32902 -8.405417 538.196
## 87548 -37.32875 -8.405417 538.183
## 87549 -37.32847 -8.405417 537.958
## 87550 -37.32819 -8.405417 537.112
## 87551 -37.32791 -8.405417 536.421
## 87552 -37.32763 -8.405417 536.276
## 87553 -37.32736 -8.405417 536.850
## 87554 -37.32708 -8.405417 537.895
## 87555 -37.32680 -8.405417 538.939
## 87556 -37.32652 -8.405417 539.647
## 87557 -37.32625 -8.405417 540.086
## 87558 -37.32597 -8.405417 540.064
## 87559 -37.32569 -8.405417 540.240
## 87560 -37.32541 -8.405417 540.039
## 87561 -37.32513 -8.405417 539.697
## 87562 -37.32486 -8.405417 539.327
## 87563 -37.32458 -8.405417 539.091
## 87564 -37.32430 -8.405417 539.226
## 87565 -37.32402 -8.405417 539.858
## 87566 -37.32375 -8.405417 540.812
## 87567 -37.32347 -8.405417 541.844
## 87568 -37.32319 -8.405417 542.448
## 87569 -37.32291 -8.405417 542.930
## 87570 -37.32263 -8.405417 543.222
## 87571 -37.32236 -8.405417 543.534
## 87572 -37.32208 -8.405417 543.669
## 87573 -37.32180 -8.405417 543.589
## 87574 -37.32152 -8.405417 543.518
## 87575 -37.32125 -8.405417 543.369
## 87576 -37.32097 -8.405417 543.216
## 87577 -37.32069 -8.405417 543.433
## 87578 -37.32041 -8.405417 543.740
## 87579 -37.32013 -8.405417 544.161
## 87580 -37.31986 -8.405417 544.997
## 87581 -37.31958 -8.405417 545.633
## 87582 -37.31930 -8.405417 546.063
## 87583 -37.31902 -8.405417 545.486
## 87584 -37.31875 -8.405417 544.891
## 87585 -37.31847 -8.405417 544.493
## 87586 -37.31819 -8.405417 544.222
## 87587 -37.31791 -8.405417 544.351
## 87588 -37.31763 -8.405417 544.668
## 87589 -37.31736 -8.405417 544.901
## 87590 -37.31708 -8.405417 545.459
## 87591 -37.31680 -8.405417 546.431
## 87592 -37.31652 -8.405417 548.212
## 87593 -37.31625 -8.405417 550.037
## 87594 -37.31597 -8.405417 551.245
## 87595 -37.31569 -8.405417 551.526
## 87596 -37.31541 -8.405417 551.011
## 87597 -37.31513 -8.405417 549.941
## 87598 -37.31486 -8.405417 549.126
## 87599 -37.31458 -8.405417 548.250
## 87600 -37.31430 -8.405417 547.867
## 87601 -37.31402 -8.405417 547.775
## 87602 -37.31375 -8.405417 547.910
## 87603 -37.31347 -8.405417 548.139
## 87604 -37.31319 -8.405417 547.273
## 87605 -37.31291 -8.405417 546.566
## 87606 -37.31263 -8.405417 546.019
## 87607 -37.31236 -8.405417 545.954
## 87608 -37.31208 -8.405417 545.913
## 87609 -37.31180 -8.405417 545.447
## 87610 -37.31152 -8.405417 544.695
## 87611 -37.31125 -8.405417 543.622
## 87612 -37.31097 -8.405417 542.751
## 87613 -37.31069 -8.405417 541.885
## 87614 -37.31041 -8.405417 541.655
## 87615 -37.31013 -8.405417 542.179
## 87616 -37.30986 -8.405417 543.371
## 87617 -37.30958 -8.405417 544.980
## 87618 -37.30930 -8.405417 546.495
## 87619 -37.30902 -8.405417 547.506
## 87620 -37.30875 -8.405417 548.050
## 87621 -37.30847 -8.405417 547.862
## 87622 -37.30819 -8.405417 547.474
## 87623 -37.30791 -8.405417 546.552
## 87624 -37.30763 -8.405417 545.542
## 87625 -37.30736 -8.405417 544.723
## 87626 -37.30708 -8.405417 544.059
## 87627 -37.30680 -8.405417 543.712
## 87628 -37.30652 -8.405417 543.483
## 87629 -37.30625 -8.405417 543.562
## 87630 -37.30597 -8.405417 543.790
## 87631 -37.30569 -8.405417 544.029
## 87632 -37.30541 -8.405417 544.543
## 87633 -37.30513 -8.405417 545.518
## 87634 -37.30486 -8.405417 547.186
## 87635 -37.30458 -8.405417 549.083
## 87636 -37.30430 -8.405417 550.885
## 87637 -37.30402 -8.405417 552.385
## 87638 -37.30375 -8.405417 553.313
## 87639 -37.30347 -8.405417 553.504
## 87640 -37.30319 -8.405417 552.818
## 87641 -37.30291 -8.405417 551.805
## 87642 -37.30263 -8.405417 551.096
## 87643 -37.30236 -8.405417 551.240
## 87644 -37.30208 -8.405417 551.695
## 87645 -37.30180 -8.405417 552.014
## 87646 -37.30152 -8.405417 551.896
## 87647 -37.30125 -8.405417 551.563
## 87648 -37.30097 -8.405417 551.195
## 87649 -37.30069 -8.405417 550.938
## 87650 -37.30041 -8.405417 550.833
## 87651 -37.30013 -8.405417 550.904
## 87652 -37.29986 -8.405417 551.163
## 87653 -37.29958 -8.405417 551.328
## 87654 -37.29930 -8.405417 551.110
## 87655 -37.29902 -8.405417 550.227
## 87656 -37.29875 -8.405417 549.279
## 87657 -37.29847 -8.405417 548.662
## 87658 -37.29819 -8.405417 548.770
## 87659 -37.29791 -8.405417 549.245
## 87660 -37.29763 -8.405417 549.735
## 87661 -37.29736 -8.405417 549.786
## 87662 -37.29708 -8.405417 549.912
## 87663 -37.29680 -8.405417 550.238
## 87664 -37.29652 -8.405417 551.440
## 87665 -37.29625 -8.405417 552.816
## 87666 -37.29597 -8.405417 554.133
## 87667 -37.29569 -8.405417 554.901
## 87668 -37.29541 -8.405417 555.455
## 87669 -37.29513 -8.405417 555.949
## 87670 -37.29486 -8.405417 556.581
## 87671 -37.29458 -8.405417 556.991
## 87672 -37.29430 -8.405417 556.998
## 87673 -37.29402 -8.405417 556.043
## 87674 -37.29375 -8.405417 554.914
## 87675 -37.29347 -8.405417 553.684
## 87676 -37.29319 -8.405417 552.888
## 87677 -37.29291 -8.405417 552.501
## 87678 -37.29263 -8.405417 552.819
## 87679 -37.29236 -8.405417 554.047
## 87680 -37.29208 -8.405417 555.543
## 87681 -37.29180 -8.405417 556.706
## 87682 -37.29152 -8.405417 557.296
## 87683 -37.29125 -8.405417 557.357
## 87684 -37.29097 -8.405417 557.042
## 87685 -37.29069 -8.405417 556.858
## 87686 -37.29041 -8.405417 556.409
## 87687 -37.29013 -8.405417 555.701
## 87688 -37.28986 -8.405417 554.598
## 87689 -37.28958 -8.405417 553.536
## 87690 -37.28930 -8.405417 552.772
## 87691 -37.28902 -8.405417 552.573
## 87692 -37.28875 -8.405417 552.773
## 87693 -37.28847 -8.405417 553.269
## 87694 -37.28819 -8.405417 553.577
## 87695 -37.28791 -8.405417 553.859
## 87696 -37.28763 -8.405417 553.843
## 87697 -37.28736 -8.405417 553.338
## 87698 -37.28708 -8.405417 552.819
## 87699 -37.28680 -8.405417 552.531
## 87700 -37.28652 -8.405417 553.377
## 87701 -37.28625 -8.405417 554.245
## 87702 -37.28597 -8.405417 555.223
## 87703 -37.28569 -8.405417 555.264
## 87704 -37.28541 -8.405417 555.385
## 87705 -37.28513 -8.405417 555.590
## 87706 -37.28486 -8.405417 556.080
## 87707 -37.28458 -8.405417 556.796
## 87708 -37.28430 -8.405417 557.626
## 87709 -37.28402 -8.405417 558.976
## 87710 -37.28375 -8.405417 560.030
## 87711 -37.28347 -8.405417 560.694
## 87712 -37.28319 -8.405417 560.561
## 87713 -37.28291 -8.405417 560.226
## 87714 -37.28263 -8.405417 560.056
## 87715 -37.28236 -8.405417 560.486
## 87716 -37.28208 -8.405417 561.125
## 87717 -37.28180 -8.405417 561.833
## 87718 -37.28152 -8.405417 562.107
## 87719 -37.28125 -8.405417 562.466
## 87720 -37.28097 -8.405417 562.807
## 87721 -37.28069 -8.405417 563.553
## 87722 -37.28041 -8.405417 564.283
## 87723 -37.28013 -8.405417 565.044
## 87724 -37.27986 -8.405417 565.816
## 87725 -37.27958 -8.405417 566.556
## 87726 -37.27930 -8.405417 567.435
## 87727 -37.27902 -8.405417 567.918
## 87728 -37.27875 -8.405417 568.493
## 87729 -37.27847 -8.405417 568.802
## 87730 -37.27819 -8.405417 569.329
## 87731 -37.27791 -8.405417 569.568
## 87732 -37.27763 -8.405417 569.720
## 87733 -37.27736 -8.405417 569.821
## 87734 -37.27708 -8.405417 569.813
## 87735 -37.27680 -8.405417 569.773
## 87736 -37.27652 -8.405417 569.166
## 87737 -37.27625 -8.405417 568.727
## 87738 -37.27597 -8.405417 568.242
## 87739 -37.27569 -8.405417 568.561
## 87740 -37.27541 -8.405417 568.786
## 87741 -37.27513 -8.405417 568.953
## 87742 -37.27486 -8.405417 568.833
## 87743 -37.27458 -8.405417 568.774
## 87744 -37.27430 -8.405417 569.096
## 87745 -37.27402 -8.405417 569.785
## 87746 -37.27375 -8.405417 570.589
## 87747 -37.27347 -8.405417 571.196
## 87748 -37.27319 -8.405417 571.078
## 87749 -37.27291 -8.405417 570.792
## 87750 -37.27263 -8.405417 570.555
## 87751 -37.27236 -8.405417 570.665
## 87752 -37.27208 -8.405417 570.758
## 87753 -37.27180 -8.405417 570.546
## 87754 -37.27152 -8.405417 569.899
## 87755 -37.27125 -8.405417 569.075
## 87756 -37.27097 -8.405417 568.317
## 87757 -37.27069 -8.405417 567.843
## 87758 -37.27041 -8.405417 567.401
## 87759 -37.27013 -8.405417 566.770
## 87760 -37.26986 -8.405417 565.712
## 87761 -37.26958 -8.405417 564.571
## 87762 -37.26930 -8.405417 563.525
## 87763 -37.26902 -8.405417 562.855
## 87764 -37.26875 -8.405417 562.407
## 87765 -37.26847 -8.405417 562.152
## 87766 -37.26819 -8.405417 561.786
## 87767 -37.26791 -8.405417 561.785
## 87768 -37.26763 -8.405417 562.270
## 87769 -37.26736 -8.405417 563.647
## 87770 -37.26708 -8.405417 565.132
## 87771 -37.26680 -8.405417 566.316
## 87772 -37.26652 -8.405417 566.571
## 87773 -37.26625 -8.405417 566.349
## 87774 -37.26597 -8.405417 565.622
## 87775 -37.26569 -8.405417 564.847
## 87776 -37.26541 -8.405417 563.792
## 87777 -37.26513 -8.405417 562.645
## 87778 -37.26486 -8.405417 561.528
## 87779 -37.26458 -8.405417 560.553
## 87780 -37.26430 -8.405417 559.797
## 87781 -37.26402 -8.405417 559.438
## 87782 -37.26375 -8.405417 559.239
## 87783 -37.26347 -8.405417 559.168
## 87784 -37.26319 -8.405417 558.919
## 87785 -37.26291 -8.405417 558.920
## 87786 -37.26263 -8.405417 559.349
## 87787 -37.26236 -8.405417 560.484
## 87788 -37.26208 -8.405417 561.571
## 87789 -37.26180 -8.405417 562.225
## 87790 -37.26152 -8.405417 561.485
## 87791 -37.26125 -8.405417 560.314
## 87792 -37.26097 -8.405417 559.185
## 87793 -37.26069 -8.405417 558.830
## 87794 -37.26041 -8.405417 558.754
## 87795 -37.26013 -8.405417 558.908
## 87796 -37.25986 -8.405417 558.615
## 87797 -37.25958 -8.405417 558.309
## 87798 -37.25930 -8.405417 557.587
## 87799 -37.25902 -8.405417 556.792
## 87800 -37.25875 -8.405417 555.961
## 87801 -37.25847 -8.405417 555.439
## 87802 -37.25819 -8.405417 555.856
## 87803 -37.25791 -8.405417 556.531
## 87804 -37.25763 -8.405417 557.276
## 87805 -37.25736 -8.405417 557.768
## 87806 -37.25708 -8.405417 558.234
## 87807 -37.25680 -8.405417 558.785
## 87808 -37.25652 -8.405417 559.403
## 87809 -37.25625 -8.405417 560.204
## 87810 -37.25597 -8.405417 561.096
## 87811 -37.25569 -8.405417 562.500
## 87812 -37.25541 -8.405417 563.756
## 87813 -37.25513 -8.405417 564.698
## 87814 -37.25486 -8.405417 564.959
## 87815 -37.25458 -8.405417 564.906
## 87816 -37.25430 -8.405417 564.806
## 87817 -37.25402 -8.405417 564.503
## 87818 -37.25375 -8.405417 564.483
## 87819 -37.25347 -8.405417 564.714
## 87820 -37.25319 -8.405417 565.716
## 87821 -37.25291 -8.405417 566.787
## 87822 -37.25263 -8.405417 567.636
## 87823 -37.25236 -8.405417 567.941
## 87824 -37.25208 -8.405417 568.158
## 87825 -37.25180 -8.405417 568.869
## 87826 -37.25152 -8.405417 569.848
## 87827 -37.25125 -8.405417 571.089
## 87828 -37.25097 -8.405417 572.284
## 87829 -37.25069 -8.405417 572.591
## 87830 -37.25041 -8.405417 572.702
## 87831 -37.25013 -8.405417 572.543
## 87832 -37.24986 -8.405417 572.220
## 87833 -37.24958 -8.405417 571.772
## 87834 -37.24930 -8.405417 571.182
## 87835 -37.24902 -8.405417 570.690
## 87836 -37.24875 -8.405417 570.300
## 87837 -37.24847 -8.405417 570.078
## 87838 -37.24819 -8.405417 570.621
## 87839 -37.24791 -8.405417 571.201
## 87840 -37.24763 -8.405417 571.744
## 87841 -37.24736 -8.405417 572.040
## 87842 -37.24708 -8.405417 572.408
## 87843 -37.24680 -8.405417 573.105
## 87844 -37.24652 -8.405417 574.248
## 87845 -37.24625 -8.405417 575.671
## 87846 -37.24597 -8.405417 577.076
## 87847 -37.24569 -8.405417 578.588
## 87848 -37.24541 -8.405417 579.835
## 87849 -37.24513 -8.405417 580.863
## 87850 -37.24486 -8.405417 581.603
## 87851 -37.24458 -8.405417 582.201
## 87852 -37.24430 -8.405417 582.966
## 87853 -37.24402 -8.405417 583.437
## 87854 -37.24375 -8.405417 584.167
## 87855 -37.24347 -8.405417 584.932
## 87856 -37.24319 -8.405417 585.817
## 87857 -37.24291 -8.405417 586.601
## 87858 -37.24263 -8.405417 587.191
## 87859 -37.24236 -8.405417 587.456
## 87860 -37.24208 -8.405417 587.550
## 87861 -37.24180 -8.405417 587.554
## 87862 -37.24152 -8.405417 587.557
## 87863 -37.24125 -8.405417 587.504
## 87864 -37.24097 -8.405417 587.549
## 87865 -37.24069 -8.405417 587.181
## 87866 -37.24041 -8.405417 586.890
## 87867 -37.24013 -8.405417 586.509
## 87868 -37.23986 -8.405417 586.085
## 87869 -37.23958 -8.405417 585.660
## 87870 -37.23930 -8.405417 585.279
## 87871 -37.23902 -8.405417 585.115
## 87872 -37.23875 -8.405417 584.937
## 87873 -37.23847 -8.405417 584.689
## 87874 -37.23819 -8.405417 584.274
## 87875 -37.23791 -8.405417 583.539
## 87876 -37.23763 -8.405417 582.342
## 87877 -37.23736 -8.405417 580.552
## 87878 -37.23708 -8.405417 578.622
## 87879 -37.23680 -8.405417 576.859
## 87880 -37.23652 -8.405417 575.764
## 87881 -37.23625 -8.405417 574.924
## 87882 -37.23597 -8.405417 574.434
## 87883 -37.23569 -8.405417 573.788
## 87884 -37.23541 -8.405417 573.265
## 87885 -37.23513 -8.405417 572.614
## 87886 -37.23486 -8.405417 571.716
## 87887 -37.23458 -8.405417 570.716
## 87888 -37.23430 -8.405417 569.761
## 87889 -37.23402 -8.405417 568.855
## 87890 -37.23375 -8.405417 568.149
## 87891 -37.23347 -8.405417 567.427
## 87892 -37.23319 -8.405417 567.307
## 87893 -37.23291 -8.405417 567.379
## 87894 -37.23263 -8.405417 567.890
## 87895 -37.23236 -8.405417 569.207
## 87896 -37.23208 -8.405417 570.694
## 87897 -37.23180 -8.405417 572.244
## 87898 -37.23152 -8.405417 573.293
## 87899 -37.23125 -8.405417 574.112
## 87900 -37.23097 -8.405417 574.704
## 87901 -37.23069 -8.405417 574.656
## 87902 -37.23041 -8.405417 574.434
## 87903 -37.23013 -8.405417 573.937
## 87904 -37.22986 -8.405417 573.211
## 87905 -37.22958 -8.405417 572.423
## 87906 -37.22930 -8.405417 571.731
## 87907 -37.22902 -8.405417 571.243
## 87908 -37.22875 -8.405417 570.933
## 87909 -37.22847 -8.405417 570.832
## 87910 -37.22819 -8.405417 570.719
## 87911 -37.22791 -8.405417 570.888
## 87912 -37.22763 -8.405417 571.369
## 87913 -37.22736 -8.405417 572.275
## 87914 -37.22708 -8.405417 573.298
## 87915 -37.22680 -8.405417 574.118
## 87916 -37.22652 -8.405417 574.919
## 87917 -37.22625 -8.405417 575.298
## 87918 -37.22597 -8.405417 575.316
## 87919 -37.22569 -8.405417 575.202
## 87920 -37.22541 -8.405417 574.631
## 87921 -37.22513 -8.405417 573.637
## 87922 -37.22486 -8.405417 572.107
## 87923 -37.22458 -8.405417 570.476
## 87924 -37.22430 -8.405417 569.099
## 87925 -37.22402 -8.405417 567.901
## 87926 -37.22375 -8.405417 567.318
## 88782 -37.36236 -8.405694 523.128
## 88783 -37.36208 -8.405694 523.118
## 88784 -37.36180 -8.405694 523.099
## 88785 -37.36152 -8.405694 523.583
## 88786 -37.36125 -8.405694 524.108
## 88787 -37.36097 -8.405694 524.639
## 88788 -37.36069 -8.405694 524.952
## 88789 -37.36041 -8.405694 524.710
## 88790 -37.36013 -8.405694 524.368
## 88791 -37.35986 -8.405694 523.913
## 88792 -37.35958 -8.405694 523.747
## 88793 -37.35930 -8.405694 523.770
## 88794 -37.35902 -8.405694 524.385
## 88795 -37.35875 -8.405694 525.034
## 88796 -37.35847 -8.405694 525.415
## 88797 -37.35819 -8.405694 524.787
## 88798 -37.35791 -8.405694 523.768
## 88799 -37.35763 -8.405694 522.773
## 88800 -37.35736 -8.405694 522.783
## 88801 -37.35708 -8.405694 523.278
## 88802 -37.35680 -8.405694 524.076
## 88803 -37.35652 -8.405694 524.957
## 88804 -37.35625 -8.405694 525.852
## 88805 -37.35597 -8.405694 526.905
## 88806 -37.35569 -8.405694 527.886
## 88807 -37.35541 -8.405694 528.646
## 88808 -37.35513 -8.405694 529.429
## 88809 -37.35486 -8.405694 529.927
## 88810 -37.35458 -8.405694 530.396
## 88811 -37.35430 -8.405694 530.380
## 88812 -37.35402 -8.405694 530.385
## 88813 -37.35375 -8.405694 530.487
## 88814 -37.35347 -8.405694 530.655
## 88815 -37.35319 -8.405694 531.173
## 88816 -37.35291 -8.405694 531.761
## 88817 -37.35263 -8.405694 532.440
## 88818 -37.35236 -8.405694 532.512
## 88819 -37.35208 -8.405694 532.232
## 88820 -37.35180 -8.405694 531.920
## 88821 -37.35152 -8.405694 531.749
## 88822 -37.35125 -8.405694 531.921
## 88823 -37.35097 -8.405694 532.205
## 88824 -37.35069 -8.405694 532.332
## 88825 -37.35041 -8.405694 532.841
## 88826 -37.35013 -8.405694 533.643
## 88827 -37.34986 -8.405694 534.469
## 88828 -37.34958 -8.405694 535.116
## 88829 -37.34930 -8.405694 535.570
## 88830 -37.34902 -8.405694 535.855
## 88831 -37.34875 -8.405694 535.991
## 88832 -37.34847 -8.405694 535.887
## 88833 -37.34819 -8.405694 535.576
## 88834 -37.34791 -8.405694 535.212
## 88835 -37.34763 -8.405694 534.813
## 88836 -37.34736 -8.405694 534.514
## 88837 -37.34708 -8.405694 534.198
## 88838 -37.34680 -8.405694 533.767
## 88839 -37.34652 -8.405694 533.013
## 88840 -37.34625 -8.405694 532.180
## 88841 -37.34597 -8.405694 531.441
## 88842 -37.34569 -8.405694 531.018
## 88843 -37.34541 -8.405694 530.832
## 88844 -37.34513 -8.405694 530.834
## 88845 -37.34486 -8.405694 531.166
## 88846 -37.34458 -8.405694 531.507
## 88847 -37.34430 -8.405694 531.481
## 88848 -37.34402 -8.405694 531.004
## 88849 -37.34375 -8.405694 530.371
## 88850 -37.34347 -8.405694 529.867
## 88851 -37.34319 -8.405694 529.708
## 88852 -37.34291 -8.405694 529.829
## 88853 -37.34263 -8.405694 530.043
## 88854 -37.34236 -8.405694 530.198
## 88855 -37.34208 -8.405694 530.062
## 88856 -37.34180 -8.405694 529.779
## 88857 -37.34152 -8.405694 529.414
## 88858 -37.34125 -8.405694 529.073
## 88859 -37.34097 -8.405694 528.780
## 88860 -37.34069 -8.405694 529.139
## 88861 -37.34041 -8.405694 529.596
## 88862 -37.34013 -8.405694 530.336
## 88863 -37.33986 -8.405694 530.539
## 88864 -37.33958 -8.405694 530.681
## 88865 -37.33930 -8.405694 530.627
## 88866 -37.33902 -8.405694 530.305
## 88867 -37.33875 -8.405694 530.339
## 88868 -37.33847 -8.405694 530.526
## 88869 -37.33819 -8.405694 531.098
## 88870 -37.33791 -8.405694 531.722
## 88871 -37.33763 -8.405694 532.660
## 88872 -37.33736 -8.405694 533.442
## 88873 -37.33708 -8.405694 534.044
## 88874 -37.33680 -8.405694 534.388
## 88875 -37.33652 -8.405694 534.557
## 88876 -37.33625 -8.405694 534.811
## 88877 -37.33597 -8.405694 535.023
## 88878 -37.33569 -8.405694 535.174
## 88879 -37.33541 -8.405694 535.305
## 88880 -37.33513 -8.405694 535.434
## 88881 -37.33486 -8.405694 535.232
## 88882 -37.33458 -8.405694 535.157
## 88883 -37.33430 -8.405694 535.297
## 88884 -37.33402 -8.405694 535.922
## 88885 -37.33375 -8.405694 536.897
## 88886 -37.33347 -8.405694 537.887
## 88887 -37.33319 -8.405694 539.089
## 88888 -37.33291 -8.405694 540.209
## 88889 -37.33263 -8.405694 540.993
## 88890 -37.33236 -8.405694 540.886
## 88891 -37.33208 -8.405694 540.308
## 88892 -37.33180 -8.405694 539.638
## 88893 -37.33152 -8.405694 539.315
## 88894 -37.33125 -8.405694 539.009
## 88895 -37.33097 -8.405694 538.706
## 88896 -37.33069 -8.405694 538.193
## 88897 -37.33041 -8.405694 537.774
## 88898 -37.33013 -8.405694 537.860
## 88899 -37.32986 -8.405694 538.296
## 88900 -37.32958 -8.405694 538.849
## 88901 -37.32930 -8.405694 539.091
## 88902 -37.32902 -8.405694 539.225
## 88903 -37.32875 -8.405694 539.182
## 88904 -37.32847 -8.405694 538.760
## 88905 -37.32819 -8.405694 538.204
## 88906 -37.32791 -8.405694 537.732
## 88907 -37.32763 -8.405694 537.897
## 88908 -37.32736 -8.405694 538.957
## 88909 -37.32708 -8.405694 540.082
## 88910 -37.32680 -8.405694 541.204
## 88911 -37.32652 -8.405694 541.716
## 88912 -37.32625 -8.405694 542.064
## 88913 -37.32597 -8.405694 542.176
## 88914 -37.32569 -8.405694 541.943
## 88915 -37.32541 -8.405694 541.658
## 88916 -37.32513 -8.405694 541.016
## 88917 -37.32486 -8.405694 540.296
## 88918 -37.32458 -8.405694 539.846
## 88919 -37.32430 -8.405694 539.657
## 88920 -37.32402 -8.405694 540.389
## 88921 -37.32375 -8.405694 541.282
## 88922 -37.32347 -8.405694 542.485
## 88923 -37.32319 -8.405694 543.332
## 88924 -37.32291 -8.405694 543.996
## 88925 -37.32263 -8.405694 544.512
## 88926 -37.32236 -8.405694 544.874
## 88927 -37.32208 -8.405694 545.090
## 88928 -37.32180 -8.405694 545.012
## 88929 -37.32152 -8.405694 544.761
## 88930 -37.32125 -8.405694 544.575
## 88931 -37.32097 -8.405694 544.559
## 88932 -37.32069 -8.405694 544.801
## 88933 -37.32041 -8.405694 545.272
## 88934 -37.32013 -8.405694 545.766
## 88935 -37.31986 -8.405694 546.574
## 88936 -37.31958 -8.405694 547.228
## 88937 -37.31930 -8.405694 547.340
## 88938 -37.31902 -8.405694 546.943
## 88939 -37.31875 -8.405694 546.325
## 88940 -37.31847 -8.405694 545.976
## 88941 -37.31819 -8.405694 546.184
## 88942 -37.31791 -8.405694 546.431
## 88943 -37.31763 -8.405694 546.844
## 88944 -37.31736 -8.405694 547.189
## 88945 -37.31708 -8.405694 547.762
## 88946 -37.31680 -8.405694 548.697
## 88947 -37.31652 -8.405694 550.393
## 88948 -37.31625 -8.405694 552.052
## 88949 -37.31597 -8.405694 553.348
## 88950 -37.31569 -8.405694 552.906
## 88951 -37.31541 -8.405694 551.983
## 88952 -37.31513 -8.405694 550.578
## 88953 -37.31486 -8.405694 549.179
## 88954 -37.31458 -8.405694 548.425
## 88955 -37.31430 -8.405694 547.989
## 88956 -37.31402 -8.405694 548.364
## 88957 -37.31375 -8.405694 548.650
## 88958 -37.31347 -8.405694 549.345
## 88959 -37.31319 -8.405694 548.883
## 88960 -37.31291 -8.405694 548.097
## 88961 -37.31263 -8.405694 547.215
## 88962 -37.31236 -8.405694 546.822
## 88963 -37.31208 -8.405694 546.547
## 88964 -37.31180 -8.405694 545.937
## 88965 -37.31152 -8.405694 544.793
## 88966 -37.31125 -8.405694 543.775
## 88967 -37.31097 -8.405694 542.830
## 88968 -37.31069 -8.405694 542.298
## 88969 -37.31041 -8.405694 542.157
## 88970 -37.31013 -8.405694 542.772
## 88971 -37.30986 -8.405694 544.389
## 88972 -37.30958 -8.405694 546.122
## 88973 -37.30930 -8.405694 547.926
## 88974 -37.30902 -8.405694 548.974
## 88975 -37.30875 -8.405694 549.501
## 88976 -37.30847 -8.405694 549.383
## 88977 -37.30819 -8.405694 548.627
## 88978 -37.30791 -8.405694 547.658
## 88979 -37.30763 -8.405694 546.185
## 88980 -37.30736 -8.405694 545.064
## 88981 -37.30708 -8.405694 544.258
## 88982 -37.30680 -8.405694 544.036
## 88983 -37.30652 -8.405694 543.951
## 88984 -37.30625 -8.405694 543.977
## 88985 -37.30597 -8.405694 544.093
## 88986 -37.30569 -8.405694 544.231
## 88987 -37.30541 -8.405694 544.726
## 88988 -37.30513 -8.405694 545.527
## 88989 -37.30486 -8.405694 547.200
## 88990 -37.30458 -8.405694 549.105
## 88991 -37.30430 -8.405694 551.182
## 88992 -37.30402 -8.405694 553.154
## 88993 -37.30375 -8.405694 554.308
## 88994 -37.30347 -8.405694 554.422
## 88995 -37.30319 -8.405694 553.783
## 88996 -37.30291 -8.405694 552.953
## 88997 -37.30263 -8.405694 552.349
## 88998 -37.30236 -8.405694 552.521
## 88999 -37.30208 -8.405694 552.779
## 89000 -37.30180 -8.405694 552.916
## 89001 -37.30152 -8.405694 552.674
## 89002 -37.30125 -8.405694 552.293
## 89003 -37.30097 -8.405694 551.903
## 89004 -37.30069 -8.405694 551.507
## 89005 -37.30041 -8.405694 551.300
## 89006 -37.30013 -8.405694 551.367
## 89007 -37.29986 -8.405694 551.745
## 89008 -37.29958 -8.405694 551.915
## 89009 -37.29930 -8.405694 551.619
## 89010 -37.29902 -8.405694 550.850
## 89011 -37.29875 -8.405694 549.888
## 89012 -37.29847 -8.405694 549.140
## 89013 -37.29819 -8.405694 549.302
## 89014 -37.29791 -8.405694 549.602
## 89015 -37.29763 -8.405694 549.866
## 89016 -37.29736 -8.405694 549.879
## 89017 -37.29708 -8.405694 550.073
## 89018 -37.29680 -8.405694 550.663
## 89019 -37.29652 -8.405694 551.967
## 89020 -37.29625 -8.405694 553.388
## 89021 -37.29597 -8.405694 554.563
## 89022 -37.29569 -8.405694 555.294
## 89023 -37.29541 -8.405694 555.850
## 89024 -37.29513 -8.405694 556.337
## 89025 -37.29486 -8.405694 557.037
## 89026 -37.29458 -8.405694 557.528
## 89027 -37.29430 -8.405694 557.741
## 89028 -37.29402 -8.405694 557.081
## 89029 -37.29375 -8.405694 555.948
## 89030 -37.29347 -8.405694 554.564
## 89031 -37.29319 -8.405694 553.477
## 89032 -37.29291 -8.405694 553.011
## 89033 -37.29263 -8.405694 553.345
## 89034 -37.29236 -8.405694 554.628
## 89035 -37.29208 -8.405694 556.249
## 89036 -37.29180 -8.405694 557.693
## 89037 -37.29152 -8.405694 558.221
## 89038 -37.29125 -8.405694 558.272
## 89039 -37.29097 -8.405694 557.849
## 89040 -37.29069 -8.405694 557.379
## 89041 -37.29041 -8.405694 556.681
## 89042 -37.29013 -8.405694 555.730
## 89043 -37.28986 -8.405694 554.424
## 89044 -37.28958 -8.405694 553.308
## 89045 -37.28930 -8.405694 552.435
## 89046 -37.28902 -8.405694 552.170
## 89047 -37.28875 -8.405694 552.406
## 89048 -37.28847 -8.405694 553.163
## 89049 -37.28819 -8.405694 553.838
## 89050 -37.28791 -8.405694 554.331
## 89051 -37.28763 -8.405694 554.622
## 89052 -37.28736 -8.405694 554.236
## 89053 -37.28708 -8.405694 553.735
## 89054 -37.28680 -8.405694 553.231
## 89055 -37.28652 -8.405694 553.725
## 89056 -37.28625 -8.405694 554.535
## 89057 -37.28597 -8.405694 555.411
## 89058 -37.28569 -8.405694 555.517
## 89059 -37.28541 -8.405694 555.433
## 89060 -37.28513 -8.405694 555.573
## 89061 -37.28486 -8.405694 555.919
## 89062 -37.28458 -8.405694 556.360
## 89063 -37.28430 -8.405694 556.752
## 89064 -37.28402 -8.405694 557.497
## 89065 -37.28375 -8.405694 558.303
## 89066 -37.28347 -8.405694 558.955
## 89067 -37.28319 -8.405694 558.862
## 89068 -37.28291 -8.405694 558.672
## 89069 -37.28263 -8.405694 558.599
## 89070 -37.28236 -8.405694 559.203
## 89071 -37.28208 -8.405694 559.976
## 89072 -37.28180 -8.405694 560.935
## 89073 -37.28152 -8.405694 561.383
## 89074 -37.28125 -8.405694 561.710
## 89075 -37.28097 -8.405694 561.661
## 89076 -37.28069 -8.405694 562.359
## 89077 -37.28041 -8.405694 563.243
## 89078 -37.28013 -8.405694 564.227
## 89079 -37.27986 -8.405694 565.332
## 89080 -37.27958 -8.405694 566.342
## 89081 -37.27930 -8.405694 567.762
## 89082 -37.27902 -8.405694 568.846
## 89083 -37.27875 -8.405694 569.528
## 89084 -37.27847 -8.405694 569.596
## 89085 -37.27819 -8.405694 569.760
## 89086 -37.27791 -8.405694 569.968
## 89087 -37.27763 -8.405694 570.116
## 89088 -37.27736 -8.405694 570.332
## 89089 -37.27708 -8.405694 570.476
## 89090 -37.27680 -8.405694 570.628
## 89091 -37.27652 -8.405694 570.312
## 89092 -37.27625 -8.405694 569.808
## 89093 -37.27597 -8.405694 569.395
## 89094 -37.27569 -8.405694 569.441
## 89095 -37.27541 -8.405694 569.701
## 89096 -37.27513 -8.405694 569.773
## 89097 -37.27486 -8.405694 569.503
## 89098 -37.27458 -8.405694 569.450
## 89099 -37.27430 -8.405694 569.632
## 89100 -37.27402 -8.405694 570.430
## 89101 -37.27375 -8.405694 571.160
## 89102 -37.27347 -8.405694 571.933
## 89103 -37.27319 -8.405694 571.911
## 89104 -37.27291 -8.405694 571.689
## 89105 -37.27263 -8.405694 571.333
## 89106 -37.27236 -8.405694 571.386
## 89107 -37.27208 -8.405694 571.282
## 89108 -37.27180 -8.405694 570.765
## 89109 -37.27152 -8.405694 570.106
## 89110 -37.27125 -8.405694 569.342
## 89111 -37.27097 -8.405694 568.666
## 89112 -37.27069 -8.405694 568.242
## 89113 -37.27041 -8.405694 567.513
## 89114 -37.27013 -8.405694 566.434
## 89115 -37.26986 -8.405694 565.084
## 89116 -37.26958 -8.405694 563.823
## 89117 -37.26930 -8.405694 562.783
## 89118 -37.26902 -8.405694 562.268
## 89119 -37.26875 -8.405694 562.144
## 89120 -37.26847 -8.405694 562.478
## 89121 -37.26819 -8.405694 562.646
## 89122 -37.26791 -8.405694 562.907
## 89123 -37.26763 -8.405694 563.430
## 89124 -37.26736 -8.405694 564.677
## 89125 -37.26708 -8.405694 565.974
## 89126 -37.26680 -8.405694 566.924
## 89127 -37.26652 -8.405694 566.939
## 89128 -37.26625 -8.405694 566.570
## 89129 -37.26597 -8.405694 565.687
## 89130 -37.26569 -8.405694 564.879
## 89131 -37.26541 -8.405694 563.834
## 89132 -37.26513 -8.405694 562.735
## 89133 -37.26486 -8.405694 561.592
## 89134 -37.26458 -8.405694 560.524
## 89135 -37.26430 -8.405694 559.735
## 89136 -37.26402 -8.405694 559.378
## 89137 -37.26375 -8.405694 559.229
## 89138 -37.26347 -8.405694 559.164
## 89139 -37.26319 -8.405694 558.870
## 89140 -37.26291 -8.405694 558.804
## 89141 -37.26263 -8.405694 559.161
## 89142 -37.26236 -8.405694 560.361
## 89143 -37.26208 -8.405694 561.468
## 89144 -37.26180 -8.405694 562.230
## 89145 -37.26152 -8.405694 561.544
## 89146 -37.26125 -8.405694 560.576
## 89147 -37.26097 -8.405694 559.432
## 89148 -37.26069 -8.405694 559.337
## 89149 -37.26041 -8.405694 559.424
## 89150 -37.26013 -8.405694 559.770
## 89151 -37.25986 -8.405694 559.831
## 89152 -37.25958 -8.405694 559.471
## 89153 -37.25930 -8.405694 558.870
## 89154 -37.25902 -8.405694 557.780
## 89155 -37.25875 -8.405694 556.862
## 89156 -37.25847 -8.405694 555.926
## 89157 -37.25819 -8.405694 555.993
## 89158 -37.25791 -8.405694 556.444
## 89159 -37.25763 -8.405694 557.097
## 89160 -37.25736 -8.405694 557.506
## 89161 -37.25708 -8.405694 557.901
## 89162 -37.25680 -8.405694 558.417
## 89163 -37.25652 -8.405694 559.196
## 89164 -37.25625 -8.405694 560.059
## 89165 -37.25597 -8.405694 561.131
## 89166 -37.25569 -8.405694 562.272
## 89167 -37.25541 -8.405694 563.190
## 89168 -37.25513 -8.405694 563.562
## 89169 -37.25486 -8.405694 563.354
## 89170 -37.25458 -8.405694 563.353
## 89171 -37.25430 -8.405694 563.202
## 89172 -37.25402 -8.405694 563.173
## 89173 -37.25375 -8.405694 563.230
## 89174 -37.25347 -8.405694 563.963
## 89175 -37.25319 -8.405694 564.966
## 89176 -37.25291 -8.405694 566.007
## 89177 -37.25263 -8.405694 566.625
## 89178 -37.25236 -8.405694 566.697
## 89179 -37.25208 -8.405694 567.033
## 89180 -37.25180 -8.405694 567.634
## 89181 -37.25152 -8.405694 569.120
## 89182 -37.25125 -8.405694 570.554
## 89183 -37.25097 -8.405694 572.172
## 89184 -37.25069 -8.405694 573.006
## 89185 -37.25041 -8.405694 573.388
## 89186 -37.25013 -8.405694 573.494
## 89187 -37.24986 -8.405694 573.316
## 89188 -37.24958 -8.405694 572.944
## 89189 -37.24930 -8.405694 572.311
## 89190 -37.24902 -8.405694 571.509
## 89191 -37.24875 -8.405694 570.921
## 89192 -37.24847 -8.405694 570.463
## 89193 -37.24819 -8.405694 570.834
## 89194 -37.24791 -8.405694 571.400
## 89195 -37.24763 -8.405694 571.863
## 89196 -37.24736 -8.405694 572.082
## 89197 -37.24708 -8.405694 572.365
## 89198 -37.24680 -8.405694 573.301
## 89199 -37.24652 -8.405694 574.513
## 89200 -37.24625 -8.405694 575.718
## 89201 -37.24597 -8.405694 576.697
## 89202 -37.24569 -8.405694 577.615
## 89203 -37.24541 -8.405694 578.659
## 89204 -37.24513 -8.405694 579.404
## 89205 -37.24486 -8.405694 580.184
## 89206 -37.24458 -8.405694 581.051
## 89207 -37.24430 -8.405694 582.374
## 89208 -37.24402 -8.405694 583.652
## 89209 -37.24375 -8.405694 584.689
## 89210 -37.24347 -8.405694 585.665
## 89211 -37.24319 -8.405694 586.582
## 89212 -37.24291 -8.405694 587.331
## 89213 -37.24263 -8.405694 587.803
## 89214 -37.24236 -8.405694 587.897
## 89215 -37.24208 -8.405694 587.943
## 89216 -37.24180 -8.405694 587.772
## 89217 -37.24152 -8.405694 587.763
## 89218 -37.24125 -8.405694 587.764
## 89219 -37.24097 -8.405694 587.818
## 89220 -37.24069 -8.405694 587.787
## 89221 -37.24041 -8.405694 587.518
## 89222 -37.24013 -8.405694 587.195
## 89223 -37.23986 -8.405694 586.825
## 89224 -37.23958 -8.405694 586.260
## 89225 -37.23930 -8.405694 585.615
## 89226 -37.23902 -8.405694 585.130
## 89227 -37.23875 -8.405694 584.736
## 89228 -37.23847 -8.405694 584.345
## 89229 -37.23819 -8.405694 583.819
## 89230 -37.23791 -8.405694 583.054
## 89231 -37.23763 -8.405694 581.988
## 89232 -37.23736 -8.405694 580.224
## 89233 -37.23708 -8.405694 578.333
## 89234 -37.23680 -8.405694 576.455
## 89235 -37.23652 -8.405694 575.337
## 89236 -37.23625 -8.405694 574.607
## 89237 -37.23597 -8.405694 574.206
## 89238 -37.23569 -8.405694 573.951
## 89239 -37.23541 -8.405694 573.628
## 89240 -37.23513 -8.405694 573.259
## 89241 -37.23486 -8.405694 572.603
## 89242 -37.23458 -8.405694 571.653
## 89243 -37.23430 -8.405694 570.725
## 89244 -37.23402 -8.405694 569.779
## 89245 -37.23375 -8.405694 569.004
## 89246 -37.23347 -8.405694 568.420
## 89247 -37.23319 -8.405694 567.794
## 89248 -37.23291 -8.405694 567.754
## 89249 -37.23263 -8.405694 568.148
## 89250 -37.23236 -8.405694 569.175
## 89251 -37.23208 -8.405694 570.690
## 89252 -37.23180 -8.405694 572.048
## 89253 -37.23152 -8.405694 573.342
## 89254 -37.23125 -8.405694 574.237
## 89255 -37.23097 -8.405694 575.162
## 89256 -37.23069 -8.405694 575.513
## 89257 -37.23041 -8.405694 575.409
## 89258 -37.23013 -8.405694 574.927
## 89259 -37.22986 -8.405694 574.228
## 89260 -37.22958 -8.405694 573.511
## 89261 -37.22930 -8.405694 572.638
## 89262 -37.22902 -8.405694 572.243
## 89263 -37.22875 -8.405694 571.980
## 89264 -37.22847 -8.405694 572.122
## 89265 -37.22819 -8.405694 572.121
## 89266 -37.22791 -8.405694 572.230
## 89267 -37.22763 -8.405694 572.422
## 89268 -37.22736 -8.405694 573.135
## 89269 -37.22708 -8.405694 574.005
## 89270 -37.22680 -8.405694 574.814
## 89271 -37.22652 -8.405694 575.463
## 89272 -37.22625 -8.405694 575.803
## 89273 -37.22597 -8.405694 575.768
## 89274 -37.22569 -8.405694 575.440
## 89275 -37.22541 -8.405694 574.889
## 89276 -37.22513 -8.405694 574.091
## 89277 -37.22486 -8.405694 572.732
## 89278 -37.22458 -8.405694 571.214
## 89279 -37.22430 -8.405694 569.630
## 89280 -37.22402 -8.405694 568.429
## 89281 -37.22375 -8.405694 567.530
## 90136 -37.36263 -8.405972 524.021
## 90137 -37.36236 -8.405972 523.412
## 90138 -37.36208 -8.405972 523.187
## 90139 -37.36180 -8.405972 523.095
## 90140 -37.36152 -8.405972 523.869
## 90141 -37.36125 -8.405972 524.616
## 90142 -37.36097 -8.405972 525.297
## 90143 -37.36069 -8.405972 525.531
## 90144 -37.36041 -8.405972 525.127
## 90145 -37.36013 -8.405972 524.552
## 90146 -37.35986 -8.405972 524.414
## 90147 -37.35958 -8.405972 524.575
## 90148 -37.35930 -8.405972 524.810
## 90149 -37.35902 -8.405972 525.290
## 90150 -37.35875 -8.405972 525.702
## 90151 -37.35847 -8.405972 525.843
## 90152 -37.35819 -8.405972 525.277
## 90153 -37.35791 -8.405972 524.421
## 90154 -37.35763 -8.405972 523.473
## 90155 -37.35736 -8.405972 523.239
## 90156 -37.35708 -8.405972 523.375
## 90157 -37.35680 -8.405972 524.006
## 90158 -37.35652 -8.405972 524.915
## 90159 -37.35625 -8.405972 525.806
## 90160 -37.35597 -8.405972 526.911
## 90161 -37.35569 -8.405972 528.040
## 90162 -37.35541 -8.405972 528.994
## 90163 -37.35513 -8.405972 529.817
## 90164 -37.35486 -8.405972 530.605
## 90165 -37.35458 -8.405972 531.395
## 90166 -37.35430 -8.405972 531.503
## 90167 -37.35402 -8.405972 531.325
## 90168 -37.35375 -8.405972 531.128
## 90169 -37.35347 -8.405972 531.076
## 90170 -37.35319 -8.405972 532.007
## 90171 -37.35291 -8.405972 532.901
## 90172 -37.35263 -8.405972 533.613
## 90173 -37.35236 -8.405972 533.935
## 90174 -37.35208 -8.405972 533.818
## 90175 -37.35180 -8.405972 533.617
## 90176 -37.35152 -8.405972 532.908
## 90177 -37.35125 -8.405972 532.250
## 90178 -37.35097 -8.405972 531.927
## 90179 -37.35069 -8.405972 532.442
## 90180 -37.35041 -8.405972 533.415
## 90181 -37.35013 -8.405972 534.460
## 90182 -37.34986 -8.405972 535.222
## 90183 -37.34958 -8.405972 535.920
## 90184 -37.34930 -8.405972 536.413
## 90185 -37.34902 -8.405972 536.527
## 90186 -37.34875 -8.405972 536.390
## 90187 -37.34847 -8.405972 536.141
## 90188 -37.34819 -8.405972 535.805
## 90189 -37.34791 -8.405972 535.357
## 90190 -37.34763 -8.405972 534.877
## 90191 -37.34736 -8.405972 534.767
## 90192 -37.34708 -8.405972 534.746
## 90193 -37.34680 -8.405972 534.480
## 90194 -37.34652 -8.405972 533.782
## 90195 -37.34625 -8.405972 533.037
## 90196 -37.34597 -8.405972 532.358
## 90197 -37.34569 -8.405972 531.905
## 90198 -37.34541 -8.405972 531.549
## 90199 -37.34513 -8.405972 531.413
## 90200 -37.34486 -8.405972 531.897
## 90201 -37.34458 -8.405972 532.375
## 90202 -37.34430 -8.405972 532.516
## 90203 -37.34402 -8.405972 531.797
## 90204 -37.34375 -8.405972 531.021
## 90205 -37.34347 -8.405972 530.413
## 90206 -37.34319 -8.405972 530.776
## 90207 -37.34291 -8.405972 531.319
## 90208 -37.34263 -8.405972 531.934
## 90209 -37.34236 -8.405972 532.059
## 90210 -37.34208 -8.405972 531.926
## 90211 -37.34180 -8.405972 531.634
## 90212 -37.34152 -8.405972 531.385
## 90213 -37.34125 -8.405972 531.224
## 90214 -37.34097 -8.405972 531.143
## 90215 -37.34069 -8.405972 531.156
## 90216 -37.34041 -8.405972 531.375
## 90217 -37.34013 -8.405972 531.693
## 90218 -37.33986 -8.405972 532.331
## 90219 -37.33958 -8.405972 532.833
## 90220 -37.33930 -8.405972 533.038
## 90221 -37.33902 -8.405972 532.497
## 90222 -37.33875 -8.405972 532.305
## 90223 -37.33847 -8.405972 532.258
## 90224 -37.33819 -8.405972 532.919
## 90225 -37.33791 -8.405972 533.516
## 90226 -37.33763 -8.405972 534.496
## 90227 -37.33736 -8.405972 535.088
## 90228 -37.33708 -8.405972 535.503
## 90229 -37.33680 -8.405972 535.641
## 90230 -37.33652 -8.405972 536.042
## 90231 -37.33625 -8.405972 536.509
## 90232 -37.33597 -8.405972 536.817
## 90233 -37.33569 -8.405972 536.825
## 90234 -37.33541 -8.405972 536.738
## 90235 -37.33513 -8.405972 536.664
## 90236 -37.33486 -8.405972 536.537
## 90237 -37.33458 -8.405972 536.476
## 90238 -37.33430 -8.405972 536.544
## 90239 -37.33402 -8.405972 536.979
## 90240 -37.33375 -8.405972 537.735
## 90241 -37.33347 -8.405972 538.558
## 90242 -37.33319 -8.405972 539.695
## 90243 -37.33291 -8.405972 540.683
## 90244 -37.33263 -8.405972 541.329
## 90245 -37.33236 -8.405972 541.417
## 90246 -37.33208 -8.405972 541.070
## 90247 -37.33180 -8.405972 540.539
## 90248 -37.33152 -8.405972 540.137
## 90249 -37.33125 -8.405972 539.745
## 90250 -37.33097 -8.405972 539.415
## 90251 -37.33069 -8.405972 538.712
## 90252 -37.33041 -8.405972 538.129
## 90253 -37.33013 -8.405972 537.997
## 90254 -37.32986 -8.405972 538.896
## 90255 -37.32958 -8.405972 539.935
## 90256 -37.32930 -8.405972 540.629
## 90257 -37.32902 -8.405972 540.367
## 90258 -37.32875 -8.405972 539.915
## 90259 -37.32847 -8.405972 539.317
## 90260 -37.32819 -8.405972 539.220
## 90261 -37.32791 -8.405972 539.341
## 90262 -37.32763 -8.405972 539.942
## 90263 -37.32736 -8.405972 540.811
## 90264 -37.32708 -8.405972 541.761
## 90265 -37.32680 -8.405972 542.804
## 90266 -37.32652 -8.405972 543.307
## 90267 -37.32625 -8.405972 543.569
## 90268 -37.32597 -8.405972 543.532
## 90269 -37.32569 -8.405972 543.398
## 90270 -37.32541 -8.405972 543.205
## 90271 -37.32513 -8.405972 542.562
## 90272 -37.32486 -8.405972 541.615
## 90273 -37.32458 -8.405972 540.957
## 90274 -37.32430 -8.405972 540.605
## 90275 -37.32402 -8.405972 541.212
## 90276 -37.32375 -8.405972 541.956
## 90277 -37.32347 -8.405972 543.124
## 90278 -37.32319 -8.405972 544.107
## 90279 -37.32291 -8.405972 544.959
## 90280 -37.32263 -8.405972 545.559
## 90281 -37.32236 -8.405972 546.132
## 90282 -37.32208 -8.405972 546.539
## 90283 -37.32180 -8.405972 546.722
## 90284 -37.32152 -8.405972 546.146
## 90285 -37.32125 -8.405972 545.649
## 90286 -37.32097 -8.405972 545.440
## 90287 -37.32069 -8.405972 546.179
## 90288 -37.32041 -8.405972 547.282
## 90289 -37.32013 -8.405972 548.251
## 90290 -37.31986 -8.405972 548.661
## 90291 -37.31958 -8.405972 548.898
## 90292 -37.31930 -8.405972 548.829
## 90293 -37.31902 -8.405972 548.489
## 90294 -37.31875 -8.405972 547.899
## 90295 -37.31847 -8.405972 547.588
## 90296 -37.31819 -8.405972 547.846
## 90297 -37.31791 -8.405972 548.346
## 90298 -37.31763 -8.405972 548.886
## 90299 -37.31736 -8.405972 549.233
## 90300 -37.31708 -8.405972 549.837
## 90301 -37.31680 -8.405972 550.679
## 90302 -37.31652 -8.405972 552.277
## 90303 -37.31625 -8.405972 553.750
## 90304 -37.31597 -8.405972 554.946
## 90305 -37.31569 -8.405972 553.930
## 90306 -37.31541 -8.405972 552.243
## 90307 -37.31513 -8.405972 550.182
## 90308 -37.31486 -8.405972 549.370
## 90309 -37.31458 -8.405972 548.861
## 90310 -37.31430 -8.405972 549.125
## 90311 -37.31402 -8.405972 549.458
## 90312 -37.31375 -8.405972 549.821
## 90313 -37.31347 -8.405972 550.626
## 90314 -37.31319 -8.405972 549.999
## 90315 -37.31291 -8.405972 548.901
## 90316 -37.31263 -8.405972 547.848
## 90317 -37.31236 -8.405972 547.133
## 90318 -37.31208 -8.405972 546.671
## 90319 -37.31180 -8.405972 545.552
## 90320 -37.31152 -8.405972 544.646
## 90321 -37.31125 -8.405972 543.953
## 90322 -37.31097 -8.405972 543.185
## 90323 -37.31069 -8.405972 542.703
## 90324 -37.31041 -8.405972 542.614
## 90325 -37.31013 -8.405972 543.357
## 90326 -37.30986 -8.405972 544.926
## 90327 -37.30958 -8.405972 546.624
## 90328 -37.30930 -8.405972 548.467
## 90329 -37.30902 -8.405972 549.526
## 90330 -37.30875 -8.405972 550.069
## 90331 -37.30847 -8.405972 549.979
## 90332 -37.30819 -8.405972 549.497
## 90333 -37.30791 -8.405972 548.863
## 90334 -37.30763 -8.405972 547.616
## 90335 -37.30736 -8.405972 546.202
## 90336 -37.30708 -8.405972 545.116
## 90337 -37.30680 -8.405972 544.782
## 90338 -37.30652 -8.405972 544.725
## 90339 -37.30625 -8.405972 544.992
## 90340 -37.30597 -8.405972 544.934
## 90341 -37.30569 -8.405972 544.934
## 90342 -37.30541 -8.405972 545.235
## 90343 -37.30513 -8.405972 545.883
## 90344 -37.30486 -8.405972 547.496
## 90345 -37.30458 -8.405972 549.494
## 90346 -37.30430 -8.405972 551.568
## 90347 -37.30402 -8.405972 553.619
## 90348 -37.30375 -8.405972 554.895
## 90349 -37.30347 -8.405972 555.198
## 90350 -37.30319 -8.405972 554.976
## 90351 -37.30291 -8.405972 554.638
## 90352 -37.30263 -8.405972 554.298
## 90353 -37.30236 -8.405972 554.380
## 90354 -37.30208 -8.405972 554.495
## 90355 -37.30180 -8.405972 554.520
## 90356 -37.30152 -8.405972 554.076
## 90357 -37.30125 -8.405972 553.516
## 90358 -37.30097 -8.405972 553.018
## 90359 -37.30069 -8.405972 552.505
## 90360 -37.30041 -8.405972 552.083
## 90361 -37.30013 -8.405972 552.035
## 90362 -37.29986 -8.405972 552.473
## 90363 -37.29958 -8.405972 552.868
## 90364 -37.29930 -8.405972 552.685
## 90365 -37.29902 -8.405972 552.016
## 90366 -37.29875 -8.405972 551.284
## 90367 -37.29847 -8.405972 550.677
## 90368 -37.29819 -8.405972 550.447
## 90369 -37.29791 -8.405972 550.343
## 90370 -37.29763 -8.405972 550.232
## 90371 -37.29736 -8.405972 550.363
## 90372 -37.29708 -8.405972 550.638
## 90373 -37.29680 -8.405972 551.318
## 90374 -37.29652 -8.405972 552.550
## 90375 -37.29625 -8.405972 553.762
## 90376 -37.29597 -8.405972 554.832
## 90377 -37.29569 -8.405972 555.414
## 90378 -37.29541 -8.405972 555.744
## 90379 -37.29513 -8.405972 556.041
## 90380 -37.29486 -8.405972 556.816
## 90381 -37.29458 -8.405972 557.412
## 90382 -37.29430 -8.405972 557.716
## 90383 -37.29402 -8.405972 557.099
## 90384 -37.29375 -8.405972 556.061
## 90385 -37.29347 -8.405972 554.735
## 90386 -37.29319 -8.405972 553.530
## 90387 -37.29291 -8.405972 552.939
## 90388 -37.29263 -8.405972 553.169
## 90389 -37.29236 -8.405972 554.782
## 90390 -37.29208 -8.405972 556.757
## 90391 -37.29180 -8.405972 558.378
## 90392 -37.29152 -8.405972 558.957
## 90393 -37.29125 -8.405972 558.879
## 90394 -37.29097 -8.405972 558.550
## 90395 -37.29069 -8.405972 557.763
## 90396 -37.29041 -8.405972 556.612
## 90397 -37.29013 -8.405972 555.373
## 90398 -37.28986 -8.405972 554.145
## 90399 -37.28958 -8.405972 552.930
## 90400 -37.28930 -8.405972 552.233
## 90401 -37.28902 -8.405972 551.943
## 90402 -37.28875 -8.405972 552.195
## 90403 -37.28847 -8.405972 553.037
## 90404 -37.28819 -8.405972 553.926
## 90405 -37.28791 -8.405972 554.754
## 90406 -37.28763 -8.405972 555.198
## 90407 -37.28736 -8.405972 555.081
## 90408 -37.28708 -8.405972 554.846
## 90409 -37.28680 -8.405972 554.545
## 90410 -37.28652 -8.405972 554.627
## 90411 -37.28625 -8.405972 554.967
## 90412 -37.28597 -8.405972 555.584
## 90413 -37.28569 -8.405972 555.688
## 90414 -37.28541 -8.405972 555.605
## 90415 -37.28513 -8.405972 555.594
## 90416 -37.28486 -8.405972 555.675
## 90417 -37.28458 -8.405972 555.877
## 90418 -37.28430 -8.405972 556.088
## 90419 -37.28402 -8.405972 556.373
## 90420 -37.28375 -8.405972 556.757
## 90421 -37.28347 -8.405972 557.215
## 90422 -37.28319 -8.405972 557.389
## 90423 -37.28291 -8.405972 557.597
## 90424 -37.28263 -8.405972 557.833
## 90425 -37.28236 -8.405972 558.361
## 90426 -37.28208 -8.405972 559.158
## 90427 -37.28180 -8.405972 560.041
## 90428 -37.28152 -8.405972 560.745
## 90429 -37.28125 -8.405972 561.294
## 90430 -37.28097 -8.405972 561.389
## 90431 -37.28069 -8.405972 561.955
## 90432 -37.28041 -8.405972 562.691
## 90433 -37.28013 -8.405972 563.644
## 90434 -37.27986 -8.405972 565.077
## 90435 -37.27958 -8.405972 566.419
## 90436 -37.27930 -8.405972 568.060
## 90437 -37.27902 -8.405972 569.267
## 90438 -37.27875 -8.405972 570.085
## 90439 -37.27847 -8.405972 570.180
## 90440 -37.27819 -8.405972 570.154
## 90441 -37.27791 -8.405972 570.045
## 90442 -37.27763 -8.405972 570.058
## 90443 -37.27736 -8.405972 570.534
## 90444 -37.27708 -8.405972 570.807
## 90445 -37.27680 -8.405972 571.151
## 90446 -37.27652 -8.405972 570.864
## 90447 -37.27625 -8.405972 570.454
## 90448 -37.27597 -8.405972 570.073
## 90449 -37.27569 -8.405972 570.071
## 90450 -37.27541 -8.405972 570.299
## 90451 -37.27513 -8.405972 570.243
## 90452 -37.27486 -8.405972 570.290
## 90453 -37.27458 -8.405972 570.372
## 90454 -37.27430 -8.405972 570.898
## 90455 -37.27402 -8.405972 571.192
## 90456 -37.27375 -8.405972 571.623
## 90457 -37.27347 -8.405972 571.989
## 90458 -37.27319 -8.405972 572.277
## 90459 -37.27291 -8.405972 572.468
## 90460 -37.27263 -8.405972 572.473
## 90461 -37.27236 -8.405972 571.943
## 90462 -37.27208 -8.405972 571.651
## 90463 -37.27180 -8.405972 570.835
## 90464 -37.27152 -8.405972 570.504
## 90465 -37.27125 -8.405972 570.284
## 90466 -37.27097 -8.405972 569.909
## 90467 -37.27069 -8.405972 569.074
## 90468 -37.27041 -8.405972 567.936
## 90469 -37.27013 -8.405972 566.702
## 90470 -37.26986 -8.405972 564.956
## 90471 -37.26958 -8.405972 563.422
## 90472 -37.26930 -8.405972 562.206
## 90473 -37.26902 -8.405972 562.110
## 90474 -37.26875 -8.405972 562.650
## 90475 -37.26847 -8.405972 563.433
## 90476 -37.26819 -8.405972 563.847
## 90477 -37.26791 -8.405972 564.289
## 90478 -37.26763 -8.405972 565.037
## 90479 -37.26736 -8.405972 565.857
## 90480 -37.26708 -8.405972 566.605
## 90481 -37.26680 -8.405972 567.113
## 90482 -37.26652 -8.405972 567.305
## 90483 -37.26625 -8.405972 566.997
## 90484 -37.26597 -8.405972 566.289
## 90485 -37.26569 -8.405972 565.372
## 90486 -37.26541 -8.405972 564.211
## 90487 -37.26513 -8.405972 563.073
## 90488 -37.26486 -8.405972 561.817
## 90489 -37.26458 -8.405972 560.652
## 90490 -37.26430 -8.405972 559.740
## 90491 -37.26402 -8.405972 559.298
## 90492 -37.26375 -8.405972 559.098
## 90493 -37.26347 -8.405972 558.949
## 90494 -37.26319 -8.405972 558.675
## 90495 -37.26291 -8.405972 558.603
## 90496 -37.26263 -8.405972 559.128
## 90497 -37.26236 -8.405972 560.040
## 90498 -37.26208 -8.405972 561.168
## 90499 -37.26180 -8.405972 561.688
## 90500 -37.26152 -8.405972 561.494
## 90501 -37.26125 -8.405972 561.025
## 90502 -37.26097 -8.405972 560.408
## 90503 -37.26069 -8.405972 560.320
## 90504 -37.26041 -8.405972 560.320
## 90505 -37.26013 -8.405972 560.645
## 90506 -37.25986 -8.405972 560.728
## 90507 -37.25958 -8.405972 560.295
## 90508 -37.25930 -8.405972 559.567
## 90509 -37.25902 -8.405972 558.441
## 90510 -37.25875 -8.405972 557.407
## 90511 -37.25847 -8.405972 556.360
## 90512 -37.25819 -8.405972 556.200
## 90513 -37.25791 -8.405972 556.326
## 90514 -37.25763 -8.405972 556.764
## 90515 -37.25736 -8.405972 557.117
## 90516 -37.25708 -8.405972 557.559
## 90517 -37.25680 -8.405972 558.063
## 90518 -37.25652 -8.405972 558.890
## 90519 -37.25625 -8.405972 559.902
## 90520 -37.25597 -8.405972 561.283
## 90521 -37.25569 -8.405972 561.659
## 90522 -37.25541 -8.405972 561.774
## 90523 -37.25513 -8.405972 561.708
## 90524 -37.25486 -8.405972 561.793
## 90525 -37.25458 -8.405972 561.951
## 90526 -37.25430 -8.405972 562.196
## 90527 -37.25402 -8.405972 562.512
## 90528 -37.25375 -8.405972 563.184
## 90529 -37.25347 -8.405972 564.340
## 90530 -37.25319 -8.405972 564.974
## 90531 -37.25291 -8.405972 565.461
## 90532 -37.25263 -8.405972 565.650
## 90533 -37.25236 -8.405972 566.198
## 90534 -37.25208 -8.405972 566.766
## 90535 -37.25180 -8.405972 567.866
## 90536 -37.25152 -8.405972 569.125
## 90537 -37.25125 -8.405972 570.379
## 90538 -37.25097 -8.405972 572.065
## 90539 -37.25069 -8.405972 573.177
## 90540 -37.25041 -8.405972 573.854
## 90541 -37.25013 -8.405972 574.153
## 90542 -37.24986 -8.405972 574.129
## 90543 -37.24958 -8.405972 573.951
## 90544 -37.24930 -8.405972 573.390
## 90545 -37.24902 -8.405972 572.491
## 90546 -37.24875 -8.405972 571.790
## 90547 -37.24847 -8.405972 571.256
## 90548 -37.24819 -8.405972 571.660
## 90549 -37.24791 -8.405972 572.315
## 90550 -37.24763 -8.405972 572.772
## 90551 -37.24736 -8.405972 572.826
## 90552 -37.24708 -8.405972 572.828
## 90553 -37.24680 -8.405972 573.631
## 90554 -37.24652 -8.405972 574.778
## 90555 -37.24625 -8.405972 575.940
## 90556 -37.24597 -8.405972 576.651
## 90557 -37.24569 -8.405972 577.106
## 90558 -37.24541 -8.405972 577.634
## 90559 -37.24513 -8.405972 578.088
## 90560 -37.24486 -8.405972 579.315
## 90561 -37.24458 -8.405972 580.660
## 90562 -37.24430 -8.405972 582.411
## 90563 -37.24402 -8.405972 583.993
## 90564 -37.24375 -8.405972 585.379
## 90565 -37.24347 -8.405972 586.599
## 90566 -37.24319 -8.405972 587.341
## 90567 -37.24291 -8.405972 587.811
## 90568 -37.24263 -8.405972 588.123
## 90569 -37.24236 -8.405972 588.315
## 90570 -37.24208 -8.405972 588.413
## 90571 -37.24180 -8.405972 588.350
## 90572 -37.24152 -8.405972 588.293
## 90573 -37.24125 -8.405972 588.341
## 90574 -37.24097 -8.405972 588.376
## 90575 -37.24069 -8.405972 588.610
## 90576 -37.24041 -8.405972 588.657
## 90577 -37.24013 -8.405972 588.474
## 90578 -37.23986 -8.405972 587.723
## 90579 -37.23958 -8.405972 586.774
## 90580 -37.23930 -8.405972 585.797
## 90581 -37.23902 -8.405972 585.036
## 90582 -37.23875 -8.405972 584.276
## 90583 -37.23847 -8.405972 583.680
## 90584 -37.23819 -8.405972 583.152
## 90585 -37.23791 -8.405972 582.499
## 90586 -37.23763 -8.405972 581.425
## 90587 -37.23736 -8.405972 579.867
## 90588 -37.23708 -8.405972 578.204
## 90589 -37.23680 -8.405972 576.482
## 90590 -37.23652 -8.405972 575.347
## 90591 -37.23625 -8.405972 574.519
## 90592 -37.23597 -8.405972 574.163
## 90593 -37.23569 -8.405972 574.197
## 90594 -37.23541 -8.405972 574.174
## 90595 -37.23513 -8.405972 574.056
## 90596 -37.23486 -8.405972 573.352
## 90597 -37.23458 -8.405972 572.420
## 90598 -37.23430 -8.405972 571.372
## 90599 -37.23402 -8.405972 570.496
## 90600 -37.23375 -8.405972 569.790
## 90601 -37.23347 -8.405972 569.258
## 90602 -37.23319 -8.405972 568.447
## 90603 -37.23291 -8.405972 568.147
## 90604 -37.23263 -8.405972 568.285
## 90605 -37.23236 -8.405972 569.640
## 90606 -37.23208 -8.405972 571.478
## 90607 -37.23180 -8.405972 573.069
## 90608 -37.23152 -8.405972 573.962
## 90609 -37.23125 -8.405972 574.686
## 90610 -37.23097 -8.405972 575.447
## 90611 -37.23069 -8.405972 575.990
## 90612 -37.23041 -8.405972 576.150
## 90613 -37.23013 -8.405972 575.863
## 90614 -37.22986 -8.405972 575.080
## 90615 -37.22958 -8.405972 574.226
## 90616 -37.22930 -8.405972 573.417
## 90617 -37.22902 -8.405972 573.203
## 90618 -37.22875 -8.405972 573.158
## 90619 -37.22847 -8.405972 573.305
## 90620 -37.22819 -8.405972 573.376
## 90621 -37.22791 -8.405972 573.558
## 90622 -37.22763 -8.405972 573.820
## 90623 -37.22736 -8.405972 574.000
## 90624 -37.22708 -8.405972 574.375
## 90625 -37.22680 -8.405972 574.732
## 90626 -37.22652 -8.405972 575.496
## 90627 -37.22625 -8.405972 575.938
## 90628 -37.22597 -8.405972 576.090
## 90629 -37.22569 -8.405972 575.564
## 90630 -37.22541 -8.405972 574.784
## 90631 -37.22513 -8.405972 573.771
## 90632 -37.22486 -8.405972 573.155
## 90633 -37.22458 -8.405972 572.387
## 90634 -37.22430 -8.405972 571.183
## 90635 -37.22402 -8.405972 569.292
## 90636 -37.22375 -8.405972 567.830
## 91491 -37.36263 -8.406250 524.183
## 91492 -37.36236 -8.406250 523.728
## 91493 -37.36208 -8.406250 523.599
## 91494 -37.36180 -8.406250 523.884
## 91495 -37.36152 -8.406250 524.609
## 91496 -37.36125 -8.406250 525.376
## 91497 -37.36097 -8.406250 525.821
## 91498 -37.36069 -8.406250 525.737
## 91499 -37.36041 -8.406250 525.324
## 91500 -37.36013 -8.406250 524.914
## 91501 -37.35986 -8.406250 524.897
## 91502 -37.35958 -8.406250 525.107
## 91503 -37.35930 -8.406250 525.475
## 91504 -37.35902 -8.406250 526.041
## 91505 -37.35875 -8.406250 526.480
## 91506 -37.35847 -8.406250 526.563
## 91507 -37.35819 -8.406250 525.948
## 91508 -37.35791 -8.406250 525.069
## 91509 -37.35763 -8.406250 524.209
## 91510 -37.35736 -8.406250 523.923
## 91511 -37.35708 -8.406250 523.919
## 91512 -37.35680 -8.406250 524.408
## 91513 -37.35652 -8.406250 524.761
## 91514 -37.35625 -8.406250 525.482
## 91515 -37.35597 -8.406250 526.311
## 91516 -37.35569 -8.406250 527.326
## 91517 -37.35541 -8.406250 528.356
## 91518 -37.35513 -8.406250 529.408
## 91519 -37.35486 -8.406250 530.511
## 91520 -37.35458 -8.406250 531.435
## 91521 -37.35430 -8.406250 531.821
## 91522 -37.35402 -8.406250 531.884
## 91523 -37.35375 -8.406250 531.734
## 91524 -37.35347 -8.406250 531.881
## 91525 -37.35319 -8.406250 532.650
## 91526 -37.35291 -8.406250 533.669
## 91527 -37.35263 -8.406250 534.522
## 91528 -37.35236 -8.406250 534.782
## 91529 -37.35208 -8.406250 534.628
## 91530 -37.35180 -8.406250 534.125
## 91531 -37.35152 -8.406250 533.204
## 91532 -37.35125 -8.406250 532.342
## 91533 -37.35097 -8.406250 532.068
## 91534 -37.35069 -8.406250 532.519
## 91535 -37.35041 -8.406250 533.588
## 91536 -37.35013 -8.406250 534.834
## 91537 -37.34986 -8.406250 535.699
## 91538 -37.34958 -8.406250 536.405
## 91539 -37.34930 -8.406250 536.898
## 91540 -37.34902 -8.406250 536.919
## 91541 -37.34875 -8.406250 536.761
## 91542 -37.34847 -8.406250 536.548
## 91543 -37.34819 -8.406250 535.990
## 91544 -37.34791 -8.406250 535.570
## 91545 -37.34763 -8.406250 535.290
## 91546 -37.34736 -8.406250 535.369
## 91547 -37.34708 -8.406250 535.469
## 91548 -37.34680 -8.406250 535.319
## 91549 -37.34652 -8.406250 534.854
## 91550 -37.34625 -8.406250 534.205
## 91551 -37.34597 -8.406250 533.507
## 91552 -37.34569 -8.406250 533.048
## 91553 -37.34541 -8.406250 532.755
## 91554 -37.34513 -8.406250 532.763
## 91555 -37.34486 -8.406250 533.248
## 91556 -37.34458 -8.406250 533.705
## 91557 -37.34430 -8.406250 533.792
## 91558 -37.34402 -8.406250 533.098
## 91559 -37.34375 -8.406250 532.336
## 91560 -37.34347 -8.406250 531.817
## 91561 -37.34319 -8.406250 532.270
## 91562 -37.34291 -8.406250 532.982
## 91563 -37.34263 -8.406250 533.654
## 91564 -37.34236 -8.406250 533.826
## 91565 -37.34208 -8.406250 533.771
## 91566 -37.34180 -8.406250 533.554
## 91567 -37.34152 -8.406250 533.395
## 91568 -37.34125 -8.406250 533.224
## 91569 -37.34097 -8.406250 533.179
## 91570 -37.34069 -8.406250 533.069
## 91571 -37.34041 -8.406250 533.178
## 91572 -37.34013 -8.406250 533.491
## 91573 -37.33986 -8.406250 534.113
## 91574 -37.33958 -8.406250 534.716
## 91575 -37.33930 -8.406250 535.063
## 91576 -37.33902 -8.406250 534.982
## 91577 -37.33875 -8.406250 534.691
## 91578 -37.33847 -8.406250 534.557
## 91579 -37.33819 -8.406250 534.779
## 91580 -37.33791 -8.406250 535.241
## 91581 -37.33763 -8.406250 535.709
## 91582 -37.33736 -8.406250 536.072
## 91583 -37.33708 -8.406250 536.375
## 91584 -37.33680 -8.406250 536.578
## 91585 -37.33652 -8.406250 537.313
## 91586 -37.33625 -8.406250 537.851
## 91587 -37.33597 -8.406250 538.221
## 91588 -37.33569 -8.406250 538.315
## 91589 -37.33541 -8.406250 538.224
## 91590 -37.33513 -8.406250 538.061
## 91591 -37.33486 -8.406250 537.908
## 91592 -37.33458 -8.406250 537.857
## 91593 -37.33430 -8.406250 537.843
## 91594 -37.33402 -8.406250 538.407
## 91595 -37.33375 -8.406250 539.054
## 91596 -37.33347 -8.406250 539.857
## 91597 -37.33319 -8.406250 540.912
## 91598 -37.33291 -8.406250 541.835
## 91599 -37.33263 -8.406250 542.438
## 91600 -37.33236 -8.406250 542.450
## 91601 -37.33208 -8.406250 542.120
## 91602 -37.33180 -8.406250 541.545
## 91603 -37.33152 -8.406250 541.152
## 91604 -37.33125 -8.406250 540.647
## 91605 -37.33097 -8.406250 540.053
## 91606 -37.33069 -8.406250 539.076
## 91607 -37.33041 -8.406250 538.351
## 91608 -37.33013 -8.406250 538.221
## 91609 -37.32986 -8.406250 539.201
## 91610 -37.32958 -8.406250 540.451
## 91611 -37.32930 -8.406250 541.337
## 91612 -37.32902 -8.406250 541.291
## 91613 -37.32875 -8.406250 540.876
## 91614 -37.32847 -8.406250 540.437
## 91615 -37.32819 -8.406250 540.408
## 91616 -37.32791 -8.406250 540.697
## 91617 -37.32763 -8.406250 541.285
## 91618 -37.32736 -8.406250 542.113
## 91619 -37.32708 -8.406250 543.026
## 91620 -37.32680 -8.406250 543.814
## 91621 -37.32652 -8.406250 544.294
## 91622 -37.32625 -8.406250 544.534
## 91623 -37.32597 -8.406250 544.375
## 91624 -37.32569 -8.406250 544.625
## 91625 -37.32541 -8.406250 544.476
## 91626 -37.32513 -8.406250 544.039
## 91627 -37.32486 -8.406250 543.207
## 91628 -37.32458 -8.406250 542.428
## 91629 -37.32430 -8.406250 541.988
## 91630 -37.32402 -8.406250 542.221
## 91631 -37.32375 -8.406250 542.910
## 91632 -37.32347 -8.406250 543.913
## 91633 -37.32319 -8.406250 544.789
## 91634 -37.32291 -8.406250 545.701
## 91635 -37.32263 -8.406250 546.554
## 91636 -37.32236 -8.406250 547.319
## 91637 -37.32208 -8.406250 547.840
## 91638 -37.32180 -8.406250 547.880
## 91639 -37.32152 -8.406250 547.431
## 91640 -37.32125 -8.406250 546.958
## 91641 -37.32097 -8.406250 546.726
## 91642 -37.32069 -8.406250 547.850
## 91643 -37.32041 -8.406250 549.143
## 91644 -37.32013 -8.406250 550.343
## 91645 -37.31986 -8.406250 550.933
## 91646 -37.31958 -8.406250 551.100
## 91647 -37.31930 -8.406250 550.968
## 91648 -37.31902 -8.406250 550.240
## 91649 -37.31875 -8.406250 549.556
## 91650 -37.31847 -8.406250 549.123
## 91651 -37.31819 -8.406250 549.256
## 91652 -37.31791 -8.406250 549.750
## 91653 -37.31763 -8.406250 550.377
## 91654 -37.31736 -8.406250 550.831
## 91655 -37.31708 -8.406250 551.433
## 91656 -37.31680 -8.406250 552.217
## 91657 -37.31652 -8.406250 553.689
## 91658 -37.31625 -8.406250 554.906
## 91659 -37.31597 -8.406250 555.395
## 91660 -37.31569 -8.406250 554.150
## 91661 -37.31541 -8.406250 552.371
## 91662 -37.31513 -8.406250 550.714
## 91663 -37.31486 -8.406250 550.205
## 91664 -37.31458 -8.406250 550.202
## 91665 -37.31430 -8.406250 550.631
## 91666 -37.31402 -8.406250 551.036
## 91667 -37.31375 -8.406250 551.365
## 91668 -37.31347 -8.406250 551.727
## 91669 -37.31319 -8.406250 550.412
## 91670 -37.31291 -8.406250 549.144
## 91671 -37.31263 -8.406250 547.829
## 91672 -37.31236 -8.406250 546.837
## 91673 -37.31208 -8.406250 545.972
## 91674 -37.31180 -8.406250 545.022
## 91675 -37.31152 -8.406250 544.523
## 91676 -37.31125 -8.406250 543.965
## 91677 -37.31097 -8.406250 543.679
## 91678 -37.31069 -8.406250 543.123
## 91679 -37.31041 -8.406250 543.084
## 91680 -37.31013 -8.406250 543.622
## 91681 -37.30986 -8.406250 544.931
## 91682 -37.30958 -8.406250 546.522
## 91683 -37.30930 -8.406250 548.038
## 91684 -37.30902 -8.406250 549.084
## 91685 -37.30875 -8.406250 549.783
## 91686 -37.30847 -8.406250 549.907
## 91687 -37.30819 -8.406250 550.197
## 91688 -37.30791 -8.406250 549.905
## 91689 -37.30763 -8.406250 549.180
## 91690 -37.30736 -8.406250 548.046
## 91691 -37.30708 -8.406250 546.884
## 91692 -37.30680 -8.406250 546.230
## 91693 -37.30652 -8.406250 545.912
## 91694 -37.30625 -8.406250 546.032
## 91695 -37.30597 -8.406250 546.231
## 91696 -37.30569 -8.406250 546.147
## 91697 -37.30541 -8.406250 546.243
## 91698 -37.30513 -8.406250 546.797
## 91699 -37.30486 -8.406250 548.189
## 91700 -37.30458 -8.406250 549.971
## 91701 -37.30430 -8.406250 551.823
## 91702 -37.30402 -8.406250 553.694
## 91703 -37.30375 -8.406250 555.162
## 91704 -37.30347 -8.406250 556.074
## 91705 -37.30319 -8.406250 556.564
## 91706 -37.30291 -8.406250 556.618
## 91707 -37.30263 -8.406250 556.613
## 91708 -37.30236 -8.406250 556.697
## 91709 -37.30208 -8.406250 556.746
## 91710 -37.30180 -8.406250 556.585
## 91711 -37.30152 -8.406250 555.955
## 91712 -37.30125 -8.406250 555.216
## 91713 -37.30097 -8.406250 554.604
## 91714 -37.30069 -8.406250 553.831
## 91715 -37.30041 -8.406250 553.415
## 91716 -37.30013 -8.406250 553.341
## 91717 -37.29986 -8.406250 553.730
## 91718 -37.29958 -8.406250 554.154
## 91719 -37.29930 -8.406250 554.215
## 91720 -37.29902 -8.406250 553.867
## 91721 -37.29875 -8.406250 553.206
## 91722 -37.29847 -8.406250 552.501
## 91723 -37.29819 -8.406250 551.980
## 91724 -37.29791 -8.406250 551.616
## 91725 -37.29763 -8.406250 551.402
## 91726 -37.29736 -8.406250 551.298
## 91727 -37.29708 -8.406250 551.462
## 91728 -37.29680 -8.406250 551.956
## 91729 -37.29652 -8.406250 552.957
## 91730 -37.29625 -8.406250 554.052
## 91731 -37.29597 -8.406250 555.029
## 91732 -37.29569 -8.406250 555.273
## 91733 -37.29541 -8.406250 555.364
## 91734 -37.29513 -8.406250 555.607
## 91735 -37.29486 -8.406250 556.111
## 91736 -37.29458 -8.406250 556.624
## 91737 -37.29430 -8.406250 556.839
## 91738 -37.29402 -8.406250 556.161
## 91739 -37.29375 -8.406250 555.228
## 91740 -37.29347 -8.406250 553.949
## 91741 -37.29319 -8.406250 553.016
## 91742 -37.29291 -8.406250 552.440
## 91743 -37.29263 -8.406250 552.818
## 91744 -37.29236 -8.406250 554.636
## 91745 -37.29208 -8.406250 556.862
## 91746 -37.29180 -8.406250 558.663
## 91747 -37.29152 -8.406250 559.425
## 91748 -37.29125 -8.406250 559.406
## 91749 -37.29097 -8.406250 558.862
## 91750 -37.29069 -8.406250 557.827
## 91751 -37.29041 -8.406250 556.593
## 91752 -37.29013 -8.406250 555.263
## 91753 -37.28986 -8.406250 553.997
## 91754 -37.28958 -8.406250 552.947
## 91755 -37.28930 -8.406250 552.302
## 91756 -37.28902 -8.406250 552.047
## 91757 -37.28875 -8.406250 552.307
## 91758 -37.28847 -8.406250 553.012
## 91759 -37.28819 -8.406250 553.956
## 91760 -37.28791 -8.406250 554.969
## 91761 -37.28763 -8.406250 555.734
## 91762 -37.28736 -8.406250 555.878
## 91763 -37.28708 -8.406250 555.798
## 91764 -37.28680 -8.406250 555.614
## 91765 -37.28652 -8.406250 555.806
## 91766 -37.28625 -8.406250 555.937
## 91767 -37.28597 -8.406250 556.173
## 91768 -37.28569 -8.406250 555.902
## 91769 -37.28541 -8.406250 555.708
## 91770 -37.28513 -8.406250 555.531
## 91771 -37.28486 -8.406250 555.362
## 91772 -37.28458 -8.406250 555.292
## 91773 -37.28430 -8.406250 555.270
## 91774 -37.28402 -8.406250 555.532
## 91775 -37.28375 -8.406250 555.800
## 91776 -37.28347 -8.406250 556.127
## 91777 -37.28319 -8.406250 556.425
## 91778 -37.28291 -8.406250 556.799
## 91779 -37.28263 -8.406250 557.282
## 91780 -37.28236 -8.406250 557.954
## 91781 -37.28208 -8.406250 558.725
## 91782 -37.28180 -8.406250 559.618
## 91783 -37.28152 -8.406250 560.332
## 91784 -37.28125 -8.406250 561.080
## 91785 -37.28097 -8.406250 561.639
## 91786 -37.28069 -8.406250 562.309
## 91787 -37.28041 -8.406250 562.961
## 91788 -37.28013 -8.406250 563.865
## 91789 -37.27986 -8.406250 565.215
## 91790 -37.27958 -8.406250 566.677
## 91791 -37.27930 -8.406250 568.141
## 91792 -37.27902 -8.406250 569.131
## 91793 -37.27875 -8.406250 569.906
## 91794 -37.27847 -8.406250 570.282
## 91795 -37.27819 -8.406250 570.295
## 91796 -37.27791 -8.406250 570.155
## 91797 -37.27763 -8.406250 570.150
## 91798 -37.27736 -8.406250 570.556
## 91799 -37.27708 -8.406250 570.974
## 91800 -37.27680 -8.406250 571.228
## 91801 -37.27652 -8.406250 570.823
## 91802 -37.27625 -8.406250 570.415
## 91803 -37.27597 -8.406250 569.993
## 91804 -37.27569 -8.406250 570.333
## 91805 -37.27541 -8.406250 570.701
## 91806 -37.27513 -8.406250 571.075
## 91807 -37.27486 -8.406250 571.356
## 91808 -37.27458 -8.406250 571.573
## 91809 -37.27430 -8.406250 571.890
## 91810 -37.27402 -8.406250 571.818
## 91811 -37.27375 -8.406250 571.916
## 91812 -37.27347 -8.406250 572.097
## 91813 -37.27319 -8.406250 572.407
## 91814 -37.27291 -8.406250 572.658
## 91815 -37.27263 -8.406250 572.681
## 91816 -37.27236 -8.406250 572.288
## 91817 -37.27208 -8.406250 571.810
## 91818 -37.27180 -8.406250 571.341
## 91819 -37.27152 -8.406250 571.464
## 91820 -37.27125 -8.406250 571.403
## 91821 -37.27097 -8.406250 571.078
## 91822 -37.27069 -8.406250 570.161
## 91823 -37.27041 -8.406250 568.850
## 91824 -37.27013 -8.406250 567.209
## 91825 -37.26986 -8.406250 565.208
## 91826 -37.26958 -8.406250 563.476
## 91827 -37.26930 -8.406250 562.390
## 91828 -37.26902 -8.406250 562.631
## 91829 -37.26875 -8.406250 563.519
## 91830 -37.26847 -8.406250 564.696
## 91831 -37.26819 -8.406250 565.256
## 91832 -37.26791 -8.406250 565.781
## 91833 -37.26763 -8.406250 566.292
## 91834 -37.26736 -8.406250 566.874
## 91835 -37.26708 -8.406250 567.384
## 91836 -37.26680 -8.406250 567.675
## 91837 -37.26652 -8.406250 567.809
## 91838 -37.26625 -8.406250 567.607
## 91839 -37.26597 -8.406250 567.131
## 91840 -37.26569 -8.406250 566.192
## 91841 -37.26541 -8.406250 565.037
## 91842 -37.26513 -8.406250 563.680
## 91843 -37.26486 -8.406250 562.179
## 91844 -37.26458 -8.406250 560.783
## 91845 -37.26430 -8.406250 559.821
## 91846 -37.26402 -8.406250 559.220
## 91847 -37.26375 -8.406250 558.973
## 91848 -37.26347 -8.406250 558.829
## 91849 -37.26319 -8.406250 558.488
## 91850 -37.26291 -8.406250 558.327
## 91851 -37.26263 -8.406250 558.567
## 91852 -37.26236 -8.406250 559.447
## 91853 -37.26208 -8.406250 560.479
## 91854 -37.26180 -8.406250 561.374
## 91855 -37.26152 -8.406250 561.654
## 91856 -37.26125 -8.406250 561.660
## 91857 -37.26097 -8.406250 561.604
## 91858 -37.26069 -8.406250 561.583
## 91859 -37.26041 -8.406250 561.592
## 91860 -37.26013 -8.406250 561.669
## 91861 -37.25986 -8.406250 561.217
## 91862 -37.25958 -8.406250 560.697
## 91863 -37.25930 -8.406250 559.853
## 91864 -37.25902 -8.406250 558.741
## 91865 -37.25875 -8.406250 557.648
## 91866 -37.25847 -8.406250 556.774
## 91867 -37.25819 -8.406250 556.525
## 91868 -37.25791 -8.406250 556.533
## 91869 -37.25763 -8.406250 556.687
## 91870 -37.25736 -8.406250 556.832
## 91871 -37.25708 -8.406250 557.114
## 91872 -37.25680 -8.406250 557.681
## 91873 -37.25652 -8.406250 558.520
## 91874 -37.25625 -8.406250 559.425
## 91875 -37.25597 -8.406250 560.201
## 91876 -37.25569 -8.406250 560.298
## 91877 -37.25541 -8.406250 560.272
## 91878 -37.25513 -8.406250 560.299
## 91879 -37.25486 -8.406250 560.685
## 91880 -37.25458 -8.406250 561.274
## 91881 -37.25430 -8.406250 562.068
## 91882 -37.25402 -8.406250 562.984
## 91883 -37.25375 -8.406250 563.979
## 91884 -37.25347 -8.406250 564.908
## 91885 -37.25319 -8.406250 565.406
## 91886 -37.25291 -8.406250 565.820
## 91887 -37.25263 -8.406250 566.128
## 91888 -37.25236 -8.406250 566.851
## 91889 -37.25208 -8.406250 567.639
## 91890 -37.25180 -8.406250 568.926
## 91891 -37.25152 -8.406250 569.813
## 91892 -37.25125 -8.406250 571.060
## 91893 -37.25097 -8.406250 572.407
## 91894 -37.25069 -8.406250 573.276
## 91895 -37.25041 -8.406250 574.033
## 91896 -37.25013 -8.406250 574.514
## 91897 -37.24986 -8.406250 574.733
## 91898 -37.24958 -8.406250 574.675
## 91899 -37.24930 -8.406250 574.208
## 91900 -37.24902 -8.406250 573.619
## 91901 -37.24875 -8.406250 573.019
## 91902 -37.24847 -8.406250 572.583
## 91903 -37.24819 -8.406250 573.193
## 91904 -37.24791 -8.406250 573.831
## 91905 -37.24763 -8.406250 574.308
## 91906 -37.24736 -8.406250 574.263
## 91907 -37.24708 -8.406250 574.172
## 91908 -37.24680 -8.406250 574.457
## 91909 -37.24652 -8.406250 575.131
## 91910 -37.24625 -8.406250 576.008
## 91911 -37.24597 -8.406250 576.675
## 91912 -37.24569 -8.406250 577.078
## 91913 -37.24541 -8.406250 577.416
## 91914 -37.24513 -8.406250 578.076
## 91915 -37.24486 -8.406250 579.443
## 91916 -37.24458 -8.406250 581.109
## 91917 -37.24430 -8.406250 583.022
## 91918 -37.24402 -8.406250 584.554
## 91919 -37.24375 -8.406250 586.042
## 91920 -37.24347 -8.406250 587.252
## 91921 -37.24319 -8.406250 587.949
## 91922 -37.24291 -8.406250 588.376
## 91923 -37.24263 -8.406250 588.620
## 91924 -37.24236 -8.406250 588.810
## 91925 -37.24208 -8.406250 588.947
## 91926 -37.24180 -8.406250 589.004
## 91927 -37.24152 -8.406250 589.178
## 91928 -37.24125 -8.406250 589.328
## 91929 -37.24097 -8.406250 589.583
## 91930 -37.24069 -8.406250 589.762
## 91931 -37.24041 -8.406250 589.818
## 91932 -37.24013 -8.406250 589.479
## 91933 -37.23986 -8.406250 588.514
## 91934 -37.23958 -8.406250 587.284
## 91935 -37.23930 -8.406250 586.105
## 91936 -37.23902 -8.406250 584.888
## 91937 -37.23875 -8.406250 583.894
## 91938 -37.23847 -8.406250 583.002
## 91939 -37.23819 -8.406250 582.499
## 91940 -37.23791 -8.406250 581.873
## 91941 -37.23763 -8.406250 580.991
## 91942 -37.23736 -8.406250 579.652
## 91943 -37.23708 -8.406250 578.197
## 91944 -37.23680 -8.406250 576.823
## 91945 -37.23652 -8.406250 575.742
## 91946 -37.23625 -8.406250 574.981
## 91947 -37.23597 -8.406250 574.719
## 91948 -37.23569 -8.406250 574.675
## 91949 -37.23541 -8.406250 574.792
## 91950 -37.23513 -8.406250 574.652
## 91951 -37.23486 -8.406250 573.900
## 91952 -37.23458 -8.406250 572.891
## 91953 -37.23430 -8.406250 571.810
## 91954 -37.23402 -8.406250 571.011
## 91955 -37.23375 -8.406250 570.337
## 91956 -37.23347 -8.406250 569.609
## 91957 -37.23319 -8.406250 569.102
## 91958 -37.23291 -8.406250 568.862
## 91959 -37.23263 -8.406250 569.140
## 91960 -37.23236 -8.406250 570.871
## 91961 -37.23208 -8.406250 572.713
## 91962 -37.23180 -8.406250 574.295
## 91963 -37.23152 -8.406250 575.035
## 91964 -37.23125 -8.406250 575.449
## 91965 -37.23097 -8.406250 575.866
## 91966 -37.23069 -8.406250 576.122
## 91967 -37.23041 -8.406250 576.358
## 91968 -37.23013 -8.406250 576.252
## 91969 -37.22986 -8.406250 575.599
## 91970 -37.22958 -8.406250 574.846
## 91971 -37.22930 -8.406250 574.255
## 91972 -37.22902 -8.406250 574.224
## 91973 -37.22875 -8.406250 574.326
## 91974 -37.22847 -8.406250 574.484
## 91975 -37.22819 -8.406250 574.535
## 91976 -37.22791 -8.406250 574.567
## 91977 -37.22763 -8.406250 574.574
## 91978 -37.22736 -8.406250 574.566
## 91979 -37.22708 -8.406250 574.641
## 91980 -37.22680 -8.406250 574.934
## 91981 -37.22652 -8.406250 575.353
## 91982 -37.22625 -8.406250 575.801
## 91983 -37.22597 -8.406250 575.945
## 91984 -37.22569 -8.406250 575.561
## 91985 -37.22541 -8.406250 574.904
## 91986 -37.22513 -8.406250 574.097
## 91987 -37.22486 -8.406250 573.879
## 91988 -37.22458 -8.406250 573.325
## 91989 -37.22430 -8.406250 572.150
## 91990 -37.22402 -8.406250 570.258
## 91991 -37.22375 -8.406250 568.518
## 92845 -37.36291 -8.406528 524.728
## 92846 -37.36263 -8.406528 524.187
## 92847 -37.36236 -8.406528 523.996
## 92848 -37.36208 -8.406528 524.278
## 92849 -37.36180 -8.406528 524.731
## 92850 -37.36152 -8.406528 525.589
## 92851 -37.36125 -8.406528 526.308
## 92852 -37.36097 -8.406528 526.586
## 92853 -37.36069 -8.406528 526.022
## 92854 -37.36041 -8.406528 525.433
## 92855 -37.36013 -8.406528 525.249
## 92856 -37.35986 -8.406528 525.412
## 92857 -37.35958 -8.406528 525.809
## 92858 -37.35930 -8.406528 526.141
## 92859 -37.35902 -8.406528 526.739
## 92860 -37.35875 -8.406528 527.228
## 92861 -37.35847 -8.406528 527.299
## 92862 -37.35819 -8.406528 526.620
## 92863 -37.35791 -8.406528 525.824
## 92864 -37.35763 -8.406528 525.261
## 92865 -37.35736 -8.406528 524.900
## 92866 -37.35708 -8.406528 524.707
## 92867 -37.35680 -8.406528 524.777
## 92868 -37.35652 -8.406528 524.915
## 92869 -37.35625 -8.406528 525.276
## 92870 -37.35597 -8.406528 525.846
## 92871 -37.35569 -8.406528 526.588
## 92872 -37.35541 -8.406528 527.538
## 92873 -37.35513 -8.406528 528.748
## 92874 -37.35486 -8.406528 530.053
## 92875 -37.35458 -8.406528 531.154
## 92876 -37.35430 -8.406528 531.966
## 92877 -37.35402 -8.406528 532.089
## 92878 -37.35375 -8.406528 532.031
## 92879 -37.35347 -8.406528 532.176
## 92880 -37.35319 -8.406528 532.968
## 92881 -37.35291 -8.406528 534.054
## 92882 -37.35263 -8.406528 535.013
## 92883 -37.35236 -8.406528 535.124
## 92884 -37.35208 -8.406528 534.900
## 92885 -37.35180 -8.406528 534.290
## 92886 -37.35152 -8.406528 533.162
## 92887 -37.35125 -8.406528 532.247
## 92888 -37.35097 -8.406528 531.867
## 92889 -37.35069 -8.406528 532.643
## 92890 -37.35041 -8.406528 533.700
## 92891 -37.35013 -8.406528 535.100
## 92892 -37.34986 -8.406528 535.959
## 92893 -37.34958 -8.406528 536.643
## 92894 -37.34930 -8.406528 537.066
## 92895 -37.34902 -8.406528 537.171
## 92896 -37.34875 -8.406528 537.061
## 92897 -37.34847 -8.406528 536.844
## 92898 -37.34819 -8.406528 536.313
## 92899 -37.34791 -8.406528 535.963
## 92900 -37.34763 -8.406528 535.848
## 92901 -37.34736 -8.406528 536.139
## 92902 -37.34708 -8.406528 536.346
## 92903 -37.34680 -8.406528 536.323
## 92904 -37.34652 -8.406528 535.935
## 92905 -37.34625 -8.406528 535.381
## 92906 -37.34597 -8.406528 534.791
## 92907 -37.34569 -8.406528 534.263
## 92908 -37.34541 -8.406528 534.161
## 92909 -37.34513 -8.406528 534.330
## 92910 -37.34486 -8.406528 534.854
## 92911 -37.34458 -8.406528 535.109
## 92912 -37.34430 -8.406528 535.279
## 92913 -37.34402 -8.406528 534.566
## 92914 -37.34375 -8.406528 533.797
## 92915 -37.34347 -8.406528 533.365
## 92916 -37.34319 -8.406528 533.867
## 92917 -37.34291 -8.406528 534.648
## 92918 -37.34263 -8.406528 535.328
## 92919 -37.34236 -8.406528 535.489
## 92920 -37.34208 -8.406528 535.479
## 92921 -37.34180 -8.406528 535.478
## 92922 -37.34152 -8.406528 535.309
## 92923 -37.34125 -8.406528 535.130
## 92924 -37.34097 -8.406528 534.968
## 92925 -37.34069 -8.406528 534.986
## 92926 -37.34041 -8.406528 535.056
## 92927 -37.34013 -8.406528 535.293
## 92928 -37.33986 -8.406528 535.918
## 92929 -37.33958 -8.406528 536.423
## 92930 -37.33930 -8.406528 537.169
## 92931 -37.33902 -8.406528 537.411
## 92932 -37.33875 -8.406528 537.007
## 92933 -37.33847 -8.406528 536.701
## 92934 -37.33819 -8.406528 536.617
## 92935 -37.33791 -8.406528 536.853
## 92936 -37.33763 -8.406528 536.846
## 92937 -37.33736 -8.406528 536.881
## 92938 -37.33708 -8.406528 537.113
## 92939 -37.33680 -8.406528 537.647
## 92940 -37.33652 -8.406528 538.441
## 92941 -37.33625 -8.406528 539.078
## 92942 -37.33597 -8.406528 539.496
## 92943 -37.33569 -8.406528 539.633
## 92944 -37.33541 -8.406528 539.601
## 92945 -37.33513 -8.406528 539.355
## 92946 -37.33486 -8.406528 539.283
## 92947 -37.33458 -8.406528 539.289
## 92948 -37.33430 -8.406528 539.506
## 92949 -37.33402 -8.406528 539.959
## 92950 -37.33375 -8.406528 540.512
## 92951 -37.33347 -8.406528 541.313
## 92952 -37.33319 -8.406528 542.270
## 92953 -37.33291 -8.406528 543.115
## 92954 -37.33263 -8.406528 543.639
## 92955 -37.33236 -8.406528 543.548
## 92956 -37.33208 -8.406528 543.256
## 92957 -37.33180 -8.406528 542.627
## 92958 -37.33152 -8.406528 542.160
## 92959 -37.33125 -8.406528 541.484
## 92960 -37.33097 -8.406528 540.672
## 92961 -37.33069 -8.406528 539.379
## 92962 -37.33041 -8.406528 538.464
## 92963 -37.33013 -8.406528 538.201
## 92964 -37.32986 -8.406528 539.291
## 92965 -37.32958 -8.406528 540.711
## 92966 -37.32930 -8.406528 541.985
## 92967 -37.32902 -8.406528 542.101
## 92968 -37.32875 -8.406528 541.795
## 92969 -37.32847 -8.406528 541.520
## 92970 -37.32819 -8.406528 541.639
## 92971 -37.32791 -8.406528 541.989
## 92972 -37.32763 -8.406528 542.542
## 92973 -37.32736 -8.406528 543.243
## 92974 -37.32708 -8.406528 544.120
## 92975 -37.32680 -8.406528 544.683
## 92976 -37.32652 -8.406528 545.163
## 92977 -37.32625 -8.406528 545.423
## 92978 -37.32597 -8.406528 545.548
## 92979 -37.32569 -8.406528 545.769
## 92980 -37.32541 -8.406528 545.634
## 92981 -37.32513 -8.406528 545.565
## 92982 -37.32486 -8.406528 544.748
## 92983 -37.32458 -8.406528 544.005
## 92984 -37.32430 -8.406528 543.376
## 92985 -37.32402 -8.406528 543.343
## 92986 -37.32375 -8.406528 543.929
## 92987 -37.32347 -8.406528 544.739
## 92988 -37.32319 -8.406528 545.605
## 92989 -37.32291 -8.406528 546.551
## 92990 -37.32263 -8.406528 547.598
## 92991 -37.32236 -8.406528 548.562
## 92992 -37.32208 -8.406528 549.173
## 92993 -37.32180 -8.406528 549.253
## 92994 -37.32152 -8.406528 548.802
## 92995 -37.32125 -8.406528 548.385
## 92996 -37.32097 -8.406528 548.434
## 92997 -37.32069 -8.406528 549.551
## 92998 -37.32041 -8.406528 550.901
## 92999 -37.32013 -8.406528 552.423
## 93000 -37.31986 -8.406528 553.101
## 93001 -37.31958 -8.406528 553.431
## 93002 -37.31930 -8.406528 552.854
## 93003 -37.31902 -8.406528 552.044
## 93004 -37.31875 -8.406528 551.224
## 93005 -37.31847 -8.406528 550.527
## 93006 -37.31819 -8.406528 550.528
## 93007 -37.31791 -8.406528 550.928
## 93008 -37.31763 -8.406528 551.631
## 93009 -37.31736 -8.406528 552.117
## 93010 -37.31708 -8.406528 552.762
## 93011 -37.31680 -8.406528 553.459
## 93012 -37.31652 -8.406528 554.749
## 93013 -37.31625 -8.406528 555.684
## 93014 -37.31597 -8.406528 555.549
## 93015 -37.31569 -8.406528 554.160
## 93016 -37.31541 -8.406528 552.473
## 93017 -37.31513 -8.406528 551.249
## 93018 -37.31486 -8.406528 551.166
## 93019 -37.31458 -8.406528 551.297
## 93020 -37.31430 -8.406528 552.003
## 93021 -37.31402 -8.406528 552.540
## 93022 -37.31375 -8.406528 552.623
## 93023 -37.31347 -8.406528 551.835
## 93024 -37.31319 -8.406528 550.593
## 93025 -37.31291 -8.406528 549.296
## 93026 -37.31263 -8.406528 547.754
## 93027 -37.31236 -8.406528 546.615
## 93028 -37.31208 -8.406528 545.300
## 93029 -37.31180 -8.406528 544.898
## 93030 -37.31152 -8.406528 544.460
## 93031 -37.31125 -8.406528 544.083
## 93032 -37.31097 -8.406528 543.849
## 93033 -37.31069 -8.406528 543.548
## 93034 -37.31041 -8.406528 543.590
## 93035 -37.31013 -8.406528 543.843
## 93036 -37.30986 -8.406528 544.880
## 93037 -37.30958 -8.406528 546.170
## 93038 -37.30930 -8.406528 547.464
## 93039 -37.30902 -8.406528 548.432
## 93040 -37.30875 -8.406528 549.395
## 93041 -37.30847 -8.406528 550.128
## 93042 -37.30819 -8.406528 550.893
## 93043 -37.30791 -8.406528 551.049
## 93044 -37.30763 -8.406528 551.070
## 93045 -37.30736 -8.406528 550.173
## 93046 -37.30708 -8.406528 548.937
## 93047 -37.30680 -8.406528 547.721
## 93048 -37.30652 -8.406528 547.393
## 93049 -37.30625 -8.406528 547.501
## 93050 -37.30597 -8.406528 547.836
## 93051 -37.30569 -8.406528 547.666
## 93052 -37.30541 -8.406528 547.607
## 93053 -37.30513 -8.406528 547.926
## 93054 -37.30486 -8.406528 549.110
## 93055 -37.30458 -8.406528 550.441
## 93056 -37.30430 -8.406528 552.169
## 93057 -37.30402 -8.406528 553.603
## 93058 -37.30375 -8.406528 555.350
## 93059 -37.30347 -8.406528 556.952
## 93060 -37.30319 -8.406528 558.060
## 93061 -37.30291 -8.406528 558.566
## 93062 -37.30263 -8.406528 558.849
## 93063 -37.30236 -8.406528 558.967
## 93064 -37.30208 -8.406528 558.892
## 93065 -37.30180 -8.406528 558.531
## 93066 -37.30152 -8.406528 557.750
## 93067 -37.30125 -8.406528 556.848
## 93068 -37.30097 -8.406528 555.966
## 93069 -37.30069 -8.406528 555.265
## 93070 -37.30041 -8.406528 554.916
## 93071 -37.30013 -8.406528 554.763
## 93072 -37.29986 -8.406528 555.198
## 93073 -37.29958 -8.406528 555.638
## 93074 -37.29930 -8.406528 556.072
## 93075 -37.29902 -8.406528 555.850
## 93076 -37.29875 -8.406528 555.203
## 93077 -37.29847 -8.406528 554.367
## 93078 -37.29819 -8.406528 553.551
## 93079 -37.29791 -8.406528 552.951
## 93080 -37.29763 -8.406528 552.578
## 93081 -37.29736 -8.406528 552.286
## 93082 -37.29708 -8.406528 552.445
## 93083 -37.29680 -8.406528 552.625
## 93084 -37.29652 -8.406528 553.362
## 93085 -37.29625 -8.406528 554.318
## 93086 -37.29597 -8.406528 555.092
## 93087 -37.29569 -8.406528 555.184
## 93088 -37.29541 -8.406528 555.055
## 93089 -37.29513 -8.406528 555.005
## 93090 -37.29486 -8.406528 555.313
## 93091 -37.29458 -8.406528 555.604
## 93092 -37.29430 -8.406528 555.572
## 93093 -37.29402 -8.406528 554.924
## 93094 -37.29375 -8.406528 554.155
## 93095 -37.29347 -8.406528 553.321
## 93096 -37.29319 -8.406528 552.365
## 93097 -37.29291 -8.406528 551.820
## 93098 -37.29263 -8.406528 552.244
## 93099 -37.29236 -8.406528 554.274
## 93100 -37.29208 -8.406528 556.648
## 93101 -37.29180 -8.406528 558.740
## 93102 -37.29152 -8.406528 559.519
## 93103 -37.29125 -8.406528 559.589
## 93104 -37.29097 -8.406528 558.748
## 93105 -37.29069 -8.406528 557.703
## 93106 -37.29041 -8.406528 556.501
## 93107 -37.29013 -8.406528 555.080
## 93108 -37.28986 -8.406528 553.998
## 93109 -37.28958 -8.406528 553.184
## 93110 -37.28930 -8.406528 552.477
## 93111 -37.28902 -8.406528 552.411
## 93112 -37.28875 -8.406528 552.582
## 93113 -37.28847 -8.406528 552.989
## 93114 -37.28819 -8.406528 553.965
## 93115 -37.28791 -8.406528 555.085
## 93116 -37.28763 -8.406528 556.088
## 93117 -37.28736 -8.406528 556.498
## 93118 -37.28708 -8.406528 556.639
## 93119 -37.28680 -8.406528 556.717
## 93120 -37.28652 -8.406528 556.896
## 93121 -37.28625 -8.406528 556.807
## 93122 -37.28597 -8.406528 556.477
## 93123 -37.28569 -8.406528 556.089
## 93124 -37.28541 -8.406528 555.767
## 93125 -37.28513 -8.406528 555.435
## 93126 -37.28486 -8.406528 555.067
## 93127 -37.28458 -8.406528 554.876
## 93128 -37.28430 -8.406528 554.787
## 93129 -37.28402 -8.406528 554.962
## 93130 -37.28375 -8.406528 555.172
## 93131 -37.28347 -8.406528 555.353
## 93132 -37.28319 -8.406528 555.811
## 93133 -37.28291 -8.406528 556.324
## 93134 -37.28263 -8.406528 557.101
## 93135 -37.28236 -8.406528 557.792
## 93136 -37.28208 -8.406528 558.479
## 93137 -37.28180 -8.406528 559.266
## 93138 -37.28152 -8.406528 560.096
## 93139 -37.28125 -8.406528 561.149
## 93140 -37.28097 -8.406528 562.269
## 93141 -37.28069 -8.406528 562.977
## 93142 -37.28041 -8.406528 563.576
## 93143 -37.28013 -8.406528 564.288
## 93144 -37.27986 -8.406528 565.483
## 93145 -37.27958 -8.406528 566.765
## 93146 -37.27930 -8.406528 567.935
## 93147 -37.27902 -8.406528 568.686
## 93148 -37.27875 -8.406528 569.442
## 93149 -37.27847 -8.406528 570.131
## 93150 -37.27819 -8.406528 570.204
## 93151 -37.27791 -8.406528 570.117
## 93152 -37.27763 -8.406528 570.049
## 93153 -37.27736 -8.406528 570.461
## 93154 -37.27708 -8.406528 570.950
## 93155 -37.27680 -8.406528 571.014
## 93156 -37.27652 -8.406528 570.605
## 93157 -37.27625 -8.406528 570.258
## 93158 -37.27597 -8.406528 570.030
## 93159 -37.27569 -8.406528 570.509
## 93160 -37.27541 -8.406528 571.054
## 93161 -37.27513 -8.406528 571.908
## 93162 -37.27486 -8.406528 572.351
## 93163 -37.27458 -8.406528 572.579
## 93164 -37.27430 -8.406528 572.494
## 93165 -37.27402 -8.406528 572.311
## 93166 -37.27375 -8.406528 572.192
## 93167 -37.27347 -8.406528 572.115
## 93168 -37.27319 -8.406528 572.414
## 93169 -37.27291 -8.406528 572.668
## 93170 -37.27263 -8.406528 572.826
## 93171 -37.27236 -8.406528 572.504
## 93172 -37.27208 -8.406528 571.993
## 93173 -37.27180 -8.406528 572.024
## 93174 -37.27152 -8.406528 572.419
## 93175 -37.27125 -8.406528 572.482
## 93176 -37.27097 -8.406528 572.213
## 93177 -37.27069 -8.406528 571.188
## 93178 -37.27041 -8.406528 569.726
## 93179 -37.27013 -8.406528 567.725
## 93180 -37.26986 -8.406528 565.507
## 93181 -37.26958 -8.406528 563.656
## 93182 -37.26930 -8.406528 562.662
## 93183 -37.26902 -8.406528 563.258
## 93184 -37.26875 -8.406528 564.397
## 93185 -37.26847 -8.406528 565.766
## 93186 -37.26819 -8.406528 566.563
## 93187 -37.26791 -8.406528 567.145
## 93188 -37.26763 -8.406528 567.440
## 93189 -37.26736 -8.406528 567.734
## 93190 -37.26708 -8.406528 568.010
## 93191 -37.26680 -8.406528 568.172
## 93192 -37.26652 -8.406528 568.177
## 93193 -37.26625 -8.406528 568.006
## 93194 -37.26597 -8.406528 567.694
## 93195 -37.26569 -8.406528 566.992
## 93196 -37.26541 -8.406528 565.911
## 93197 -37.26513 -8.406528 564.341
## 93198 -37.26486 -8.406528 562.613
## 93199 -37.26458 -8.406528 560.895
## 93200 -37.26430 -8.406528 559.775
## 93201 -37.26402 -8.406528 559.226
## 93202 -37.26375 -8.406528 558.968
## 93203 -37.26347 -8.406528 558.857
## 93204 -37.26319 -8.406528 558.419
## 93205 -37.26291 -8.406528 558.115
## 93206 -37.26263 -8.406528 558.084
## 93207 -37.26236 -8.406528 558.904
## 93208 -37.26208 -8.406528 559.889
## 93209 -37.26180 -8.406528 561.136
## 93210 -37.26152 -8.406528 561.855
## 93211 -37.26125 -8.406528 562.229
## 93212 -37.26097 -8.406528 562.623
## 93213 -37.26069 -8.406528 562.838
## 93214 -37.26041 -8.406528 562.866
## 93215 -37.26013 -8.406528 562.291
## 93216 -37.25986 -8.406528 561.621
## 93217 -37.25958 -8.406528 560.941
## 93218 -37.25930 -8.406528 560.130
## 93219 -37.25902 -8.406528 558.990
## 93220 -37.25875 -8.406528 557.967
## 93221 -37.25847 -8.406528 557.286
## 93222 -37.25819 -8.406528 557.117
## 93223 -37.25791 -8.406528 557.051
## 93224 -37.25763 -8.406528 556.890
## 93225 -37.25736 -8.406528 556.777
## 93226 -37.25708 -8.406528 556.705
## 93227 -37.25680 -8.406528 557.325
## 93228 -37.25652 -8.406528 558.112
## 93229 -37.25625 -8.406528 558.843
## 93230 -37.25597 -8.406528 558.986
## 93231 -37.25569 -8.406528 558.882
## 93232 -37.25541 -8.406528 558.847
## 93233 -37.25513 -8.406528 559.070
## 93234 -37.25486 -8.406528 559.886
## 93235 -37.25458 -8.406528 560.915
## 93236 -37.25430 -8.406528 562.177
## 93237 -37.25402 -8.406528 563.818
## 93238 -37.25375 -8.406528 565.032
## 93239 -37.25347 -8.406528 565.645
## 93240 -37.25319 -8.406528 566.049
## 93241 -37.25291 -8.406528 566.460
## 93242 -37.25263 -8.406528 567.048
## 93243 -37.25236 -8.406528 567.805
## 93244 -37.25208 -8.406528 568.557
## 93245 -37.25180 -8.406528 569.697
## 93246 -37.25152 -8.406528 570.761
## 93247 -37.25125 -8.406528 571.825
## 93248 -37.25097 -8.406528 572.751
## 93249 -37.25069 -8.406528 573.581
## 93250 -37.25041 -8.406528 574.331
## 93251 -37.25013 -8.406528 574.976
## 93252 -37.24986 -8.406528 575.370
## 93253 -37.24958 -8.406528 575.454
## 93254 -37.24930 -8.406528 575.312
## 93255 -37.24902 -8.406528 574.895
## 93256 -37.24875 -8.406528 574.511
## 93257 -37.24847 -8.406528 574.450
## 93258 -37.24819 -8.406528 575.010
## 93259 -37.24791 -8.406528 575.600
## 93260 -37.24763 -8.406528 576.142
## 93261 -37.24736 -8.406528 575.965
## 93262 -37.24708 -8.406528 575.836
## 93263 -37.24680 -8.406528 575.364
## 93264 -37.24652 -8.406528 575.729
## 93265 -37.24625 -8.406528 576.495
## 93266 -37.24597 -8.406528 577.147
## 93267 -37.24569 -8.406528 577.427
## 93268 -37.24541 -8.406528 577.719
## 93269 -37.24513 -8.406528 578.461
## 93270 -37.24486 -8.406528 580.031
## 93271 -37.24458 -8.406528 581.695
## 93272 -37.24430 -8.406528 583.549
## 93273 -37.24402 -8.406528 585.107
## 93274 -37.24375 -8.406528 586.572
## 93275 -37.24347 -8.406528 587.735
## 93276 -37.24319 -8.406528 588.417
## 93277 -37.24291 -8.406528 588.837
## 93278 -37.24263 -8.406528 589.017
## 93279 -37.24236 -8.406528 589.258
## 93280 -37.24208 -8.406528 589.429
## 93281 -37.24180 -8.406528 589.768
## 93282 -37.24152 -8.406528 590.080
## 93283 -37.24125 -8.406528 590.343
## 93284 -37.24097 -8.406528 590.678
## 93285 -37.24069 -8.406528 590.895
## 93286 -37.24041 -8.406528 590.914
## 93287 -37.24013 -8.406528 590.464
## 93288 -37.23986 -8.406528 589.285
## 93289 -37.23958 -8.406528 587.933
## 93290 -37.23930 -8.406528 586.374
## 93291 -37.23902 -8.406528 584.978
## 93292 -37.23875 -8.406528 583.772
## 93293 -37.23847 -8.406528 582.826
## 93294 -37.23819 -8.406528 582.197
## 93295 -37.23791 -8.406528 581.558
## 93296 -37.23763 -8.406528 580.852
## 93297 -37.23736 -8.406528 579.712
## 93298 -37.23708 -8.406528 578.502
## 93299 -37.23680 -8.406528 577.442
## 93300 -37.23652 -8.406528 576.489
## 93301 -37.23625 -8.406528 575.836
## 93302 -37.23597 -8.406528 575.399
## 93303 -37.23569 -8.406528 575.512
## 93304 -37.23541 -8.406528 575.714
## 93305 -37.23513 -8.406528 575.551
## 93306 -37.23486 -8.406528 574.695
## 93307 -37.23458 -8.406528 573.629
## 93308 -37.23430 -8.406528 572.480
## 93309 -37.23402 -8.406528 571.757
## 93310 -37.23375 -8.406528 571.147
## 93311 -37.23347 -8.406528 570.484
## 93312 -37.23319 -8.406528 570.030
## 93313 -37.23291 -8.406528 569.918
## 93314 -37.23263 -8.406528 570.634
## 93315 -37.23236 -8.406528 572.399
## 93316 -37.23208 -8.406528 574.135
## 93317 -37.23180 -8.406528 575.587
## 93318 -37.23152 -8.406528 576.109
## 93319 -37.23125 -8.406528 576.121
## 93320 -37.23097 -8.406528 575.898
## 93321 -37.23069 -8.406528 575.993
## 93322 -37.23041 -8.406528 576.241
## 93323 -37.23013 -8.406528 576.457
## 93324 -37.22986 -8.406528 575.967
## 93325 -37.22958 -8.406528 575.621
## 93326 -37.22930 -8.406528 575.202
## 93327 -37.22902 -8.406528 575.375
## 93328 -37.22875 -8.406528 575.576
## 93329 -37.22847 -8.406528 575.805
## 93330 -37.22819 -8.406528 575.676
## 93331 -37.22791 -8.406528 575.633
## 93332 -37.22763 -8.406528 575.368
## 93333 -37.22736 -8.406528 575.155
## 93334 -37.22708 -8.406528 575.089
## 93335 -37.22680 -8.406528 575.059
## 93336 -37.22652 -8.406528 575.301
## 93337 -37.22625 -8.406528 575.722
## 93338 -37.22597 -8.406528 575.878
## 93339 -37.22569 -8.406528 575.647
## 93340 -37.22541 -8.406528 575.187
## 93341 -37.22513 -8.406528 574.691
## 93342 -37.22486 -8.406528 574.644
## 93343 -37.22458 -8.406528 574.145
## 93344 -37.22430 -8.406528 573.137
## 93345 -37.22402 -8.406528 571.063
## 93346 -37.22375 -8.406528 569.061
## 94200 -37.36291 -8.406806 524.053
## 94201 -37.36263 -8.406806 523.452
## 94202 -37.36236 -8.406806 523.899
## 94203 -37.36208 -8.406806 524.713
## 94204 -37.36180 -8.406806 525.960
## 94205 -37.36152 -8.406806 526.498
## 94206 -37.36125 -8.406806 527.193
## 94207 -37.36097 -8.406806 527.306
## 94208 -37.36069 -8.406806 526.735
## 94209 -37.36041 -8.406806 526.111
## 94210 -37.36013 -8.406806 525.605
## 94211 -37.35986 -8.406806 525.963
## 94212 -37.35958 -8.406806 526.408
## 94213 -37.35930 -8.406806 527.189
## 94214 -37.35902 -8.406806 527.451
## 94215 -37.35875 -8.406806 527.386
## 94216 -37.35847 -8.406806 527.183
## 94217 -37.35819 -8.406806 527.096
## 94218 -37.35791 -8.406806 526.774
## 94219 -37.35763 -8.406806 526.671
## 94220 -37.35736 -8.406806 526.199
## 94221 -37.35708 -8.406806 526.024
## 94222 -37.35680 -8.406806 525.793
## 94223 -37.35652 -8.406806 525.904
## 94224 -37.35625 -8.406806 526.188
## 94225 -37.35597 -8.406806 526.472
## 94226 -37.35569 -8.406806 526.739
## 94227 -37.35541 -8.406806 527.268
## 94228 -37.35513 -8.406806 528.127
## 94229 -37.35486 -8.406806 529.600
## 94230 -37.35458 -8.406806 530.817
## 94231 -37.35430 -8.406806 531.835
## 94232 -37.35402 -8.406806 531.995
## 94233 -37.35375 -8.406806 531.885
## 94234 -37.35347 -8.406806 532.099
## 94235 -37.35319 -8.406806 532.915
## 94236 -37.35291 -8.406806 534.032
## 94237 -37.35263 -8.406806 535.106
## 94238 -37.35236 -8.406806 535.071
## 94239 -37.35208 -8.406806 534.861
## 94240 -37.35180 -8.406806 533.811
## 94241 -37.35152 -8.406806 533.057
## 94242 -37.35125 -8.406806 532.863
## 94243 -37.35097 -8.406806 532.847
## 94244 -37.35069 -8.406806 533.164
## 94245 -37.35041 -8.406806 533.972
## 94246 -37.35013 -8.406806 535.116
## 94247 -37.34986 -8.406806 535.982
## 94248 -37.34958 -8.406806 536.519
## 94249 -37.34930 -8.406806 536.870
## 94250 -37.34902 -8.406806 537.254
## 94251 -37.34875 -8.406806 537.639
## 94252 -37.34847 -8.406806 537.651
## 94253 -37.34819 -8.406806 537.062
## 94254 -37.34791 -8.406806 536.700
## 94255 -37.34763 -8.406806 536.520
## 94256 -37.34736 -8.406806 536.951
## 94257 -37.34708 -8.406806 537.226
## 94258 -37.34680 -8.406806 537.492
## 94259 -37.34652 -8.406806 536.725
## 94260 -37.34625 -8.406806 535.837
## 94261 -37.34597 -8.406806 535.106
## 94262 -37.34569 -8.406806 535.306
## 94263 -37.34541 -8.406806 535.842
## 94264 -37.34513 -8.406806 536.378
## 94265 -37.34486 -8.406806 536.575
## 94266 -37.34458 -8.406806 536.667
## 94267 -37.34430 -8.406806 536.378
## 94268 -37.34402 -8.406806 535.791
## 94269 -37.34375 -8.406806 535.172
## 94270 -37.34347 -8.406806 534.882
## 94271 -37.34319 -8.406806 535.225
## 94272 -37.34291 -8.406806 535.966
## 94273 -37.34263 -8.406806 536.581
## 94274 -37.34236 -8.406806 536.924
## 94275 -37.34208 -8.406806 537.019
## 94276 -37.34180 -8.406806 537.148
## 94277 -37.34152 -8.406806 536.925
## 94278 -37.34125 -8.406806 536.751
## 94279 -37.34097 -8.406806 536.576
## 94280 -37.34069 -8.406806 536.763
## 94281 -37.34041 -8.406806 537.186
## 94282 -37.34013 -8.406806 537.491
## 94283 -37.33986 -8.406806 537.926
## 94284 -37.33958 -8.406806 538.335
## 94285 -37.33930 -8.406806 538.635
## 94286 -37.33902 -8.406806 539.184
## 94287 -37.33875 -8.406806 539.282
## 94288 -37.33847 -8.406806 539.216
## 94289 -37.33819 -8.406806 538.413
## 94290 -37.33791 -8.406806 538.220
## 94291 -37.33763 -8.406806 537.590
## 94292 -37.33736 -8.406806 537.856
## 94293 -37.33708 -8.406806 538.344
## 94294 -37.33680 -8.406806 539.022
## 94295 -37.33652 -8.406806 539.524
## 94296 -37.33625 -8.406806 539.993
## 94297 -37.33597 -8.406806 540.463
## 94298 -37.33569 -8.406806 540.728
## 94299 -37.33541 -8.406806 540.779
## 94300 -37.33513 -8.406806 540.599
## 94301 -37.33486 -8.406806 540.639
## 94302 -37.33458 -8.406806 540.697
## 94303 -37.33430 -8.406806 540.996
## 94304 -37.33402 -8.406806 541.328
## 94305 -37.33375 -8.406806 541.804
## 94306 -37.33347 -8.406806 542.495
## 94307 -37.33319 -8.406806 543.320
## 94308 -37.33291 -8.406806 544.008
## 94309 -37.33263 -8.406806 544.464
## 94310 -37.33236 -8.406806 544.331
## 94311 -37.33208 -8.406806 543.959
## 94312 -37.33180 -8.406806 543.331
## 94313 -37.33152 -8.406806 542.895
## 94314 -37.33125 -8.406806 542.335
## 94315 -37.33097 -8.406806 541.508
## 94316 -37.33069 -8.406806 539.779
## 94317 -37.33041 -8.406806 538.316
## 94318 -37.33013 -8.406806 537.759
## 94319 -37.32986 -8.406806 539.117
## 94320 -37.32958 -8.406806 540.895
## 94321 -37.32930 -8.406806 542.418
## 94322 -37.32902 -8.406806 542.748
## 94323 -37.32875 -8.406806 542.903
## 94324 -37.32847 -8.406806 542.901
## 94325 -37.32819 -8.406806 542.876
## 94326 -37.32791 -8.406806 543.157
## 94327 -37.32763 -8.406806 543.677
## 94328 -37.32736 -8.406806 544.460
## 94329 -37.32708 -8.406806 545.359
## 94330 -37.32680 -8.406806 545.890
## 94331 -37.32652 -8.406806 546.376
## 94332 -37.32625 -8.406806 546.794
## 94333 -37.32597 -8.406806 546.979
## 94334 -37.32569 -8.406806 547.072
## 94335 -37.32541 -8.406806 546.748
## 94336 -37.32513 -8.406806 546.604
## 94337 -37.32486 -8.406806 545.807
## 94338 -37.32458 -8.406806 545.075
## 94339 -37.32430 -8.406806 544.545
## 94340 -37.32402 -8.406806 544.459
## 94341 -37.32375 -8.406806 545.129
## 94342 -37.32347 -8.406806 545.886
## 94343 -37.32319 -8.406806 546.738
## 94344 -37.32291 -8.406806 547.808
## 94345 -37.32263 -8.406806 548.986
## 94346 -37.32236 -8.406806 549.997
## 94347 -37.32208 -8.406806 550.648
## 94348 -37.32180 -8.406806 550.712
## 94349 -37.32152 -8.406806 550.407
## 94350 -37.32125 -8.406806 550.091
## 94351 -37.32097 -8.406806 550.229
## 94352 -37.32069 -8.406806 551.004
## 94353 -37.32041 -8.406806 552.234
## 94354 -37.32013 -8.406806 553.606
## 94355 -37.31986 -8.406806 554.607
## 94356 -37.31958 -8.406806 555.198
## 94357 -37.31930 -8.406806 554.992
## 94358 -37.31902 -8.406806 553.829
## 94359 -37.31875 -8.406806 552.799
## 94360 -37.31847 -8.406806 551.867
## 94361 -37.31819 -8.406806 551.803
## 94362 -37.31791 -8.406806 552.072
## 94363 -37.31763 -8.406806 552.670
## 94364 -37.31736 -8.406806 553.155
## 94365 -37.31708 -8.406806 553.564
## 94366 -37.31680 -8.406806 554.500
## 94367 -37.31652 -8.406806 555.502
## 94368 -37.31625 -8.406806 556.062
## 94369 -37.31597 -8.406806 555.726
## 94370 -37.31569 -8.406806 554.471
## 94371 -37.31541 -8.406806 552.633
## 94372 -37.31513 -8.406806 551.691
## 94373 -37.31486 -8.406806 551.951
## 94374 -37.31458 -8.406806 552.587
## 94375 -37.31430 -8.406806 553.834
## 94376 -37.31402 -8.406806 553.495
## 94377 -37.31375 -8.406806 552.873
## 94378 -37.31347 -8.406806 551.581
## 94379 -37.31319 -8.406806 550.979
## 94380 -37.31291 -8.406806 550.160
## 94381 -37.31263 -8.406806 548.819
## 94382 -37.31236 -8.406806 547.350
## 94383 -37.31208 -8.406806 545.841
## 94384 -37.31180 -8.406806 545.062
## 94385 -37.31152 -8.406806 544.547
## 94386 -37.31125 -8.406806 544.076
## 94387 -37.31097 -8.406806 543.862
## 94388 -37.31069 -8.406806 544.046
## 94389 -37.31041 -8.406806 544.314
## 94390 -37.31013 -8.406806 544.789
## 94391 -37.30986 -8.406806 545.375
## 94392 -37.30958 -8.406806 546.277
## 94393 -37.30930 -8.406806 547.069
## 94394 -37.30902 -8.406806 548.291
## 94395 -37.30875 -8.406806 549.358
## 94396 -37.30847 -8.406806 550.354
## 94397 -37.30819 -8.406806 551.817
## 94398 -37.30791 -8.406806 552.670
## 94399 -37.30763 -8.406806 553.189
## 94400 -37.30736 -8.406806 552.188
## 94401 -37.30708 -8.406806 550.969
## 94402 -37.30680 -8.406806 549.483
## 94403 -37.30652 -8.406806 549.021
## 94404 -37.30625 -8.406806 549.030
## 94405 -37.30597 -8.406806 549.121
## 94406 -37.30569 -8.406806 549.203
## 94407 -37.30541 -8.406806 549.386
## 94408 -37.30513 -8.406806 549.753
## 94409 -37.30486 -8.406806 550.256
## 94410 -37.30458 -8.406806 551.161
## 94411 -37.30430 -8.406806 552.016
## 94412 -37.30402 -8.406806 553.444
## 94413 -37.30375 -8.406806 555.189
## 94414 -37.30347 -8.406806 557.040
## 94415 -37.30319 -8.406806 559.020
## 94416 -37.30291 -8.406806 560.139
## 94417 -37.30263 -8.406806 561.073
## 94418 -37.30236 -8.406806 560.782
## 94419 -37.30208 -8.406806 560.053
## 94420 -37.30180 -8.406806 559.462
## 94421 -37.30152 -8.406806 558.731
## 94422 -37.30125 -8.406806 558.031
## 94423 -37.30097 -8.406806 557.249
## 94424 -37.30069 -8.406806 556.573
## 94425 -37.30041 -8.406806 556.222
## 94426 -37.30013 -8.406806 556.017
## 94427 -37.29986 -8.406806 556.669
## 94428 -37.29958 -8.406806 557.397
## 94429 -37.29930 -8.406806 557.981
## 94430 -37.29902 -8.406806 557.656
## 94431 -37.29875 -8.406806 556.708
## 94432 -37.29847 -8.406806 555.706
## 94433 -37.29819 -8.406806 554.764
## 94434 -37.29791 -8.406806 553.889
## 94435 -37.29763 -8.406806 553.307
## 94436 -37.29736 -8.406806 552.926
## 94437 -37.29708 -8.406806 553.001
## 94438 -37.29680 -8.406806 553.258
## 94439 -37.29652 -8.406806 553.928
## 94440 -37.29625 -8.406806 554.767
## 94441 -37.29597 -8.406806 555.268
## 94442 -37.29569 -8.406806 555.456
## 94443 -37.29541 -8.406806 555.283
## 94444 -37.29513 -8.406806 555.291
## 94445 -37.29486 -8.406806 554.981
## 94446 -37.29458 -8.406806 554.568
## 94447 -37.29430 -8.406806 554.065
## 94448 -37.29402 -8.406806 553.922
## 94449 -37.29375 -8.406806 553.672
## 94450 -37.29347 -8.406806 553.098
## 94451 -37.29319 -8.406806 552.045
## 94452 -37.29291 -8.406806 551.381
## 94453 -37.29263 -8.406806 551.768
## 94454 -37.29236 -8.406806 553.775
## 94455 -37.29208 -8.406806 556.146
## 94456 -37.29180 -8.406806 558.261
## 94457 -37.29152 -8.406806 559.115
## 94458 -37.29125 -8.406806 559.154
## 94459 -37.29097 -8.406806 558.539
## 94460 -37.29069 -8.406806 557.480
## 94461 -37.29041 -8.406806 556.301
## 94462 -37.29013 -8.406806 554.926
## 94463 -37.28986 -8.406806 554.215
## 94464 -37.28958 -8.406806 553.604
## 94465 -37.28930 -8.406806 553.502
## 94466 -37.28902 -8.406806 553.105
## 94467 -37.28875 -8.406806 552.826
## 94468 -37.28847 -8.406806 552.934
## 94469 -37.28819 -8.406806 553.982
## 94470 -37.28791 -8.406806 555.199
## 94471 -37.28763 -8.406806 556.286
## 94472 -37.28736 -8.406806 556.835
## 94473 -37.28708 -8.406806 557.129
## 94474 -37.28680 -8.406806 557.432
## 94475 -37.28652 -8.406806 557.473
## 94476 -37.28625 -8.406806 557.309
## 94477 -37.28597 -8.406806 556.879
## 94478 -37.28569 -8.406806 556.231
## 94479 -37.28541 -8.406806 555.628
## 94480 -37.28513 -8.406806 555.015
## 94481 -37.28486 -8.406806 554.815
## 94482 -37.28458 -8.406806 554.710
## 94483 -37.28430 -8.406806 554.803
## 94484 -37.28402 -8.406806 554.671
## 94485 -37.28375 -8.406806 554.638
## 94486 -37.28347 -8.406806 554.733
## 94487 -37.28319 -8.406806 555.466
## 94488 -37.28291 -8.406806 556.259
## 94489 -37.28263 -8.406806 557.224
## 94490 -37.28236 -8.406806 557.722
## 94491 -37.28208 -8.406806 558.351
## 94492 -37.28180 -8.406806 558.809
## 94493 -37.28152 -8.406806 560.049
## 94494 -37.28125 -8.406806 561.291
## 94495 -37.28097 -8.406806 562.584
## 94496 -37.28069 -8.406806 563.570
## 94497 -37.28041 -8.406806 564.350
## 94498 -37.28013 -8.406806 565.139
## 94499 -37.27986 -8.406806 565.825
## 94500 -37.27958 -8.406806 566.540
## 94501 -37.27930 -8.406806 567.048
## 94502 -37.27902 -8.406806 568.021
## 94503 -37.27875 -8.406806 568.835
## 94504 -37.27847 -8.406806 569.622
## 94505 -37.27819 -8.406806 569.891
## 94506 -37.27791 -8.406806 569.863
## 94507 -37.27763 -8.406806 569.954
## 94508 -37.27736 -8.406806 570.360
## 94509 -37.27708 -8.406806 570.861
## 94510 -37.27680 -8.406806 570.877
## 94511 -37.27652 -8.406806 570.607
## 94512 -37.27625 -8.406806 570.354
## 94513 -37.27597 -8.406806 570.159
## 94514 -37.27569 -8.406806 570.896
## 94515 -37.27541 -8.406806 571.662
## 94516 -37.27513 -8.406806 572.695
## 94517 -37.27486 -8.406806 572.985
## 94518 -37.27458 -8.406806 573.070
## 94519 -37.27430 -8.406806 572.768
## 94520 -37.27402 -8.406806 572.561
## 94521 -37.27375 -8.406806 572.507
## 94522 -37.27347 -8.406806 572.338
## 94523 -37.27319 -8.406806 572.442
## 94524 -37.27291 -8.406806 572.764
## 94525 -37.27263 -8.406806 572.885
## 94526 -37.27236 -8.406806 572.675
## 94527 -37.27208 -8.406806 572.380
## 94528 -37.27180 -8.406806 572.478
## 94529 -37.27152 -8.406806 573.014
## 94530 -37.27125 -8.406806 573.296
## 94531 -37.27097 -8.406806 573.128
## 94532 -37.27069 -8.406806 571.903
## 94533 -37.27041 -8.406806 569.986
## 94534 -37.27013 -8.406806 567.759
## 94535 -37.26986 -8.406806 565.515
## 94536 -37.26958 -8.406806 563.602
## 94537 -37.26930 -8.406806 562.702
## 94538 -37.26902 -8.406806 563.440
## 94539 -37.26875 -8.406806 564.846
## 94540 -37.26847 -8.406806 566.397
## 94541 -37.26819 -8.406806 567.421
## 94542 -37.26791 -8.406806 568.098
## 94543 -37.26763 -8.406806 568.472
## 94544 -37.26736 -8.406806 568.442
## 94545 -37.26708 -8.406806 568.139
## 94546 -37.26680 -8.406806 568.033
## 94547 -37.26652 -8.406806 568.080
## 94548 -37.26625 -8.406806 567.965
## 94549 -37.26597 -8.406806 567.746
## 94550 -37.26569 -8.406806 567.371
## 94551 -37.26541 -8.406806 566.626
## 94552 -37.26513 -8.406806 565.359
## 94553 -37.26486 -8.406806 563.170
## 94554 -37.26458 -8.406806 561.146
## 94555 -37.26430 -8.406806 559.579
## 94556 -37.26402 -8.406806 559.388
## 94557 -37.26375 -8.406806 559.372
## 94558 -37.26347 -8.406806 559.391
## 94559 -37.26319 -8.406806 558.692
## 94560 -37.26291 -8.406806 558.101
## 94561 -37.26263 -8.406806 557.880
## 94562 -37.26236 -8.406806 558.711
## 94563 -37.26208 -8.406806 559.749
## 94564 -37.26180 -8.406806 561.010
## 94565 -37.26152 -8.406806 561.966
## 94566 -37.26125 -8.406806 562.611
## 94567 -37.26097 -8.406806 563.281
## 94568 -37.26069 -8.406806 563.777
## 94569 -37.26041 -8.406806 563.932
## 94570 -37.26013 -8.406806 563.451
## 94571 -37.25986 -8.406806 562.334
## 94572 -37.25958 -8.406806 561.103
## 94573 -37.25930 -8.406806 560.092
## 94574 -37.25902 -8.406806 559.392
## 94575 -37.25875 -8.406806 558.915
## 94576 -37.25847 -8.406806 558.410
## 94577 -37.25819 -8.406806 558.175
## 94578 -37.25791 -8.406806 558.120
## 94579 -37.25763 -8.406806 557.882
## 94580 -37.25736 -8.406806 557.290
## 94581 -37.25708 -8.406806 556.743
## 94582 -37.25680 -8.406806 556.980
## 94583 -37.25652 -8.406806 557.669
## 94584 -37.25625 -8.406806 558.226
## 94585 -37.25597 -8.406806 558.261
## 94586 -37.25569 -8.406806 558.016
## 94587 -37.25541 -8.406806 557.865
## 94588 -37.25513 -8.406806 558.015
## 94589 -37.25486 -8.406806 559.345
## 94590 -37.25458 -8.406806 560.753
## 94591 -37.25430 -8.406806 562.782
## 94592 -37.25402 -8.406806 564.388
## 94593 -37.25375 -8.406806 565.450
## 94594 -37.25347 -8.406806 565.967
## 94595 -37.25319 -8.406806 566.505
## 94596 -37.25291 -8.406806 566.877
## 94597 -37.25263 -8.406806 567.745
## 94598 -37.25236 -8.406806 568.293
## 94599 -37.25208 -8.406806 568.940
## 94600 -37.25180 -8.406806 570.055
## 94601 -37.25152 -8.406806 571.390
## 94602 -37.25125 -8.406806 572.968
## 94603 -37.25097 -8.406806 573.836
## 94604 -37.25069 -8.406806 574.336
## 94605 -37.25041 -8.406806 575.082
## 94606 -37.25013 -8.406806 575.752
## 94607 -37.24986 -8.406806 576.279
## 94608 -37.24958 -8.406806 576.478
## 94609 -37.24930 -8.406806 576.463
## 94610 -37.24902 -8.406806 576.376
## 94611 -37.24875 -8.406806 576.231
## 94612 -37.24847 -8.406806 576.392
## 94613 -37.24819 -8.406806 576.735
## 94614 -37.24791 -8.406806 577.197
## 94615 -37.24763 -8.406806 577.607
## 94616 -37.24736 -8.406806 577.484
## 94617 -37.24708 -8.406806 577.284
## 94618 -37.24680 -8.406806 576.809
## 94619 -37.24652 -8.406806 576.827
## 94620 -37.24625 -8.406806 576.960
## 94621 -37.24597 -8.406806 577.314
## 94622 -37.24569 -8.406806 578.111
## 94623 -37.24541 -8.406806 578.698
## 94624 -37.24513 -8.406806 579.713
## 94625 -37.24486 -8.406806 580.781
## 94626 -37.24458 -8.406806 582.110
## 94627 -37.24430 -8.406806 583.530
## 94628 -37.24402 -8.406806 585.297
## 94629 -37.24375 -8.406806 586.933
## 94630 -37.24347 -8.406806 588.098
## 94631 -37.24319 -8.406806 588.709
## 94632 -37.24291 -8.406806 589.078
## 94633 -37.24263 -8.406806 589.220
## 94634 -37.24236 -8.406806 589.550
## 94635 -37.24208 -8.406806 589.791
## 94636 -37.24180 -8.406806 590.259
## 94637 -37.24152 -8.406806 590.626
## 94638 -37.24125 -8.406806 591.020
## 94639 -37.24097 -8.406806 591.460
## 94640 -37.24069 -8.406806 591.606
## 94641 -37.24041 -8.406806 591.616
## 94642 -37.24013 -8.406806 591.234
## 94643 -37.23986 -8.406806 589.983
## 94644 -37.23958 -8.406806 588.604
## 94645 -37.23930 -8.406806 586.918
## 94646 -37.23902 -8.406806 585.662
## 94647 -37.23875 -8.406806 584.612
## 94648 -37.23847 -8.406806 583.617
## 94649 -37.23819 -8.406806 582.710
## 94650 -37.23791 -8.406806 581.818
## 94651 -37.23763 -8.406806 581.046
## 94652 -37.23736 -8.406806 580.152
## 94653 -37.23708 -8.406806 579.149
## 94654 -37.23680 -8.406806 578.368
## 94655 -37.23652 -8.406806 577.570
## 94656 -37.23625 -8.406806 577.112
## 94657 -37.23597 -8.406806 576.882
## 94658 -37.23569 -8.406806 576.983
## 94659 -37.23541 -8.406806 577.179
## 94660 -37.23513 -8.406806 577.015
## 94661 -37.23486 -8.406806 576.254
## 94662 -37.23458 -8.406806 575.203
## 94663 -37.23430 -8.406806 574.063
## 94664 -37.23402 -8.406806 573.286
## 94665 -37.23375 -8.406806 572.504
## 94666 -37.23347 -8.406806 571.773
## 94667 -37.23319 -8.406806 571.629
## 94668 -37.23291 -8.406806 571.417
## 94669 -37.23263 -8.406806 572.283
## 94670 -37.23236 -8.406806 573.908
## 94671 -37.23208 -8.406806 575.385
## 94672 -37.23180 -8.406806 576.684
## 94673 -37.23152 -8.406806 576.684
## 94674 -37.23125 -8.406806 576.255
## 94675 -37.23097 -8.406806 575.769
## 94676 -37.23069 -8.406806 575.528
## 94677 -37.23041 -8.406806 575.656
## 94678 -37.23013 -8.406806 575.708
## 94679 -37.22986 -8.406806 576.127
## 94680 -37.22958 -8.406806 576.589
## 94681 -37.22930 -8.406806 577.005
## 94682 -37.22902 -8.406806 576.889
## 94683 -37.22875 -8.406806 576.862
## 94684 -37.22847 -8.406806 576.980
## 94685 -37.22819 -8.406806 576.758
## 94686 -37.22791 -8.406806 576.511
## 94687 -37.22763 -8.406806 576.171
## 94688 -37.22736 -8.406806 575.909
## 94689 -37.22708 -8.406806 575.766
## 94690 -37.22680 -8.406806 575.817
## 94691 -37.22652 -8.406806 575.803
## 94692 -37.22625 -8.406806 575.858
## 94693 -37.22597 -8.406806 575.858
## 94694 -37.22569 -8.406806 576.129
## 94695 -37.22541 -8.406806 575.841
## 94696 -37.22513 -8.406806 575.795
## 94697 -37.22486 -8.406806 575.492
## 94698 -37.22458 -8.406806 574.690
## 94699 -37.22430 -8.406806 573.624
## 94700 -37.22402 -8.406806 571.289
## 94701 -37.22375 -8.406806 569.067
## 95554 -37.36319 -8.407083 524.201
## 95555 -37.36291 -8.407083 523.289
## 95556 -37.36263 -8.407083 522.965
## 95557 -37.36236 -8.407083 523.882
## 95558 -37.36208 -8.407083 525.295
## 95559 -37.36180 -8.407083 526.742
## 95560 -37.36152 -8.407083 527.717
## 95561 -37.36125 -8.407083 528.271
## 95562 -37.36097 -8.407083 528.349
## 95563 -37.36069 -8.407083 527.792
## 95564 -37.36041 -8.407083 527.083
## 95565 -37.36013 -8.407083 526.577
## 95566 -37.35986 -8.407083 526.834
## 95567 -37.35958 -8.407083 527.331
## 95568 -37.35930 -8.407083 527.850
## 95569 -37.35902 -8.407083 527.877
## 95570 -37.35875 -8.407083 527.702
## 95571 -37.35847 -8.407083 527.607
## 95572 -37.35819 -8.407083 527.577
## 95573 -37.35791 -8.407083 527.701
## 95574 -37.35763 -8.407083 527.789
## 95575 -37.35736 -8.407083 527.703
## 95576 -37.35708 -8.407083 527.614
## 95577 -37.35680 -8.407083 527.577
## 95578 -37.35652 -8.407083 527.682
## 95579 -37.35625 -8.407083 527.819
## 95580 -37.35597 -8.407083 528.003
## 95581 -37.35569 -8.407083 527.923
## 95582 -37.35541 -8.407083 528.031
## 95583 -37.35513 -8.407083 528.470
## 95584 -37.35486 -8.407083 529.553
## 95585 -37.35458 -8.407083 530.685
## 95586 -37.35430 -8.407083 531.472
## 95587 -37.35402 -8.407083 531.494
## 95588 -37.35375 -8.407083 531.413
## 95589 -37.35347 -8.407083 531.548
## 95590 -37.35319 -8.407083 532.583
## 95591 -37.35291 -8.407083 533.748
## 95592 -37.35263 -8.407083 534.624
## 95593 -37.35236 -8.407083 534.605
## 95594 -37.35208 -8.407083 534.198
## 95595 -37.35180 -8.407083 533.650
## 95596 -37.35152 -8.407083 533.378
## 95597 -37.35125 -8.407083 533.370
## 95598 -37.35097 -8.407083 533.551
## 95599 -37.35069 -8.407083 534.077
## 95600 -37.35041 -8.407083 534.684
## 95601 -37.35013 -8.407083 535.343
## 95602 -37.34986 -8.407083 535.866
## 95603 -37.34958 -8.407083 536.338
## 95604 -37.34930 -8.407083 536.837
## 95605 -37.34902 -8.407083 537.500
## 95606 -37.34875 -8.407083 538.062
## 95607 -37.34847 -8.407083 538.311
## 95608 -37.34819 -8.407083 538.215
## 95609 -37.34791 -8.407083 537.909
## 95610 -37.34763 -8.407083 537.687
## 95611 -37.34736 -8.407083 537.879
## 95612 -37.34708 -8.407083 538.038
## 95613 -37.34680 -8.407083 537.873
## 95614 -37.34652 -8.407083 537.046
## 95615 -37.34625 -8.407083 536.216
## 95616 -37.34597 -8.407083 535.777
## 95617 -37.34569 -8.407083 536.214
## 95618 -37.34541 -8.407083 537.021
## 95619 -37.34513 -8.407083 537.782
## 95620 -37.34486 -8.407083 537.986
## 95621 -37.34458 -8.407083 537.894
## 95622 -37.34430 -8.407083 537.481
## 95623 -37.34402 -8.407083 536.797
## 95624 -37.34375 -8.407083 536.193
## 95625 -37.34347 -8.407083 535.971
## 95626 -37.34319 -8.407083 536.413
## 95627 -37.34291 -8.407083 537.168
## 95628 -37.34263 -8.407083 537.896
## 95629 -37.34236 -8.407083 538.260
## 95630 -37.34208 -8.407083 538.403
## 95631 -37.34180 -8.407083 538.406
## 95632 -37.34152 -8.407083 538.328
## 95633 -37.34125 -8.407083 538.269
## 95634 -37.34097 -8.407083 538.304
## 95635 -37.34069 -8.407083 538.618
## 95636 -37.34041 -8.407083 539.043
## 95637 -37.34013 -8.407083 539.500
## 95638 -37.33986 -8.407083 539.863
## 95639 -37.33958 -8.407083 540.191
## 95640 -37.33930 -8.407083 540.446
## 95641 -37.33902 -8.407083 540.704
## 95642 -37.33875 -8.407083 540.820
## 95643 -37.33847 -8.407083 540.633
## 95644 -37.33819 -8.407083 540.120
## 95645 -37.33791 -8.407083 539.501
## 95646 -37.33763 -8.407083 539.110
## 95647 -37.33736 -8.407083 539.338
## 95648 -37.33708 -8.407083 539.804
## 95649 -37.33680 -8.407083 540.340
## 95650 -37.33652 -8.407083 540.738
## 95651 -37.33625 -8.407083 541.084
## 95652 -37.33597 -8.407083 541.357
## 95653 -37.33569 -8.407083 541.575
## 95654 -37.33541 -8.407083 541.749
## 95655 -37.33513 -8.407083 541.891
## 95656 -37.33486 -8.407083 542.030
## 95657 -37.33458 -8.407083 542.191
## 95658 -37.33430 -8.407083 542.390
## 95659 -37.33402 -8.407083 542.630
## 95660 -37.33375 -8.407083 542.957
## 95661 -37.33347 -8.407083 543.395
## 95662 -37.33319 -8.407083 544.011
## 95663 -37.33291 -8.407083 544.570
## 95664 -37.33263 -8.407083 544.917
## 95665 -37.33236 -8.407083 544.837
## 95666 -37.33208 -8.407083 544.497
## 95667 -37.33180 -8.407083 543.972
## 95668 -37.33152 -8.407083 543.533
## 95669 -37.33125 -8.407083 542.896
## 95670 -37.33097 -8.407083 541.939
## 95671 -37.33069 -8.407083 540.109
## 95672 -37.33041 -8.407083 538.530
## 95673 -37.33013 -8.407083 537.885
## 95674 -37.32986 -8.407083 539.085
## 95675 -37.32958 -8.407083 540.931
## 95676 -37.32930 -8.407083 542.632
## 95677 -37.32902 -8.407083 543.420
## 95678 -37.32875 -8.407083 543.803
## 95679 -37.32847 -8.407083 543.958
## 95680 -37.32819 -8.407083 544.176
## 95681 -37.32791 -8.407083 544.489
## 95682 -37.32763 -8.407083 545.003
## 95683 -37.32736 -8.407083 545.832
## 95684 -37.32708 -8.407083 546.744
## 95685 -37.32680 -8.407083 547.556
## 95686 -37.32652 -8.407083 548.139
## 95687 -37.32625 -8.407083 548.472
## 95688 -37.32597 -8.407083 548.564
## 95689 -37.32569 -8.407083 548.392
## 95690 -37.32541 -8.407083 547.985
## 95691 -37.32513 -8.407083 547.376
## 95692 -37.32486 -8.407083 546.518
## 95693 -37.32458 -8.407083 545.769
## 95694 -37.32430 -8.407083 545.352
## 95695 -37.32402 -8.407083 545.584
## 95696 -37.32375 -8.407083 546.284
## 95697 -37.32347 -8.407083 547.268
## 95698 -37.32319 -8.407083 548.366
## 95699 -37.32291 -8.407083 549.499
## 95700 -37.32263 -8.407083 550.585
## 95701 -37.32236 -8.407083 551.552
## 95702 -37.32208 -8.407083 552.248
## 95703 -37.32180 -8.407083 552.506
## 95704 -37.32152 -8.407083 552.226
## 95705 -37.32125 -8.407083 551.896
## 95706 -37.32097 -8.407083 551.825
## 95707 -37.32069 -8.407083 552.503
## 95708 -37.32041 -8.407083 553.511
## 95709 -37.32013 -8.407083 554.669
## 95710 -37.31986 -8.407083 555.777
## 95711 -37.31958 -8.407083 556.509
## 95712 -37.31930 -8.407083 556.558
## 95713 -37.31902 -8.407083 555.677
## 95714 -37.31875 -8.407083 554.493
## 95715 -37.31847 -8.407083 553.404
## 95716 -37.31819 -8.407083 553.109
## 95717 -37.31791 -8.407083 553.221
## 95718 -37.31763 -8.407083 553.631
## 95719 -37.31736 -8.407083 554.075
## 95720 -37.31708 -8.407083 554.644
## 95721 -37.31680 -8.407083 555.253
## 95722 -37.31652 -8.407083 555.991
## 95723 -37.31625 -8.407083 556.405
## 95724 -37.31597 -8.407083 556.234
## 95725 -37.31569 -8.407083 554.986
## 95726 -37.31541 -8.407083 553.556
## 95727 -37.31513 -8.407083 552.552
## 95728 -37.31486 -8.407083 552.831
## 95729 -37.31458 -8.407083 553.499
## 95730 -37.31430 -8.407083 553.933
## 95731 -37.31402 -8.407083 553.474
## 95732 -37.31375 -8.407083 552.753
## 95733 -37.31347 -8.407083 551.929
## 95734 -37.31319 -8.407083 551.563
## 95735 -37.31291 -8.407083 551.069
## 95736 -37.31263 -8.407083 550.225
## 95737 -37.31236 -8.407083 548.748
## 95738 -37.31208 -8.407083 547.152
## 95739 -37.31180 -8.407083 545.755
## 95740 -37.31152 -8.407083 544.864
## 95741 -37.31125 -8.407083 544.353
## 95742 -37.31097 -8.407083 544.209
## 95743 -37.31069 -8.407083 544.414
## 95744 -37.31041 -8.407083 544.886
## 95745 -37.31013 -8.407083 545.514
## 95746 -37.30986 -8.407083 546.122
## 95747 -37.30958 -8.407083 546.844
## 95748 -37.30930 -8.407083 547.707
## 95749 -37.30902 -8.407083 548.753
## 95750 -37.30875 -8.407083 549.928
## 95751 -37.30847 -8.407083 551.221
## 95752 -37.30819 -8.407083 552.879
## 95753 -37.30791 -8.407083 554.175
## 95754 -37.30763 -8.407083 554.683
## 95755 -37.30736 -8.407083 553.826
## 95756 -37.30708 -8.407083 552.507
## 95757 -37.30680 -8.407083 551.319
## 95758 -37.30652 -8.407083 550.820
## 95759 -37.30625 -8.407083 550.690
## 95760 -37.30597 -8.407083 550.801
## 95761 -37.30569 -8.407083 550.954
## 95762 -37.30541 -8.407083 551.142
## 95763 -37.30513 -8.407083 551.294
## 95764 -37.30486 -8.407083 551.240
## 95765 -37.30458 -8.407083 551.405
## 95766 -37.30430 -8.407083 551.947
## 95767 -37.30402 -8.407083 553.374
## 95768 -37.30375 -8.407083 555.192
## 95769 -37.30347 -8.407083 557.209
## 95770 -37.30319 -8.407083 559.391
## 95771 -37.30291 -8.407083 561.140
## 95772 -37.30263 -8.407083 562.065
## 95773 -37.30236 -8.407083 561.691
## 95774 -37.30208 -8.407083 560.743
## 95775 -37.30180 -8.407083 559.705
## 95776 -37.30152 -8.407083 559.009
## 95777 -37.30125 -8.407083 558.478
## 95778 -37.30097 -8.407083 558.073
## 95779 -37.30069 -8.407083 557.628
## 95780 -37.30041 -8.407083 557.396
## 95781 -37.30013 -8.407083 557.491
## 95782 -37.29986 -8.407083 558.184
## 95783 -37.29958 -8.407083 558.864
## 95784 -37.29930 -8.407083 559.138
## 95785 -37.29902 -8.407083 558.615
## 95786 -37.29875 -8.407083 557.694
## 95787 -37.29847 -8.407083 556.555
## 95788 -37.29819 -8.407083 555.440
## 95789 -37.29791 -8.407083 554.429
## 95790 -37.29763 -8.407083 553.651
## 95791 -37.29736 -8.407083 553.211
## 95792 -37.29708 -8.407083 553.177
## 95793 -37.29680 -8.407083 553.515
## 95794 -37.29652 -8.407083 554.434
## 95795 -37.29625 -8.407083 555.402
## 95796 -37.29597 -8.407083 556.139
## 95797 -37.29569 -8.407083 556.296
## 95798 -37.29541 -8.407083 556.055
## 95799 -37.29513 -8.407083 555.553
## 95800 -37.29486 -8.407083 554.913
## 95801 -37.29458 -8.407083 554.266
## 95802 -37.29430 -8.407083 553.782
## 95803 -37.29402 -8.407083 553.628
## 95804 -37.29375 -8.407083 553.455
## 95805 -37.29347 -8.407083 553.119
## 95806 -37.29319 -8.407083 552.136
## 95807 -37.29291 -8.407083 551.468
## 95808 -37.29263 -8.407083 551.654
## 95809 -37.29236 -8.407083 553.318
## 95810 -37.29208 -8.407083 555.422
## 95811 -37.29180 -8.407083 557.261
## 95812 -37.29152 -8.407083 558.160
## 95813 -37.29125 -8.407083 558.398
## 95814 -37.29097 -8.407083 558.034
## 95815 -37.29069 -8.407083 557.174
## 95816 -37.29041 -8.407083 556.141
## 95817 -37.29013 -8.407083 555.229
## 95818 -37.28986 -8.407083 554.872
## 95819 -37.28958 -8.407083 554.679
## 95820 -37.28930 -8.407083 554.600
## 95821 -37.28902 -8.407083 553.904
## 95822 -37.28875 -8.407083 553.404
## 95823 -37.28847 -8.407083 553.308
## 95824 -37.28819 -8.407083 554.135
## 95825 -37.28791 -8.407083 555.254
## 95826 -37.28763 -8.407083 556.324
## 95827 -37.28736 -8.407083 556.935
## 95828 -37.28708 -8.407083 557.292
## 95829 -37.28680 -8.407083 557.465
## 95830 -37.28652 -8.407083 557.500
## 95831 -37.28625 -8.407083 557.351
## 95832 -37.28597 -8.407083 556.990
## 95833 -37.28569 -8.407083 556.341
## 95834 -37.28541 -8.407083 555.640
## 95835 -37.28513 -8.407083 555.058
## 95836 -37.28486 -8.407083 554.853
## 95837 -37.28458 -8.407083 554.782
## 95838 -37.28430 -8.407083 554.710
## 95839 -37.28402 -8.407083 554.493
## 95840 -37.28375 -8.407083 554.412
## 95841 -37.28347 -8.407083 554.587
## 95842 -37.28319 -8.407083 555.341
## 95843 -37.28291 -8.407083 556.236
## 95844 -37.28263 -8.407083 557.059
## 95845 -37.28236 -8.407083 557.510
## 95846 -37.28208 -8.407083 557.990
## 95847 -37.28180 -8.407083 558.745
## 95848 -37.28152 -8.407083 559.999
## 95849 -37.28125 -8.407083 561.404
## 95850 -37.28097 -8.407083 562.779
## 95851 -37.28069 -8.407083 563.880
## 95852 -37.28041 -8.407083 564.779
## 95853 -37.28013 -8.407083 565.453
## 95854 -37.27986 -8.407083 565.803
## 95855 -37.27958 -8.407083 566.105
## 95856 -37.27930 -8.407083 566.576
## 95857 -37.27902 -8.407083 567.376
## 95858 -37.27875 -8.407083 568.197
## 95859 -37.27847 -8.407083 568.907
## 95860 -37.27819 -8.407083 569.219
## 95861 -37.27791 -8.407083 569.455
## 95862 -37.27763 -8.407083 569.760
## 95863 -37.27736 -8.407083 570.341
## 95864 -37.27708 -8.407083 570.872
## 95865 -37.27680 -8.407083 571.124
## 95866 -37.27652 -8.407083 570.948
## 95867 -37.27625 -8.407083 570.753
## 95868 -37.27597 -8.407083 570.785
## 95869 -37.27569 -8.407083 571.494
## 95870 -37.27541 -8.407083 572.343
## 95871 -37.27513 -8.407083 573.046
## 95872 -37.27486 -8.407083 573.216
## 95873 -37.27458 -8.407083 573.144
## 95874 -37.27430 -8.407083 572.910
## 95875 -37.27402 -8.407083 572.680
## 95876 -37.27375 -8.407083 572.512
## 95877 -37.27347 -8.407083 572.471
## 95878 -37.27319 -8.407083 572.737
## 95879 -37.27291 -8.407083 573.009
## 95880 -37.27263 -8.407083 573.108
## 95881 -37.27236 -8.407083 572.822
## 95882 -37.27208 -8.407083 572.520
## 95883 -37.27180 -8.407083 572.538
## 95884 -37.27152 -8.407083 573.075
## 95885 -37.27125 -8.407083 573.465
## 95886 -37.27097 -8.407083 573.295
## 95887 -37.27069 -8.407083 571.855
## 95888 -37.27041 -8.407083 569.813
## 95889 -37.27013 -8.407083 567.481
## 95890 -37.26986 -8.407083 565.171
## 95891 -37.26958 -8.407083 563.386
## 95892 -37.26930 -8.407083 562.574
## 95893 -37.26902 -8.407083 563.226
## 95894 -37.26875 -8.407083 564.723
## 95895 -37.26847 -8.407083 566.448
## 95896 -37.26819 -8.407083 567.715
## 95897 -37.26791 -8.407083 568.600
## 95898 -37.26763 -8.407083 568.984
## 95899 -37.26736 -8.407083 568.746
## 95900 -37.26708 -8.407083 568.255
## 95901 -37.26680 -8.407083 567.822
## 95902 -37.26652 -8.407083 567.703
## 95903 -37.26625 -8.407083 567.625
## 95904 -37.26597 -8.407083 567.484
## 95905 -37.26569 -8.407083 567.268
## 95906 -37.26541 -8.407083 566.693
## 95907 -37.26513 -8.407083 565.539
## 95908 -37.26486 -8.407083 563.501
## 95909 -37.26458 -8.407083 561.441
## 95910 -37.26430 -8.407083 560.002
## 95911 -37.26402 -8.407083 559.711
## 95912 -37.26375 -8.407083 559.786
## 95913 -37.26347 -8.407083 559.854
## 95914 -37.26319 -8.407083 559.147
## 95915 -37.26291 -8.407083 558.484
## 95916 -37.26263 -8.407083 558.242
## 95917 -37.26236 -8.407083 558.893
## 95918 -37.26208 -8.407083 559.931
## 95919 -37.26180 -8.407083 561.165
## 95920 -37.26152 -8.407083 562.113
## 95921 -37.26125 -8.407083 562.946
## 95922 -37.26097 -8.407083 563.622
## 95923 -37.26069 -8.407083 564.210
## 95924 -37.26041 -8.407083 564.441
## 95925 -37.26013 -8.407083 564.117
## 95926 -37.25986 -8.407083 563.020
## 95927 -37.25958 -8.407083 561.717
## 95928 -37.25930 -8.407083 560.655
## 95929 -37.25902 -8.407083 560.199
## 95930 -37.25875 -8.407083 560.004
## 95931 -37.25847 -8.407083 559.911
## 95932 -37.25819 -8.407083 559.751
## 95933 -37.25791 -8.407083 559.466
## 95934 -37.25763 -8.407083 558.952
## 95935 -37.25736 -8.407083 558.060
## 95936 -37.25708 -8.407083 557.250
## 95937 -37.25680 -8.407083 556.849
## 95938 -37.25652 -8.407083 557.122
## 95939 -37.25625 -8.407083 557.574
## 95940 -37.25597 -8.407083 557.926
## 95941 -37.25569 -8.407083 557.631
## 95942 -37.25541 -8.407083 557.454
## 95943 -37.25513 -8.407083 557.817
## 95944 -37.25486 -8.407083 559.268
## 95945 -37.25458 -8.407083 561.109
## 95946 -37.25430 -8.407083 562.878
## 95947 -37.25402 -8.407083 564.401
## 95948 -37.25375 -8.407083 565.455
## 95949 -37.25347 -8.407083 566.206
## 95950 -37.25319 -8.407083 566.734
## 95951 -37.25291 -8.407083 567.158
## 95952 -37.25263 -8.407083 567.623
## 95953 -37.25236 -8.407083 568.207
## 95954 -37.25208 -8.407083 569.037
## 95955 -37.25180 -8.407083 570.234
## 95956 -37.25152 -8.407083 571.859
## 95957 -37.25125 -8.407083 573.532
## 95958 -37.25097 -8.407083 574.983
## 95959 -37.25069 -8.407083 575.870
## 95960 -37.25041 -8.407083 576.481
## 95961 -37.25013 -8.407083 576.957
## 95962 -37.24986 -8.407083 577.457
## 95963 -37.24958 -8.407083 577.817
## 95964 -37.24930 -8.407083 577.969
## 95965 -37.24902 -8.407083 577.909
## 95966 -37.24875 -8.407083 577.823
## 95967 -37.24847 -8.407083 577.881
## 95968 -37.24819 -8.407083 578.235
## 95969 -37.24791 -8.407083 578.640
## 95970 -37.24763 -8.407083 578.870
## 95971 -37.24736 -8.407083 578.754
## 95972 -37.24708 -8.407083 578.489
## 95973 -37.24680 -8.407083 578.222
## 95974 -37.24652 -8.407083 578.059
## 95975 -37.24625 -8.407083 578.066
## 95976 -37.24597 -8.407083 578.293
## 95977 -37.24569 -8.407083 578.860
## 95978 -37.24541 -8.407083 579.614
## 95979 -37.24513 -8.407083 580.492
## 95980 -37.24486 -8.407083 581.357
## 95981 -37.24458 -8.407083 582.383
## 95982 -37.24430 -8.407083 583.682
## 95983 -37.24402 -8.407083 585.303
## 95984 -37.24375 -8.407083 586.871
## 95985 -37.24347 -8.407083 588.160
## 95986 -37.24319 -8.407083 588.827
## 95987 -37.24291 -8.407083 589.212
## 95988 -37.24263 -8.407083 589.461
## 95989 -37.24236 -8.407083 589.752
## 95990 -37.24208 -8.407083 590.068
## 95991 -37.24180 -8.407083 590.459
## 95992 -37.24152 -8.407083 590.927
## 95993 -37.24125 -8.407083 591.398
## 95994 -37.24097 -8.407083 591.801
## 95995 -37.24069 -8.407083 592.091
## 95996 -37.24041 -8.407083 592.095
## 95997 -37.24013 -8.407083 591.674
## 95998 -37.23986 -8.407083 590.701
## 95999 -37.23958 -8.407083 589.460
## 96000 -37.23930 -8.407083 588.155
## 96001 -37.23902 -8.407083 587.013
## 96002 -37.23875 -8.407083 585.955
## 96003 -37.23847 -8.407083 584.981
## 96004 -37.23819 -8.407083 583.997
## 96005 -37.23791 -8.407083 583.036
## 96006 -37.23763 -8.407083 582.075
## 96007 -37.23736 -8.407083 581.110
## 96008 -37.23708 -8.407083 580.192
## 96009 -37.23680 -8.407083 579.407
## 96010 -37.23652 -8.407083 578.845
## 96011 -37.23625 -8.407083 578.547
## 96012 -37.23597 -8.407083 578.523
## 96013 -37.23569 -8.407083 578.822
## 96014 -37.23541 -8.407083 579.088
## 96015 -37.23513 -8.407083 579.034
## 96016 -37.23486 -8.407083 578.386
## 96017 -37.23458 -8.407083 577.413
## 96018 -37.23430 -8.407083 576.242
## 96019 -37.23402 -8.407083 575.279
## 96020 -37.23375 -8.407083 574.420
## 96021 -37.23347 -8.407083 573.792
## 96022 -37.23319 -8.407083 573.407
## 96023 -37.23291 -8.407083 573.437
## 96024 -37.23263 -8.407083 573.997
## 96025 -37.23236 -8.407083 575.170
## 96026 -37.23208 -8.407083 576.345
## 96027 -37.23180 -8.407083 576.974
## 96028 -37.23152 -8.407083 576.631
## 96029 -37.23125 -8.407083 575.942
## 96030 -37.23097 -8.407083 575.253
## 96031 -37.23069 -8.407083 575.067
## 96032 -37.23041 -8.407083 575.197
## 96033 -37.23013 -8.407083 575.679
## 96034 -37.22986 -8.407083 576.621
## 96035 -37.22958 -8.407083 577.628
## 96036 -37.22930 -8.407083 578.379
## 96037 -37.22902 -8.407083 578.618
## 96038 -37.22875 -8.407083 578.584
## 96039 -37.22847 -8.407083 578.350
## 96040 -37.22819 -8.407083 578.027
## 96041 -37.22791 -8.407083 577.631
## 96042 -37.22763 -8.407083 577.248
## 96043 -37.22736 -8.407083 576.983
## 96044 -37.22708 -8.407083 576.799
## 96045 -37.22680 -8.407083 576.753
## 96046 -37.22652 -8.407083 576.688
## 96047 -37.22625 -8.407083 576.704
## 96048 -37.22597 -8.407083 576.742
## 96049 -37.22569 -8.407083 576.837
## 96050 -37.22541 -8.407083 576.822
## 96051 -37.22513 -8.407083 576.620
## 96052 -37.22486 -8.407083 576.166
## 96053 -37.22458 -8.407083 575.233
## 96054 -37.22430 -8.407083 573.524
## 96055 -37.22402 -8.407083 570.937
## 96056 -37.22375 -8.407083 568.654
## 96908 -37.36347 -8.407361 524.487
## 96909 -37.36319 -8.407361 523.343
## 96910 -37.36291 -8.407361 522.540
## 96911 -37.36263 -8.407361 522.525
## 96912 -37.36236 -8.407361 523.916
## 96913 -37.36208 -8.407361 525.829
## 96914 -37.36180 -8.407361 527.552
## 96915 -37.36152 -8.407361 528.944
## 96916 -37.36125 -8.407361 529.389
## 96917 -37.36097 -8.407361 529.584
## 96918 -37.36069 -8.407361 529.019
## 96919 -37.36041 -8.407361 528.305
## 96920 -37.36013 -8.407361 527.838
## 96921 -37.35986 -8.407361 527.921
## 96922 -37.35958 -8.407361 528.301
## 96923 -37.35930 -8.407361 528.668
## 96924 -37.35902 -8.407361 528.422
## 96925 -37.35875 -8.407361 528.283
## 96926 -37.35847 -8.407361 528.074
## 96927 -37.35819 -8.407361 528.436
## 96928 -37.35791 -8.407361 528.701
## 96929 -37.35763 -8.407361 529.151
## 96930 -37.35736 -8.407361 529.367
## 96931 -37.35708 -8.407361 529.431
## 96932 -37.35680 -8.407361 529.602
## 96933 -37.35652 -8.407361 529.788
## 96934 -37.35625 -8.407361 529.807
## 96935 -37.35597 -8.407361 529.873
## 96936 -37.35569 -8.407361 529.451
## 96937 -37.35541 -8.407361 529.269
## 96938 -37.35513 -8.407361 529.226
## 96939 -37.35486 -8.407361 529.836
## 96940 -37.35458 -8.407361 530.633
## 96941 -37.35430 -8.407361 531.311
## 96942 -37.35402 -8.407361 531.044
## 96943 -37.35375 -8.407361 530.923
## 96944 -37.35347 -8.407361 530.977
## 96945 -37.35319 -8.407361 532.203
## 96946 -37.35291 -8.407361 533.407
## 96947 -37.35263 -8.407361 534.033
## 96948 -37.35236 -8.407361 534.071
## 96949 -37.35208 -8.407361 533.453
## 96950 -37.35180 -8.407361 533.394
## 96951 -37.35152 -8.407361 533.620
## 96952 -37.35125 -8.407361 533.774
## 96953 -37.35097 -8.407361 534.312
## 96954 -37.35069 -8.407361 534.918
## 96955 -37.35041 -8.407361 535.583
## 96956 -37.35013 -8.407361 535.645
## 96957 -37.34986 -8.407361 535.953
## 96958 -37.34958 -8.407361 536.385
## 96959 -37.34930 -8.407361 537.063
## 96960 -37.34902 -8.407361 537.908
## 96961 -37.34875 -8.407361 538.581
## 96962 -37.34847 -8.407361 539.272
## 96963 -37.34819 -8.407361 539.404
## 96964 -37.34791 -8.407361 539.297
## 96965 -37.34763 -8.407361 539.028
## 96966 -37.34736 -8.407361 538.933
## 96967 -37.34708 -8.407361 538.786
## 96968 -37.34680 -8.407361 538.252
## 96969 -37.34652 -8.407361 537.419
## 96970 -37.34625 -8.407361 536.738
## 96971 -37.34597 -8.407361 536.394
## 96972 -37.34569 -8.407361 537.300
## 96973 -37.34541 -8.407361 538.122
## 96974 -37.34513 -8.407361 539.091
## 96975 -37.34486 -8.407361 539.191
## 96976 -37.34458 -8.407361 539.056
## 96977 -37.34430 -8.407361 538.449
## 96978 -37.34402 -8.407361 537.731
## 96979 -37.34375 -8.407361 537.193
## 96980 -37.34347 -8.407361 536.945
## 96981 -37.34319 -8.407361 537.619
## 96982 -37.34291 -8.407361 538.437
## 96983 -37.34263 -8.407361 539.275
## 96984 -37.34236 -8.407361 539.645
## 96985 -37.34208 -8.407361 539.796
## 96986 -37.34180 -8.407361 539.687
## 96987 -37.34152 -8.407361 539.726
## 96988 -37.34125 -8.407361 539.857
## 96989 -37.34097 -8.407361 540.123
## 96990 -37.34069 -8.407361 540.528
## 96991 -37.34041 -8.407361 540.910
## 96992 -37.34013 -8.407361 541.461
## 96993 -37.33986 -8.407361 541.785
## 96994 -37.33958 -8.407361 542.062
## 96995 -37.33930 -8.407361 542.156
## 96996 -37.33902 -8.407361 542.117
## 96997 -37.33875 -8.407361 542.171
## 96998 -37.33847 -8.407361 542.127
## 96999 -37.33819 -8.407361 541.623
## 97000 -37.33791 -8.407361 541.058
## 97001 -37.33763 -8.407361 540.748
## 97002 -37.33736 -8.407361 541.067
## 97003 -37.33708 -8.407361 541.468
## 97004 -37.33680 -8.407361 541.855
## 97005 -37.33652 -8.407361 542.078
## 97006 -37.33625 -8.407361 542.266
## 97007 -37.33597 -8.407361 542.372
## 97008 -37.33569 -8.407361 542.517
## 97009 -37.33541 -8.407361 542.774
## 97010 -37.33513 -8.407361 543.204
## 97011 -37.33486 -8.407361 543.485
## 97012 -37.33458 -8.407361 543.788
## 97013 -37.33430 -8.407361 543.876
## 97014 -37.33402 -8.407361 544.013
## 97015 -37.33375 -8.407361 544.169
## 97016 -37.33347 -8.407361 544.345
## 97017 -37.33319 -8.407361 544.748
## 97018 -37.33291 -8.407361 545.183
## 97019 -37.33263 -8.407361 545.397
## 97020 -37.33236 -8.407361 545.391
## 97021 -37.33208 -8.407361 545.082
## 97022 -37.33180 -8.407361 544.616
## 97023 -37.33152 -8.407361 544.197
## 97024 -37.33125 -8.407361 543.470
## 97025 -37.33097 -8.407361 542.410
## 97026 -37.33069 -8.407361 540.518
## 97027 -37.33041 -8.407361 539.245
## 97028 -37.33013 -8.407361 538.277
## 97029 -37.32986 -8.407361 539.436
## 97030 -37.32958 -8.407361 541.183
## 97031 -37.32930 -8.407361 543.130
## 97032 -37.32902 -8.407361 544.121
## 97033 -37.32875 -8.407361 544.711
## 97034 -37.32847 -8.407361 544.977
## 97035 -37.32819 -8.407361 545.473
## 97036 -37.32791 -8.407361 545.837
## 97037 -37.32763 -8.407361 546.306
## 97038 -37.32736 -8.407361 547.241
## 97039 -37.32708 -8.407361 548.162
## 97040 -37.32680 -8.407361 549.292
## 97041 -37.32652 -8.407361 549.952
## 97042 -37.32625 -8.407361 550.103
## 97043 -37.32597 -8.407361 550.072
## 97044 -37.32569 -8.407361 549.639
## 97045 -37.32541 -8.407361 549.177
## 97046 -37.32513 -8.407361 548.173
## 97047 -37.32486 -8.407361 547.252
## 97048 -37.32458 -8.407361 546.494
## 97049 -37.32430 -8.407361 546.205
## 97050 -37.32402 -8.407361 546.828
## 97051 -37.32375 -8.407361 547.573
## 97052 -37.32347 -8.407361 548.779
## 97053 -37.32319 -8.407361 550.102
## 97054 -37.32291 -8.407361 551.191
## 97055 -37.32263 -8.407361 552.219
## 97056 -37.32236 -8.407361 553.059
## 97057 -37.32208 -8.407361 553.775
## 97058 -37.32180 -8.407361 554.261
## 97059 -37.32152 -8.407361 554.038
## 97060 -37.32125 -8.407361 553.751
## 97061 -37.32097 -8.407361 553.439
## 97062 -37.32069 -8.407361 554.042
## 97063 -37.32041 -8.407361 554.791
## 97064 -37.32013 -8.407361 555.716
## 97065 -37.31986 -8.407361 556.815
## 97066 -37.31958 -8.407361 557.647
## 97067 -37.31930 -8.407361 557.963
## 97068 -37.31902 -8.407361 557.346
## 97069 -37.31875 -8.407361 556.148
## 97070 -37.31847 -8.407361 554.969
## 97071 -37.31819 -8.407361 554.402
## 97072 -37.31791 -8.407361 554.312
## 97073 -37.31763 -8.407361 554.520
## 97074 -37.31736 -8.407361 554.963
## 97075 -37.31708 -8.407361 555.852
## 97076 -37.31680 -8.407361 556.157
## 97077 -37.31652 -8.407361 556.609
## 97078 -37.31625 -8.407361 556.896
## 97079 -37.31597 -8.407361 556.859
## 97080 -37.31569 -8.407361 555.613
## 97081 -37.31541 -8.407361 554.786
## 97082 -37.31513 -8.407361 553.648
## 97083 -37.31486 -8.407361 553.878
## 97084 -37.31458 -8.407361 554.172
## 97085 -37.31430 -8.407361 553.858
## 97086 -37.31402 -8.407361 553.175
## 97087 -37.31375 -8.407361 552.505
## 97088 -37.31347 -8.407361 552.197
## 97089 -37.31319 -8.407361 552.226
## 97090 -37.31291 -8.407361 552.010
## 97091 -37.31263 -8.407361 551.768
## 97092 -37.31236 -8.407361 550.319
## 97093 -37.31208 -8.407361 548.767
## 97094 -37.31180 -8.407361 546.682
## 97095 -37.31152 -8.407361 545.493
## 97096 -37.31125 -8.407361 544.896
## 97097 -37.31097 -8.407361 544.841
## 97098 -37.31069 -8.407361 544.995
## 97099 -37.31041 -8.407361 545.517
## 97100 -37.31013 -8.407361 546.301
## 97101 -37.30986 -8.407361 547.041
## 97102 -37.30958 -8.407361 547.820
## 97103 -37.30930 -8.407361 548.576
## 97104 -37.30902 -8.407361 549.619
## 97105 -37.30875 -8.407361 550.808
## 97106 -37.30847 -8.407361 552.357
## 97107 -37.30819 -8.407361 554.066
## 97108 -37.30791 -8.407361 555.565
## 97109 -37.30763 -8.407361 556.135
## 97110 -37.30736 -8.407361 555.265
## 97111 -37.30708 -8.407361 553.995
## 97112 -37.30680 -8.407361 552.989
## 97113 -37.30652 -8.407361 552.587
## 97114 -37.30625 -8.407361 552.408
## 97115 -37.30597 -8.407361 552.622
## 97116 -37.30569 -8.407361 552.807
## 97117 -37.30541 -8.407361 552.995
## 97118 -37.30513 -8.407361 552.973
## 97119 -37.30486 -8.407361 552.399
## 97120 -37.30458 -8.407361 551.958
## 97121 -37.30430 -8.407361 552.332
## 97122 -37.30402 -8.407361 553.622
## 97123 -37.30375 -8.407361 555.495
## 97124 -37.30347 -8.407361 557.650
## 97125 -37.30319 -8.407361 559.893
## 97126 -37.30291 -8.407361 561.693
## 97127 -37.30263 -8.407361 562.812
## 97128 -37.30236 -8.407361 562.148
## 97129 -37.30208 -8.407361 561.040
## 97130 -37.30180 -8.407361 559.576
## 97131 -37.30152 -8.407361 559.043
## 97132 -37.30125 -8.407361 558.753
## 97133 -37.30097 -8.407361 558.654
## 97134 -37.30069 -8.407361 558.519
## 97135 -37.30041 -8.407361 558.588
## 97136 -37.30013 -8.407361 558.940
## 97137 -37.29986 -8.407361 559.501
## 97138 -37.29958 -8.407361 559.770
## 97139 -37.29930 -8.407361 559.888
## 97140 -37.29902 -8.407361 559.006
## 97141 -37.29875 -8.407361 558.137
## 97142 -37.29847 -8.407361 556.923
## 97143 -37.29819 -8.407361 555.731
## 97144 -37.29791 -8.407361 554.684
## 97145 -37.29763 -8.407361 553.770
## 97146 -37.29736 -8.407361 553.325
## 97147 -37.29708 -8.407361 553.199
## 97148 -37.29680 -8.407361 553.861
## 97149 -37.29652 -8.407361 554.953
## 97150 -37.29625 -8.407361 556.179
## 97151 -37.29597 -8.407361 557.217
## 97152 -37.29569 -8.407361 557.449
## 97153 -37.29541 -8.407361 557.030
## 97154 -37.29513 -8.407361 556.140
## 97155 -37.29486 -8.407361 555.219
## 97156 -37.29458 -8.407361 554.428
## 97157 -37.29430 -8.407361 553.921
## 97158 -37.29402 -8.407361 553.766
## 97159 -37.29375 -8.407361 553.583
## 97160 -37.29347 -8.407361 553.480
## 97161 -37.29319 -8.407361 552.500
## 97162 -37.29291 -8.407361 551.934
## 97163 -37.29263 -8.407361 551.810
## 97164 -37.29236 -8.407361 553.152
## 97165 -37.29208 -8.407361 554.813
## 97166 -37.29180 -8.407361 556.464
## 97167 -37.29152 -8.407361 557.287
## 97168 -37.29125 -8.407361 557.615
## 97169 -37.29097 -8.407361 557.473
## 97170 -37.29069 -8.407361 556.897
## 97171 -37.29041 -8.407361 556.073
## 97172 -37.29013 -8.407361 555.645
## 97173 -37.28986 -8.407361 555.619
## 97174 -37.28958 -8.407361 555.725
## 97175 -37.28930 -8.407361 555.567
## 97176 -37.28902 -8.407361 554.738
## 97177 -37.28875 -8.407361 554.089
## 97178 -37.28847 -8.407361 553.739
## 97179 -37.28819 -8.407361 554.359
## 97180 -37.28791 -8.407361 555.164
## 97181 -37.28763 -8.407361 556.298
## 97182 -37.28736 -8.407361 556.781
## 97183 -37.28708 -8.407361 557.147
## 97184 -37.28680 -8.407361 557.250
## 97185 -37.28652 -8.407361 557.291
## 97186 -37.28625 -8.407361 557.260
## 97187 -37.28597 -8.407361 556.981
## 97188 -37.28569 -8.407361 556.477
## 97189 -37.28541 -8.407361 555.873
## 97190 -37.28513 -8.407361 555.371
## 97191 -37.28486 -8.407361 555.149
## 97192 -37.28458 -8.407361 554.967
## 97193 -37.28430 -8.407361 554.842
## 97194 -37.28402 -8.407361 554.555
## 97195 -37.28375 -8.407361 554.487
## 97196 -37.28347 -8.407361 554.734
## 97197 -37.28319 -8.407361 555.503
## 97198 -37.28291 -8.407361 556.323
## 97199 -37.28263 -8.407361 556.979
## 97200 -37.28236 -8.407361 557.317
## 97201 -37.28208 -8.407361 557.732
## 97202 -37.28180 -8.407361 558.620
## 97203 -37.28152 -8.407361 559.914
## 97204 -37.28125 -8.407361 561.400
## 97205 -37.28097 -8.407361 562.964
## 97206 -37.28069 -8.407361 564.082
## 97207 -37.28041 -8.407361 564.914
## 97208 -37.28013 -8.407361 565.437
## 97209 -37.27986 -8.407361 565.630
## 97210 -37.27958 -8.407361 565.839
## 97211 -37.27930 -8.407361 566.139
## 97212 -37.27902 -8.407361 566.892
## 97213 -37.27875 -8.407361 567.669
## 97214 -37.27847 -8.407361 568.344
## 97215 -37.27819 -8.407361 568.693
## 97216 -37.27791 -8.407361 569.255
## 97217 -37.27763 -8.407361 569.744
## 97218 -37.27736 -8.407361 570.592
## 97219 -37.27708 -8.407361 571.147
## 97220 -37.27680 -8.407361 571.642
## 97221 -37.27652 -8.407361 571.527
## 97222 -37.27625 -8.407361 571.356
## 97223 -37.27597 -8.407361 571.604
## 97224 -37.27569 -8.407361 572.231
## 97225 -37.27541 -8.407361 573.067
## 97226 -37.27513 -8.407361 573.426
## 97227 -37.27486 -8.407361 573.443
## 97228 -37.27458 -8.407361 573.240
## 97229 -37.27430 -8.407361 573.035
## 97230 -37.27402 -8.407361 572.820
## 97231 -37.27375 -8.407361 572.542
## 97232 -37.27347 -8.407361 572.559
## 97233 -37.27319 -8.407361 572.978
## 97234 -37.27291 -8.407361 573.190
## 97235 -37.27263 -8.407361 573.234
## 97236 -37.27236 -8.407361 572.780
## 97237 -37.27208 -8.407361 572.366
## 97238 -37.27180 -8.407361 572.278
## 97239 -37.27152 -8.407361 572.767
## 97240 -37.27125 -8.407361 573.048
## 97241 -37.27097 -8.407361 572.929
## 97242 -37.27069 -8.407361 571.297
## 97243 -37.27041 -8.407361 569.235
## 97244 -37.27013 -8.407361 566.859
## 97245 -37.26986 -8.407361 564.682
## 97246 -37.26958 -8.407361 563.104
## 97247 -37.26930 -8.407361 562.159
## 97248 -37.26902 -8.407361 562.934
## 97249 -37.26875 -8.407361 564.404
## 97250 -37.26847 -8.407361 566.341
## 97251 -37.26819 -8.407361 567.735
## 97252 -37.26791 -8.407361 568.706
## 97253 -37.26763 -8.407361 569.162
## 97254 -37.26736 -8.407361 568.857
## 97255 -37.26708 -8.407361 568.353
## 97256 -37.26680 -8.407361 567.521
## 97257 -37.26652 -8.407361 567.425
## 97258 -37.26625 -8.407361 567.345
## 97259 -37.26597 -8.407361 567.347
## 97260 -37.26569 -8.407361 567.185
## 97261 -37.26541 -8.407361 566.539
## 97262 -37.26513 -8.407361 565.555
## 97263 -37.26486 -8.407361 563.748
## 97264 -37.26458 -8.407361 561.988
## 97265 -37.26430 -8.407361 560.478
## 97266 -37.26402 -8.407361 560.255
## 97267 -37.26375 -8.407361 560.330
## 97268 -37.26347 -8.407361 560.466
## 97269 -37.26319 -8.407361 559.728
## 97270 -37.26291 -8.407361 559.054
## 97271 -37.26263 -8.407361 558.784
## 97272 -37.26236 -8.407361 559.326
## 97273 -37.26208 -8.407361 560.328
## 97274 -37.26180 -8.407361 561.368
## 97275 -37.26152 -8.407361 562.386
## 97276 -37.26125 -8.407361 563.297
## 97277 -37.26097 -8.407361 563.943
## 97278 -37.26069 -8.407361 564.539
## 97279 -37.26041 -8.407361 564.771
## 97280 -37.26013 -8.407361 564.622
## 97281 -37.25986 -8.407361 563.610
## 97282 -37.25958 -8.407361 562.354
## 97283 -37.25930 -8.407361 561.176
## 97284 -37.25902 -8.407361 561.095
## 97285 -37.25875 -8.407361 561.151
## 97286 -37.25847 -8.407361 561.517
## 97287 -37.25819 -8.407361 561.362
## 97288 -37.25791 -8.407361 560.737
## 97289 -37.25763 -8.407361 559.984
## 97290 -37.25736 -8.407361 558.832
## 97291 -37.25708 -8.407361 557.891
## 97292 -37.25680 -8.407361 556.773
## 97293 -37.25652 -8.407361 556.720
## 97294 -37.25625 -8.407361 556.992
## 97295 -37.25597 -8.407361 557.666
## 97296 -37.25569 -8.407361 557.311
## 97297 -37.25541 -8.407361 557.295
## 97298 -37.25513 -8.407361 557.864
## 97299 -37.25486 -8.407361 559.371
## 97300 -37.25458 -8.407361 561.388
## 97301 -37.25430 -8.407361 563.096
## 97302 -37.25402 -8.407361 564.273
## 97303 -37.25375 -8.407361 565.305
## 97304 -37.25347 -8.407361 566.364
## 97305 -37.25319 -8.407361 566.892
## 97306 -37.25291 -8.407361 567.348
## 97307 -37.25263 -8.407361 567.440
## 97308 -37.25236 -8.407361 568.166
## 97309 -37.25208 -8.407361 569.241
## 97310 -37.25180 -8.407361 570.510
## 97311 -37.25152 -8.407361 572.433
## 97312 -37.25125 -8.407361 574.159
## 97313 -37.25097 -8.407361 576.149
## 97314 -37.25069 -8.407361 577.410
## 97315 -37.25041 -8.407361 577.955
## 97316 -37.25013 -8.407361 578.181
## 97317 -37.24986 -8.407361 578.690
## 97318 -37.24958 -8.407361 579.123
## 97319 -37.24930 -8.407361 579.487
## 97320 -37.24902 -8.407361 579.357
## 97321 -37.24875 -8.407361 579.188
## 97322 -37.24847 -8.407361 579.079
## 97323 -37.24819 -8.407361 579.399
## 97324 -37.24791 -8.407361 579.734
## 97325 -37.24763 -8.407361 579.849
## 97326 -37.24736 -8.407361 579.702
## 97327 -37.24708 -8.407361 579.409
## 97328 -37.24680 -8.407361 579.360
## 97329 -37.24652 -8.407361 579.199
## 97330 -37.24625 -8.407361 579.216
## 97331 -37.24597 -8.407361 579.453
## 97332 -37.24569 -8.407361 579.833
## 97333 -37.24541 -8.407361 580.645
## 97334 -37.24513 -8.407361 581.360
## 97335 -37.24486 -8.407361 582.081
## 97336 -37.24458 -8.407361 582.935
## 97337 -37.24430 -8.407361 583.962
## 97338 -37.24402 -8.407361 585.385
## 97339 -37.24375 -8.407361 586.798
## 97340 -37.24347 -8.407361 588.215
## 97341 -37.24319 -8.407361 588.884
## 97342 -37.24291 -8.407361 589.357
## 97343 -37.24263 -8.407361 589.677
## 97344 -37.24236 -8.407361 590.045
## 97345 -37.24208 -8.407361 590.432
## 97346 -37.24180 -8.407361 590.787
## 97347 -37.24152 -8.407361 591.358
## 97348 -37.24125 -8.407361 591.914
## 97349 -37.24097 -8.407361 592.294
## 97350 -37.24069 -8.407361 592.733
## 97351 -37.24041 -8.407361 592.682
## 97352 -37.24013 -8.407361 592.265
## 97353 -37.23986 -8.407361 591.611
## 97354 -37.23958 -8.407361 590.626
## 97355 -37.23930 -8.407361 589.725
## 97356 -37.23902 -8.407361 588.689
## 97357 -37.23875 -8.407361 587.611
## 97358 -37.23847 -8.407361 586.620
## 97359 -37.23819 -8.407361 585.638
## 97360 -37.23791 -8.407361 584.748
## 97361 -37.23763 -8.407361 583.496
## 97362 -37.23736 -8.407361 582.511
## 97363 -37.23708 -8.407361 581.457
## 97364 -37.23680 -8.407361 580.775
## 97365 -37.23652 -8.407361 580.303
## 97366 -37.23625 -8.407361 580.006
## 97367 -37.23597 -8.407361 580.071
## 97368 -37.23569 -8.407361 580.570
## 97369 -37.23541 -8.407361 580.879
## 97370 -37.23513 -8.407361 580.930
## 97371 -37.23486 -8.407361 580.348
## 97372 -37.23458 -8.407361 579.381
## 97373 -37.23430 -8.407361 578.236
## 97374 -37.23402 -8.407361 577.023
## 97375 -37.23375 -8.407361 576.061
## 97376 -37.23347 -8.407361 575.525
## 97377 -37.23319 -8.407361 574.876
## 97378 -37.23291 -8.407361 575.193
## 97379 -37.23263 -8.407361 575.442
## 97380 -37.23236 -8.407361 576.097
## 97381 -37.23208 -8.407361 576.939
## 97382 -37.23180 -8.407361 577.035
## 97383 -37.23152 -8.407361 576.410
## 97384 -37.23125 -8.407361 575.643
## 97385 -37.23097 -8.407361 574.709
## 97386 -37.23069 -8.407361 574.752
## 97387 -37.23041 -8.407361 575.085
## 97388 -37.23013 -8.407361 576.198
## 97389 -37.22986 -8.407361 577.241
## 97390 -37.22958 -8.407361 578.419
## 97391 -37.22930 -8.407361 579.687
## 97392 -37.22902 -8.407361 580.130
## 97393 -37.22875 -8.407361 580.272
## 97394 -37.22847 -8.407361 579.720
## 97395 -37.22819 -8.407361 579.377
## 97396 -37.22791 -8.407361 578.850
## 97397 -37.22763 -8.407361 578.437
## 97398 -37.22736 -8.407361 578.192
## 97399 -37.22708 -8.407361 578.038
## 97400 -37.22680 -8.407361 577.861
## 97401 -37.22652 -8.407361 577.779
## 97402 -37.22625 -8.407361 577.756
## 97403 -37.22597 -8.407361 577.798
## 97404 -37.22569 -8.407361 577.666
## 97405 -37.22541 -8.407361 577.697
## 97406 -37.22513 -8.407361 577.367
## 97407 -37.22486 -8.407361 576.639
## 97408 -37.22458 -8.407361 575.555
## 97409 -37.22430 -8.407361 573.244
## 97410 -37.22402 -8.407361 570.476
## 97411 -37.22375 -8.407361 568.226
## 98263 -37.36347 -8.407639 523.763
## 98264 -37.36319 -8.407639 522.615
## 98265 -37.36291 -8.407639 522.015
## 98266 -37.36263 -8.407639 522.232
## 98267 -37.36236 -8.407639 524.063
## 98268 -37.36208 -8.407639 526.334
## 98269 -37.36180 -8.407639 528.597
## 98270 -37.36152 -8.407639 529.760
## 98271 -37.36125 -8.407639 530.402
## 98272 -37.36097 -8.407639 530.500
## 98273 -37.36069 -8.407639 530.209
## 98274 -37.36041 -8.407639 529.758
## 98275 -37.36013 -8.407639 529.415
## 98276 -37.35986 -8.407639 529.311
## 98277 -37.35958 -8.407639 529.539
## 98278 -37.35930 -8.407639 529.388
## 98279 -37.35902 -8.407639 529.321
## 98280 -37.35875 -8.407639 529.539
## 98281 -37.35847 -8.407639 529.698
## 98282 -37.35819 -8.407639 529.930
## 98283 -37.35791 -8.407639 530.183
## 98284 -37.35763 -8.407639 530.541
## 98285 -37.35736 -8.407639 531.028
## 98286 -37.35708 -8.407639 531.444
## 98287 -37.35680 -8.407639 531.773
## 98288 -37.35652 -8.407639 531.833
## 98289 -37.35625 -8.407639 531.713
## 98290 -37.35597 -8.407639 531.501
## 98291 -37.35569 -8.407639 531.006
## 98292 -37.35541 -8.407639 530.659
## 98293 -37.35513 -8.407639 530.343
## 98294 -37.35486 -8.407639 530.559
## 98295 -37.35458 -8.407639 530.925
## 98296 -37.35430 -8.407639 531.103
## 98297 -37.35402 -8.407639 530.938
## 98298 -37.35375 -8.407639 530.700
## 98299 -37.35347 -8.407639 530.805
## 98300 -37.35319 -8.407639 531.964
## 98301 -37.35291 -8.407639 533.256
## 98302 -37.35263 -8.407639 533.968
## 98303 -37.35236 -8.407639 533.804
## 98304 -37.35208 -8.407639 533.189
## 98305 -37.35180 -8.407639 532.920
## 98306 -37.35152 -8.407639 533.419
## 98307 -37.35125 -8.407639 533.866
## 98308 -37.35097 -8.407639 534.564
## 98309 -37.35069 -8.407639 535.286
## 98310 -37.35041 -8.407639 536.232
## 98311 -37.35013 -8.407639 536.344
## 98312 -37.34986 -8.407639 536.600
## 98313 -37.34958 -8.407639 536.986
## 98314 -37.34930 -8.407639 537.777
## 98315 -37.34902 -8.407639 538.579
## 98316 -37.34875 -8.407639 539.214
## 98317 -37.34847 -8.407639 539.822
## 98318 -37.34819 -8.407639 540.441
## 98319 -37.34791 -8.407639 540.811
## 98320 -37.34763 -8.407639 540.749
## 98321 -37.34736 -8.407639 540.258
## 98322 -37.34708 -8.407639 539.839
## 98323 -37.34680 -8.407639 538.686
## 98324 -37.34652 -8.407639 538.146
## 98325 -37.34625 -8.407639 537.985
## 98326 -37.34597 -8.407639 537.973
## 98327 -37.34569 -8.407639 538.632
## 98328 -37.34541 -8.407639 539.134
## 98329 -37.34513 -8.407639 539.946
## 98330 -37.34486 -8.407639 540.080
## 98331 -37.34458 -8.407639 539.960
## 98332 -37.34430 -8.407639 539.285
## 98333 -37.34402 -8.407639 538.697
## 98334 -37.34375 -8.407639 538.393
## 98335 -37.34347 -8.407639 538.424
## 98336 -37.34319 -8.407639 539.109
## 98337 -37.34291 -8.407639 540.003
## 98338 -37.34263 -8.407639 540.879
## 98339 -37.34236 -8.407639 541.273
## 98340 -37.34208 -8.407639 541.494
## 98341 -37.34180 -8.407639 541.346
## 98342 -37.34152 -8.407639 541.598
## 98343 -37.34125 -8.407639 541.776
## 98344 -37.34097 -8.407639 542.171
## 98345 -37.34069 -8.407639 542.576
## 98346 -37.34041 -8.407639 542.871
## 98347 -37.34013 -8.407639 543.355
## 98348 -37.33986 -8.407639 543.666
## 98349 -37.33958 -8.407639 543.824
## 98350 -37.33930 -8.407639 543.939
## 98351 -37.33902 -8.407639 543.700
## 98352 -37.33875 -8.407639 543.432
## 98353 -37.33847 -8.407639 543.186
## 98354 -37.33819 -8.407639 543.024
## 98355 -37.33791 -8.407639 542.845
## 98356 -37.33763 -8.407639 542.917
## 98357 -37.33736 -8.407639 542.988
## 98358 -37.33708 -8.407639 543.216
## 98359 -37.33680 -8.407639 543.446
## 98360 -37.33652 -8.407639 543.531
## 98361 -37.33625 -8.407639 543.554
## 98362 -37.33597 -8.407639 543.590
## 98363 -37.33569 -8.407639 543.776
## 98364 -37.33541 -8.407639 544.051
## 98365 -37.33513 -8.407639 544.478
## 98366 -37.33486 -8.407639 544.985
## 98367 -37.33458 -8.407639 545.483
## 98368 -37.33430 -8.407639 545.682
## 98369 -37.33402 -8.407639 545.584
## 98370 -37.33375 -8.407639 545.568
## 98371 -37.33347 -8.407639 545.555
## 98372 -37.33319 -8.407639 545.884
## 98373 -37.33291 -8.407639 546.167
## 98374 -37.33263 -8.407639 546.327
## 98375 -37.33236 -8.407639 546.264
## 98376 -37.33208 -8.407639 545.855
## 98377 -37.33180 -8.407639 545.574
## 98378 -37.33152 -8.407639 545.068
## 98379 -37.33125 -8.407639 544.030
## 98380 -37.33097 -8.407639 542.801
## 98381 -37.33069 -8.407639 541.433
## 98382 -37.33041 -8.407639 540.304
## 98383 -37.33013 -8.407639 539.969
## 98384 -37.32986 -8.407639 540.643
## 98385 -37.32958 -8.407639 541.790
## 98386 -37.32930 -8.407639 543.551
## 98387 -37.32902 -8.407639 544.799
## 98388 -37.32875 -8.407639 545.817
## 98389 -37.32847 -8.407639 546.321
## 98390 -37.32819 -8.407639 546.719
## 98391 -37.32791 -8.407639 547.109
## 98392 -37.32763 -8.407639 547.554
## 98393 -37.32736 -8.407639 548.581
## 98394 -37.32708 -8.407639 549.588
## 98395 -37.32680 -8.407639 550.808
## 98396 -37.32652 -8.407639 551.304
## 98397 -37.32625 -8.407639 551.248
## 98398 -37.32597 -8.407639 551.007
## 98399 -37.32569 -8.407639 550.668
## 98400 -37.32541 -8.407639 550.216
## 98401 -37.32513 -8.407639 549.251
## 98402 -37.32486 -8.407639 548.351
## 98403 -37.32458 -8.407639 547.609
## 98404 -37.32430 -8.407639 547.473
## 98405 -37.32402 -8.407639 548.228
## 98406 -37.32375 -8.407639 549.239
## 98407 -37.32347 -8.407639 550.516
## 98408 -37.32319 -8.407639 551.589
## 98409 -37.32291 -8.407639 552.595
## 98410 -37.32263 -8.407639 553.530
## 98411 -37.32236 -8.407639 554.362
## 98412 -37.32208 -8.407639 554.989
## 98413 -37.32180 -8.407639 555.432
## 98414 -37.32152 -8.407639 555.565
## 98415 -37.32125 -8.407639 555.698
## 98416 -37.32097 -8.407639 555.628
## 98417 -37.32069 -8.407639 555.716
## 98418 -37.32041 -8.407639 556.090
## 98419 -37.32013 -8.407639 556.730
## 98420 -37.31986 -8.407639 557.955
## 98421 -37.31958 -8.407639 558.890
## 98422 -37.31930 -8.407639 559.400
## 98423 -37.31902 -8.407639 558.988
## 98424 -37.31875 -8.407639 557.771
## 98425 -37.31847 -8.407639 556.737
## 98426 -37.31819 -8.407639 555.794
## 98427 -37.31791 -8.407639 555.105
## 98428 -37.31763 -8.407639 554.952
## 98429 -37.31736 -8.407639 555.755
## 98430 -37.31708 -8.407639 556.771
## 98431 -37.31680 -8.407639 557.781
## 98432 -37.31652 -8.407639 557.819
## 98433 -37.31625 -8.407639 557.551
## 98434 -37.31597 -8.407639 557.221
## 98435 -37.31569 -8.407639 556.739
## 98436 -37.31541 -8.407639 555.919
## 98437 -37.31513 -8.407639 555.596
## 98438 -37.31486 -8.407639 554.968
## 98439 -37.31458 -8.407639 554.264
## 98440 -37.31430 -8.407639 553.480
## 98441 -37.31402 -8.407639 552.932
## 98442 -37.31375 -8.407639 552.590
## 98443 -37.31347 -8.407639 552.498
## 98444 -37.31319 -8.407639 552.785
## 98445 -37.31291 -8.407639 552.814
## 98446 -37.31263 -8.407639 552.768
## 98447 -37.31236 -8.407639 551.475
## 98448 -37.31208 -8.407639 550.029
## 98449 -37.31180 -8.407639 547.938
## 98450 -37.31152 -8.407639 546.565
## 98451 -37.31125 -8.407639 545.688
## 98452 -37.31097 -8.407639 545.613
## 98453 -37.31069 -8.407639 545.800
## 98454 -37.31041 -8.407639 546.275
## 98455 -37.31013 -8.407639 547.070
## 98456 -37.30986 -8.407639 547.923
## 98457 -37.30958 -8.407639 548.932
## 98458 -37.30930 -8.407639 549.877
## 98459 -37.30902 -8.407639 550.797
## 98460 -37.30875 -8.407639 551.863
## 98461 -37.30847 -8.407639 553.323
## 98462 -37.30819 -8.407639 555.202
## 98463 -37.30791 -8.407639 556.620
## 98464 -37.30763 -8.407639 557.258
## 98465 -37.30736 -8.407639 556.567
## 98466 -37.30708 -8.407639 555.349
## 98467 -37.30680 -8.407639 554.493
## 98468 -37.30652 -8.407639 554.122
## 98469 -37.30625 -8.407639 554.156
## 98470 -37.30597 -8.407639 554.396
## 98471 -37.30569 -8.407639 554.662
## 98472 -37.30541 -8.407639 554.965
## 98473 -37.30513 -8.407639 554.899
## 98474 -37.30486 -8.407639 553.963
## 98475 -37.30458 -8.407639 553.378
## 98476 -37.30430 -8.407639 552.952
## 98477 -37.30402 -8.407639 554.367
## 98478 -37.30375 -8.407639 556.672
## 98479 -37.30347 -8.407639 559.041
## 98480 -37.30319 -8.407639 560.957
## 98481 -37.30291 -8.407639 562.193
## 98482 -37.30263 -8.407639 563.001
## 98483 -37.30236 -8.407639 562.408
## 98484 -37.30208 -8.407639 561.103
## 98485 -37.30180 -8.407639 559.614
## 98486 -37.30152 -8.407639 559.233
## 98487 -37.30125 -8.407639 559.247
## 98488 -37.30097 -8.407639 559.437
## 98489 -37.30069 -8.407639 559.809
## 98490 -37.30041 -8.407639 560.204
## 98491 -37.30013 -8.407639 560.753
## 98492 -37.29986 -8.407639 560.616
## 98493 -37.29958 -8.407639 560.261
## 98494 -37.29930 -8.407639 559.510
## 98495 -37.29902 -8.407639 559.022
## 98496 -37.29875 -8.407639 558.072
## 98497 -37.29847 -8.407639 556.911
## 98498 -37.29819 -8.407639 555.746
## 98499 -37.29791 -8.407639 554.782
## 98500 -37.29763 -8.407639 554.013
## 98501 -37.29736 -8.407639 553.465
## 98502 -37.29708 -8.407639 553.466
## 98503 -37.29680 -8.407639 553.826
## 98504 -37.29652 -8.407639 555.412
## 98505 -37.29625 -8.407639 557.202
## 98506 -37.29597 -8.407639 558.550
## 98507 -37.29569 -8.407639 558.636
## 98508 -37.29541 -8.407639 558.237
## 98509 -37.29513 -8.407639 557.058
## 98510 -37.29486 -8.407639 555.941
## 98511 -37.29458 -8.407639 555.000
## 98512 -37.29430 -8.407639 554.370
## 98513 -37.29402 -8.407639 554.222
## 98514 -37.29375 -8.407639 554.001
## 98515 -37.29347 -8.407639 553.796
## 98516 -37.29319 -8.407639 553.160
## 98517 -37.29291 -8.407639 552.848
## 98518 -37.29263 -8.407639 552.712
## 98519 -37.29236 -8.407639 553.641
## 98520 -37.29208 -8.407639 554.948
## 98521 -37.29180 -8.407639 556.086
## 98522 -37.29152 -8.407639 556.939
## 98523 -37.29125 -8.407639 557.070
## 98524 -37.29097 -8.407639 556.928
## 98525 -37.29069 -8.407639 556.650
## 98526 -37.29041 -8.407639 556.267
## 98527 -37.29013 -8.407639 556.144
## 98528 -37.28986 -8.407639 556.201
## 98529 -37.28958 -8.407639 556.420
## 98530 -37.28930 -8.407639 556.207
## 98531 -37.28902 -8.407639 555.399
## 98532 -37.28875 -8.407639 554.827
## 98533 -37.28847 -8.407639 554.418
## 98534 -37.28819 -8.407639 554.645
## 98535 -37.28791 -8.407639 555.122
## 98536 -37.28763 -8.407639 555.885
## 98537 -37.28736 -8.407639 556.349
## 98538 -37.28708 -8.407639 556.674
## 98539 -37.28680 -8.407639 556.753
## 98540 -37.28652 -8.407639 557.048
## 98541 -37.28625 -8.407639 557.294
## 98542 -37.28597 -8.407639 557.300
## 98543 -37.28569 -8.407639 556.984
## 98544 -37.28541 -8.407639 556.567
## 98545 -37.28513 -8.407639 556.212
## 98546 -37.28486 -8.407639 555.800
## 98547 -37.28458 -8.407639 555.450
## 98548 -37.28430 -8.407639 554.968
## 98549 -37.28402 -8.407639 554.866
## 98550 -37.28375 -8.407639 555.068
## 98551 -37.28347 -8.407639 555.410
## 98552 -37.28319 -8.407639 555.881
## 98553 -37.28291 -8.407639 556.371
## 98554 -37.28263 -8.407639 556.807
## 98555 -37.28236 -8.407639 557.182
## 98556 -37.28208 -8.407639 557.592
## 98557 -37.28180 -8.407639 558.472
## 98558 -37.28152 -8.407639 559.805
## 98559 -37.28125 -8.407639 561.316
## 98560 -37.28097 -8.407639 562.835
## 98561 -37.28069 -8.407639 563.784
## 98562 -37.28041 -8.407639 564.465
## 98563 -37.28013 -8.407639 564.870
## 98564 -37.27986 -8.407639 565.285
## 98565 -37.27958 -8.407639 565.759
## 98566 -37.27930 -8.407639 566.231
## 98567 -37.27902 -8.407639 566.697
## 98568 -37.27875 -8.407639 567.232
## 98569 -37.27847 -8.407639 567.951
## 98570 -37.27819 -8.407639 568.806
## 98571 -37.27791 -8.407639 569.680
## 98572 -37.27763 -8.407639 570.460
## 98573 -37.27736 -8.407639 571.309
## 98574 -37.27708 -8.407639 571.950
## 98575 -37.27680 -8.407639 572.430
## 98576 -37.27652 -8.407639 572.294
## 98577 -37.27625 -8.407639 572.100
## 98578 -37.27597 -8.407639 572.227
## 98579 -37.27569 -8.407639 572.947
## 98580 -37.27541 -8.407639 573.740
## 98581 -37.27513 -8.407639 574.050
## 98582 -37.27486 -8.407639 573.973
## 98583 -37.27458 -8.407639 573.678
## 98584 -37.27430 -8.407639 573.370
## 98585 -37.27402 -8.407639 573.118
## 98586 -37.27375 -8.407639 572.904
## 98587 -37.27347 -8.407639 572.857
## 98588 -37.27319 -8.407639 573.034
## 98589 -37.27291 -8.407639 573.137
## 98590 -37.27263 -8.407639 572.977
## 98591 -37.27236 -8.407639 572.442
## 98592 -37.27208 -8.407639 571.838
## 98593 -37.27180 -8.407639 571.656
## 98594 -37.27152 -8.407639 571.830
## 98595 -37.27125 -8.407639 571.855
## 98596 -37.27097 -8.407639 571.556
## 98597 -37.27069 -8.407639 570.138
## 98598 -37.27041 -8.407639 568.327
## 98599 -37.27013 -8.407639 566.113
## 98600 -37.26986 -8.407639 564.195
## 98601 -37.26958 -8.407639 562.764
## 98602 -37.26930 -8.407639 562.300
## 98603 -37.26902 -8.407639 562.911
## 98604 -37.26875 -8.407639 564.246
## 98605 -37.26847 -8.407639 566.127
## 98606 -37.26819 -8.407639 567.391
## 98607 -37.26791 -8.407639 568.286
## 98608 -37.26763 -8.407639 568.722
## 98609 -37.26736 -8.407639 568.813
## 98610 -37.26708 -8.407639 568.706
## 98611 -37.26680 -8.407639 568.007
## 98612 -37.26652 -8.407639 567.724
## 98613 -37.26625 -8.407639 567.591
## 98614 -37.26597 -8.407639 567.588
## 98615 -37.26569 -8.407639 567.144
## 98616 -37.26541 -8.407639 566.229
## 98617 -37.26513 -8.407639 565.191
## 98618 -37.26486 -8.407639 563.823
## 98619 -37.26458 -8.407639 562.411
## 98620 -37.26430 -8.407639 561.398
## 98621 -37.26402 -8.407639 560.791
## 98622 -37.26375 -8.407639 560.910
## 98623 -37.26347 -8.407639 560.961
## 98624 -37.26319 -8.407639 560.285
## 98625 -37.26291 -8.407639 559.690
## 98626 -37.26263 -8.407639 559.380
## 98627 -37.26236 -8.407639 559.935
## 98628 -37.26208 -8.407639 560.896
## 98629 -37.26180 -8.407639 562.003
## 98630 -37.26152 -8.407639 562.915
## 98631 -37.26125 -8.407639 563.700
## 98632 -37.26097 -8.407639 564.313
## 98633 -37.26069 -8.407639 564.913
## 98634 -37.26041 -8.407639 565.129
## 98635 -37.26013 -8.407639 564.999
## 98636 -37.25986 -8.407639 563.951
## 98637 -37.25958 -8.407639 562.794
## 98638 -37.25930 -8.407639 561.722
## 98639 -37.25902 -8.407639 561.876
## 98640 -37.25875 -8.407639 562.372
## 98641 -37.25847 -8.407639 562.801
## 98642 -37.25819 -8.407639 562.326
## 98643 -37.25791 -8.407639 561.698
## 98644 -37.25763 -8.407639 560.415
## 98645 -37.25736 -8.407639 559.230
## 98646 -37.25708 -8.407639 558.103
## 98647 -37.25680 -8.407639 556.995
## 98648 -37.25652 -8.407639 556.327
## 98649 -37.25625 -8.407639 556.422
## 98650 -37.25597 -8.407639 556.845
## 98651 -37.25569 -8.407639 556.922
## 98652 -37.25541 -8.407639 557.321
## 98653 -37.25513 -8.407639 558.097
## 98654 -37.25486 -8.407639 559.553
## 98655 -37.25458 -8.407639 561.383
## 98656 -37.25430 -8.407639 563.078
## 98657 -37.25402 -8.407639 564.259
## 98658 -37.25375 -8.407639 565.342
## 98659 -37.25347 -8.407639 566.413
## 98660 -37.25319 -8.407639 566.994
## 98661 -37.25291 -8.407639 567.549
## 98662 -37.25263 -8.407639 567.764
## 98663 -37.25236 -8.407639 568.682
## 98664 -37.25208 -8.407639 569.716
## 98665 -37.25180 -8.407639 571.495
## 98666 -37.25152 -8.407639 573.397
## 98667 -37.25125 -8.407639 575.282
## 98668 -37.25097 -8.407639 577.204
## 98669 -37.25069 -8.407639 578.356
## 98670 -37.25041 -8.407639 579.102
## 98671 -37.25013 -8.407639 579.305
## 98672 -37.24986 -8.407639 579.829
## 98673 -37.24958 -8.407639 580.218
## 98674 -37.24930 -8.407639 580.637
## 98675 -37.24902 -8.407639 580.450
## 98676 -37.24875 -8.407639 580.061
## 98677 -37.24847 -8.407639 579.766
## 98678 -37.24819 -8.407639 580.031
## 98679 -37.24791 -8.407639 580.154
## 98680 -37.24763 -8.407639 580.508
## 98681 -37.24736 -8.407639 580.254
## 98682 -37.24708 -8.407639 579.946
## 98683 -37.24680 -8.407639 579.889
## 98684 -37.24652 -8.407639 579.920
## 98685 -37.24625 -8.407639 580.127
## 98686 -37.24597 -8.407639 580.470
## 98687 -37.24569 -8.407639 580.970
## 98688 -37.24541 -8.407639 581.687
## 98689 -37.24513 -8.407639 582.365
## 98690 -37.24486 -8.407639 583.109
## 98691 -37.24458 -8.407639 583.888
## 98692 -37.24430 -8.407639 584.857
## 98693 -37.24402 -8.407639 585.925
## 98694 -37.24375 -8.407639 586.908
## 98695 -37.24347 -8.407639 588.072
## 98696 -37.24319 -8.407639 588.973
## 98697 -37.24291 -8.407639 589.732
## 98698 -37.24263 -8.407639 590.196
## 98699 -37.24236 -8.407639 590.618
## 98700 -37.24208 -8.407639 591.171
## 98701 -37.24180 -8.407639 591.558
## 98702 -37.24152 -8.407639 592.271
## 98703 -37.24125 -8.407639 593.022
## 98704 -37.24097 -8.407639 593.514
## 98705 -37.24069 -8.407639 593.746
## 98706 -37.24041 -8.407639 593.555
## 98707 -37.24013 -8.407639 593.178
## 98708 -37.23986 -8.407639 592.782
## 98709 -37.23958 -8.407639 591.984
## 98710 -37.23930 -8.407639 591.517
## 98711 -37.23902 -8.407639 590.373
## 98712 -37.23875 -8.407639 589.058
## 98713 -37.23847 -8.407639 587.965
## 98714 -37.23819 -8.407639 587.276
## 98715 -37.23791 -8.407639 586.763
## 98716 -37.23763 -8.407639 585.637
## 98717 -37.23736 -8.407639 584.362
## 98718 -37.23708 -8.407639 583.160
## 98719 -37.23680 -8.407639 582.327
## 98720 -37.23652 -8.407639 581.738
## 98721 -37.23625 -8.407639 581.244
## 98722 -37.23597 -8.407639 581.183
## 98723 -37.23569 -8.407639 581.706
## 98724 -37.23541 -8.407639 582.100
## 98725 -37.23513 -8.407639 582.210
## 98726 -37.23486 -8.407639 581.472
## 98727 -37.23458 -8.407639 580.365
## 98728 -37.23430 -8.407639 579.128
## 98729 -37.23402 -8.407639 577.838
## 98730 -37.23375 -8.407639 576.576
## 98731 -37.23347 -8.407639 575.859
## 98732 -37.23319 -8.407639 575.633
## 98733 -37.23291 -8.407639 575.900
## 98734 -37.23263 -8.407639 576.423
## 98735 -37.23236 -8.407639 576.671
## 98736 -37.23208 -8.407639 576.903
## 98737 -37.23180 -8.407639 576.745
## 98738 -37.23152 -8.407639 576.321
## 98739 -37.23125 -8.407639 575.789
## 98740 -37.23097 -8.407639 575.169
## 98741 -37.23069 -8.407639 575.303
## 98742 -37.23041 -8.407639 575.773
## 98743 -37.23013 -8.407639 576.910
## 98744 -37.22986 -8.407639 578.019
## 98745 -37.22958 -8.407639 579.120
## 98746 -37.22930 -8.407639 580.198
## 98747 -37.22902 -8.407639 581.359
## 98748 -37.22875 -8.407639 581.787
## 98749 -37.22847 -8.407639 581.530
## 98750 -37.22819 -8.407639 580.843
## 98751 -37.22791 -8.407639 580.071
## 98752 -37.22763 -8.407639 579.492
## 98753 -37.22736 -8.407639 579.379
## 98754 -37.22708 -8.407639 579.359
## 98755 -37.22680 -8.407639 579.252
## 98756 -37.22652 -8.407639 578.933
## 98757 -37.22625 -8.407639 578.664
## 98758 -37.22597 -8.407639 578.467
## 98759 -37.22569 -8.407639 578.405
## 98760 -37.22541 -8.407639 578.213
## 98761 -37.22513 -8.407639 577.809
## 98762 -37.22486 -8.407639 576.837
## 98763 -37.22458 -8.407639 575.409
## 98764 -37.22430 -8.407639 572.886
## 98765 -37.22402 -8.407639 570.281
## 98766 -37.22375 -8.407639 568.359
## 99617 -37.36375 -8.407917 523.190
## 99618 -37.36347 -8.407917 522.995
## 99619 -37.36319 -8.407917 522.236
## 99620 -37.36291 -8.407917 521.894
## 99621 -37.36263 -8.407917 522.368
## 99622 -37.36236 -8.407917 524.535
## 99623 -37.36208 -8.407917 527.144
## 99624 -37.36180 -8.407917 529.527
## 99625 -37.36152 -8.407917 530.776
## 99626 -37.36125 -8.407917 531.410
## 99627 -37.36097 -8.407917 531.520
## 99628 -37.36069 -8.407917 531.421
## 99629 -37.36041 -8.407917 531.133
## 99630 -37.36013 -8.407917 530.934
## 99631 -37.35986 -8.407917 530.627
## 99632 -37.35958 -8.407917 530.571
## 99633 -37.35930 -8.407917 530.512
## 99634 -37.35902 -8.407917 530.933
## 99635 -37.35875 -8.407917 531.285
## 99636 -37.35847 -8.407917 531.622
## 99637 -37.35819 -8.407917 531.861
## 99638 -37.35791 -8.407917 532.075
## 99639 -37.35763 -8.407917 532.432
## 99640 -37.35736 -8.407917 532.808
## 99641 -37.35708 -8.407917 533.245
## 99642 -37.35680 -8.407917 533.471
## 99643 -37.35652 -8.407917 533.490
## 99644 -37.35625 -8.407917 533.264
## 99645 -37.35597 -8.407917 532.915
## 99646 -37.35569 -8.407917 532.396
## 99647 -37.35541 -8.407917 531.918
## 99648 -37.35513 -8.407917 531.648
## 99649 -37.35486 -8.407917 531.507
## 99650 -37.35458 -8.407917 531.507
## 99651 -37.35430 -8.407917 531.360
## 99652 -37.35402 -8.407917 531.047
## 99653 -37.35375 -8.407917 530.837
## 99654 -37.35347 -8.407917 531.023
## 99655 -37.35319 -8.407917 532.119
## 99656 -37.35291 -8.407917 533.346
## 99657 -37.35263 -8.407917 534.084
## 99658 -37.35236 -8.407917 533.883
## 99659 -37.35208 -8.407917 533.248
## 99660 -37.35180 -8.407917 532.820
## 99661 -37.35152 -8.407917 532.820
## 99662 -37.35125 -8.407917 533.430
## 99663 -37.35097 -8.407917 534.276
## 99664 -37.35069 -8.407917 535.386
## 99665 -37.35041 -8.407917 536.437
## 99666 -37.35013 -8.407917 537.316
## 99667 -37.34986 -8.407917 537.901
## 99668 -37.34958 -8.407917 538.341
## 99669 -37.34930 -8.407917 538.581
## 99670 -37.34902 -8.407917 539.423
## 99671 -37.34875 -8.407917 540.085
## 99672 -37.34847 -8.407917 540.737
## 99673 -37.34819 -8.407917 541.390
## 99674 -37.34791 -8.407917 541.826
## 99675 -37.34763 -8.407917 542.060
## 99676 -37.34736 -8.407917 541.434
## 99677 -37.34708 -8.407917 540.757
## 99678 -37.34680 -8.407917 540.091
## 99679 -37.34652 -8.407917 539.707
## 99680 -37.34625 -8.407917 539.545
## 99681 -37.34597 -8.407917 539.644
## 99682 -37.34569 -8.407917 540.031
## 99683 -37.34541 -8.407917 540.475
## 99684 -37.34513 -8.407917 540.804
## 99685 -37.34486 -8.407917 540.700
## 99686 -37.34458 -8.407917 540.446
## 99687 -37.34430 -8.407917 540.265
## 99688 -37.34402 -8.407917 539.909
## 99689 -37.34375 -8.407917 539.902
## 99690 -37.34347 -8.407917 540.193
## 99691 -37.34319 -8.407917 541.038
## 99692 -37.34291 -8.407917 541.989
## 99693 -37.34263 -8.407917 542.823
## 99694 -37.34236 -8.407917 543.183
## 99695 -37.34208 -8.407917 543.361
## 99696 -37.34180 -8.407917 543.487
## 99697 -37.34152 -8.407917 543.718
## 99698 -37.34125 -8.407917 544.010
## 99699 -37.34097 -8.407917 544.176
## 99700 -37.34069 -8.407917 544.702
## 99701 -37.34041 -8.407917 545.038
## 99702 -37.34013 -8.407917 545.288
## 99703 -37.33986 -8.407917 545.501
## 99704 -37.33958 -8.407917 545.577
## 99705 -37.33930 -8.407917 545.615
## 99706 -37.33902 -8.407917 545.401
## 99707 -37.33875 -8.407917 545.183
## 99708 -37.33847 -8.407917 544.989
## 99709 -37.33819 -8.407917 544.784
## 99710 -37.33791 -8.407917 544.703
## 99711 -37.33763 -8.407917 544.759
## 99712 -37.33736 -8.407917 544.904
## 99713 -37.33708 -8.407917 545.121
## 99714 -37.33680 -8.407917 545.296
## 99715 -37.33652 -8.407917 545.201
## 99716 -37.33625 -8.407917 545.124
## 99717 -37.33597 -8.407917 545.083
## 99718 -37.33569 -8.407917 545.356
## 99719 -37.33541 -8.407917 545.713
## 99720 -37.33513 -8.407917 546.201
## 99721 -37.33486 -8.407917 546.694
## 99722 -37.33458 -8.407917 547.167
## 99723 -37.33430 -8.407917 547.569
## 99724 -37.33402 -8.407917 547.445
## 99725 -37.33375 -8.407917 547.361
## 99726 -37.33347 -8.407917 547.275
## 99727 -37.33319 -8.407917 547.479
## 99728 -37.33291 -8.407917 547.669
## 99729 -37.33263 -8.407917 547.690
## 99730 -37.33236 -8.407917 547.648
## 99731 -37.33208 -8.407917 547.317
## 99732 -37.33180 -8.407917 546.787
## 99733 -37.33152 -8.407917 545.987
## 99734 -37.33125 -8.407917 545.047
## 99735 -37.33097 -8.407917 544.122
## 99736 -37.33069 -8.407917 543.008
## 99737 -37.33041 -8.407917 542.249
## 99738 -37.33013 -8.407917 542.018
## 99739 -37.32986 -8.407917 542.458
## 99740 -37.32958 -8.407917 543.375
## 99741 -37.32930 -8.407917 544.379
## 99742 -37.32902 -8.407917 545.639
## 99743 -37.32875 -8.407917 546.670
## 99744 -37.32847 -8.407917 547.526
## 99745 -37.32819 -8.407917 548.006
## 99746 -37.32791 -8.407917 548.433
## 99747 -37.32763 -8.407917 548.896
## 99748 -37.32736 -8.407917 549.917
## 99749 -37.32708 -8.407917 550.874
## 99750 -37.32680 -8.407917 551.515
## 99751 -37.32652 -8.407917 551.942
## 99752 -37.32625 -8.407917 551.968
## 99753 -37.32597 -8.407917 551.923
## 99754 -37.32569 -8.407917 551.482
## 99755 -37.32541 -8.407917 551.077
## 99756 -37.32513 -8.407917 550.669
## 99757 -37.32486 -8.407917 549.995
## 99758 -37.32458 -8.407917 549.579
## 99759 -37.32430 -8.407917 549.515
## 99760 -37.32402 -8.407917 550.011
## 99761 -37.32375 -8.407917 550.885
## 99762 -37.32347 -8.407917 551.863
## 99763 -37.32319 -8.407917 552.828
## 99764 -37.32291 -8.407917 553.701
## 99765 -37.32263 -8.407917 554.519
## 99766 -37.32236 -8.407917 555.301
## 99767 -37.32208 -8.407917 555.967
## 99768 -37.32180 -8.407917 556.640
## 99769 -37.32152 -8.407917 556.957
## 99770 -37.32125 -8.407917 557.303
## 99771 -37.32097 -8.407917 557.724
## 99772 -37.32069 -8.407917 557.708
## 99773 -37.32041 -8.407917 557.951
## 99774 -37.32013 -8.407917 558.377
## 99775 -37.31986 -8.407917 559.449
## 99776 -37.31958 -8.407917 560.330
## 99777 -37.31930 -8.407917 560.584
## 99778 -37.31902 -8.407917 560.123
## 99779 -37.31875 -8.407917 559.132
## 99780 -37.31847 -8.407917 557.900
## 99781 -37.31819 -8.407917 556.891
## 99782 -37.31791 -8.407917 556.170
## 99783 -37.31763 -8.407917 556.153
## 99784 -37.31736 -8.407917 556.963
## 99785 -37.31708 -8.407917 558.136
## 99786 -37.31680 -8.407917 559.126
## 99787 -37.31652 -8.407917 559.389
## 99788 -37.31625 -8.407917 559.131
## 99789 -37.31597 -8.407917 558.435
## 99790 -37.31569 -8.407917 558.142
## 99791 -37.31541 -8.407917 557.567
## 99792 -37.31513 -8.407917 556.864
## 99793 -37.31486 -8.407917 555.813
## 99794 -37.31458 -8.407917 554.798
## 99795 -37.31430 -8.407917 553.758
## 99796 -37.31402 -8.407917 553.271
## 99797 -37.31375 -8.407917 552.879
## 99798 -37.31347 -8.407917 552.573
## 99799 -37.31319 -8.407917 553.064
## 99800 -37.31291 -8.407917 553.276
## 99801 -37.31263 -8.407917 553.065
## 99802 -37.31236 -8.407917 552.037
## 99803 -37.31208 -8.407917 550.665
## 99804 -37.31180 -8.407917 549.445
## 99805 -37.31152 -8.407917 548.035
## 99806 -37.31125 -8.407917 547.138
## 99807 -37.31097 -8.407917 546.628
## 99808 -37.31069 -8.407917 546.646
## 99809 -37.31041 -8.407917 547.062
## 99810 -37.31013 -8.407917 547.933
## 99811 -37.30986 -8.407917 548.796
## 99812 -37.30958 -8.407917 549.924
## 99813 -37.30930 -8.407917 550.972
## 99814 -37.30902 -8.407917 551.991
## 99815 -37.30875 -8.407917 553.023
## 99816 -37.30847 -8.407917 554.126
## 99817 -37.30819 -8.407917 555.934
## 99818 -37.30791 -8.407917 557.396
## 99819 -37.30763 -8.407917 558.181
## 99820 -37.30736 -8.407917 557.746
## 99821 -37.30708 -8.407917 556.858
## 99822 -37.30680 -8.407917 555.988
## 99823 -37.30652 -8.407917 555.827
## 99824 -37.30625 -8.407917 555.898
## 99825 -37.30597 -8.407917 556.342
## 99826 -37.30569 -8.407917 556.594
## 99827 -37.30541 -8.407917 556.863
## 99828 -37.30513 -8.407917 556.728
## 99829 -37.30486 -8.407917 555.778
## 99830 -37.30458 -8.407917 554.941
## 99831 -37.30430 -8.407917 554.705
## 99832 -37.30402 -8.407917 556.021
## 99833 -37.30375 -8.407917 558.073
## 99834 -37.30347 -8.407917 560.185
## 99835 -37.30319 -8.407917 562.118
## 99836 -37.30291 -8.407917 563.282
## 99837 -37.30263 -8.407917 563.401
## 99838 -37.30236 -8.407917 562.584
## 99839 -37.30208 -8.407917 561.211
## 99840 -37.30180 -8.407917 560.212
## 99841 -37.30152 -8.407917 559.962
## 99842 -37.30125 -8.407917 560.270
## 99843 -37.30097 -8.407917 560.741
## 99844 -37.30069 -8.407917 561.375
## 99845 -37.30041 -8.407917 561.735
## 99846 -37.30013 -8.407917 561.703
## 99847 -37.29986 -8.407917 560.986
## 99848 -37.29958 -8.407917 559.979
## 99849 -37.29930 -8.407917 558.903
## 99850 -37.29902 -8.407917 558.103
## 99851 -37.29875 -8.407917 557.314
## 99852 -37.29847 -8.407917 556.609
## 99853 -37.29819 -8.407917 555.660
## 99854 -37.29791 -8.407917 554.854
## 99855 -37.29763 -8.407917 554.174
## 99856 -37.29736 -8.407917 553.632
## 99857 -37.29708 -8.407917 553.582
## 99858 -37.29680 -8.407917 554.182
## 99859 -37.29652 -8.407917 556.005
## 99860 -37.29625 -8.407917 558.011
## 99861 -37.29597 -8.407917 559.677
## 99862 -37.29569 -8.407917 559.695
## 99863 -37.29541 -8.407917 559.086
## 99864 -37.29513 -8.407917 558.059
## 99865 -37.29486 -8.407917 556.944
## 99866 -37.29458 -8.407917 555.917
## 99867 -37.29430 -8.407917 555.066
## 99868 -37.29402 -8.407917 554.811
## 99869 -37.29375 -8.407917 554.625
## 99870 -37.29347 -8.407917 554.531
## 99871 -37.29319 -8.407917 554.051
## 99872 -37.29291 -8.407917 553.790
## 99873 -37.29263 -8.407917 553.894
## 99874 -37.29236 -8.407917 554.596
## 99875 -37.29208 -8.407917 555.506
## 99876 -37.29180 -8.407917 556.196
## 99877 -37.29152 -8.407917 556.822
## 99878 -37.29125 -8.407917 557.023
## 99879 -37.29097 -8.407917 556.876
## 99880 -37.29069 -8.407917 556.751
## 99881 -37.29041 -8.407917 556.477
## 99882 -37.29013 -8.407917 556.308
## 99883 -37.28986 -8.407917 556.452
## 99884 -37.28958 -8.407917 556.605
## 99885 -37.28930 -8.407917 556.547
## 99886 -37.28902 -8.407917 556.078
## 99887 -37.28875 -8.407917 555.441
## 99888 -37.28847 -8.407917 554.849
## 99889 -37.28819 -8.407917 554.882
## 99890 -37.28791 -8.407917 555.067
## 99891 -37.28763 -8.407917 555.384
## 99892 -37.28736 -8.407917 555.696
## 99893 -37.28708 -8.407917 556.053
## 99894 -37.28680 -8.407917 556.631
## 99895 -37.28652 -8.407917 557.045
## 99896 -37.28625 -8.407917 557.535
## 99897 -37.28597 -8.407917 557.832
## 99898 -37.28569 -8.407917 557.838
## 99899 -37.28541 -8.407917 557.600
## 99900 -37.28513 -8.407917 557.176
## 99901 -37.28486 -8.407917 556.609
## 99902 -37.28458 -8.407917 556.052
## 99903 -37.28430 -8.407917 555.663
## 99904 -37.28402 -8.407917 555.564
## 99905 -37.28375 -8.407917 555.673
## 99906 -37.28347 -8.407917 555.936
## 99907 -37.28319 -8.407917 556.280
## 99908 -37.28291 -8.407917 556.656
## 99909 -37.28263 -8.407917 556.994
## 99910 -37.28236 -8.407917 557.209
## 99911 -37.28208 -8.407917 557.557
## 99912 -37.28180 -8.407917 558.108
## 99913 -37.28152 -8.407917 559.444
## 99914 -37.28125 -8.407917 560.812
## 99915 -37.28097 -8.407917 562.200
## 99916 -37.28069 -8.407917 563.117
## 99917 -37.28041 -8.407917 563.884
## 99918 -37.28013 -8.407917 564.496
## 99919 -37.27986 -8.407917 565.079
## 99920 -37.27958 -8.407917 565.623
## 99921 -37.27930 -8.407917 566.303
## 99922 -37.27902 -8.407917 566.784
## 99923 -37.27875 -8.407917 567.507
## 99924 -37.27847 -8.407917 568.337
## 99925 -37.27819 -8.407917 569.420
## 99926 -37.27791 -8.407917 570.511
## 99927 -37.27763 -8.407917 571.551
## 99928 -37.27736 -8.407917 572.455
## 99929 -37.27708 -8.407917 573.105
## 99930 -37.27680 -8.407917 573.244
## 99931 -37.27652 -8.407917 573.143
## 99932 -37.27625 -8.407917 572.881
## 99933 -37.27597 -8.407917 572.871
## 99934 -37.27569 -8.407917 573.532
## 99935 -37.27541 -8.407917 574.328
## 99936 -37.27513 -8.407917 574.910
## 99937 -37.27486 -8.407917 574.911
## 99938 -37.27458 -8.407917 574.609
## 99939 -37.27430 -8.407917 574.066
## 99940 -37.27402 -8.407917 573.738
## 99941 -37.27375 -8.407917 573.355
## 99942 -37.27347 -8.407917 573.018
## 99943 -37.27319 -8.407917 572.969
## 99944 -37.27291 -8.407917 572.840
## 99945 -37.27263 -8.407917 572.518
## 99946 -37.27236 -8.407917 571.800
## 99947 -37.27208 -8.407917 571.050
## 99948 -37.27180 -8.407917 570.477
## 99949 -37.27152 -8.407917 570.457
## 99950 -37.27125 -8.407917 570.327
## 99951 -37.27097 -8.407917 569.917
## 99952 -37.27069 -8.407917 568.650
## 99953 -37.27041 -8.407917 567.105
## 99954 -37.27013 -8.407917 565.472
## 99955 -37.26986 -8.407917 564.058
## 99956 -37.26958 -8.407917 563.069
## 99957 -37.26930 -8.407917 562.686
## 99958 -37.26902 -8.407917 563.227
## 99959 -37.26875 -8.407917 564.304
## 99960 -37.26847 -8.407917 565.570
## 99961 -37.26819 -8.407917 566.824
## 99962 -37.26791 -8.407917 567.838
## 99963 -37.26763 -8.407917 568.680
## 99964 -37.26736 -8.407917 568.927
## 99965 -37.26708 -8.407917 569.007
## 99966 -37.26680 -8.407917 569.015
## 99967 -37.26652 -8.407917 568.731
## 99968 -37.26625 -8.407917 568.414
## 99969 -37.26597 -8.407917 567.736
## 99970 -37.26569 -8.407917 567.195
## 99971 -37.26541 -8.407917 566.285
## 99972 -37.26513 -8.407917 565.225
## 99973 -37.26486 -8.407917 564.048
## 99974 -37.26458 -8.407917 562.966
## 99975 -37.26430 -8.407917 562.229
## 99976 -37.26402 -8.407917 561.893
## 99977 -37.26375 -8.407917 561.727
## 99978 -37.26347 -8.407917 561.490
## 99979 -37.26319 -8.407917 560.781
## 99980 -37.26291 -8.407917 560.174
## 99981 -37.26263 -8.407917 559.995
## 99982 -37.26236 -8.407917 560.617
## 99983 -37.26208 -8.407917 561.616
## 99984 -37.26180 -8.407917 562.793
## 99985 -37.26152 -8.407917 563.665
## 99986 -37.26125 -8.407917 564.396
## 99987 -37.26097 -8.407917 564.869
## 99988 -37.26069 -8.407917 565.319
## 99989 -37.26041 -8.407917 565.380
## 99990 -37.26013 -8.407917 564.914
## 99991 -37.25986 -8.407917 563.987
## 99992 -37.25958 -8.407917 562.950
## 99993 -37.25930 -8.407917 562.391
## 99994 -37.25902 -8.407917 562.609
## 99995 -37.25875 -8.407917 563.021
## 99996 -37.25847 -8.407917 563.129
## 99997 -37.25819 -8.407917 562.621
## 99998 -37.25791 -8.407917 561.644
## 99999 -37.25763 -8.407917 560.441
## 100000 -37.25736 -8.407917 559.206
## 100001 -37.25708 -8.407917 558.046
## 100002 -37.25680 -8.407917 557.156
## 100003 -37.25652 -8.407917 556.555
## 100004 -37.25625 -8.407917 556.271
## 100005 -37.25597 -8.407917 556.210
## 100006 -37.25569 -8.407917 556.372
## 100007 -37.25541 -8.407917 556.868
## 100008 -37.25513 -8.407917 557.860
## 100009 -37.25486 -8.407917 559.481
## 100010 -37.25458 -8.407917 561.334
## 100011 -37.25430 -8.407917 563.177
## 100012 -37.25402 -8.407917 564.469
## 100013 -37.25375 -8.407917 565.516
## 100014 -37.25347 -8.407917 566.353
## 100015 -37.25319 -8.407917 567.108
## 100016 -37.25291 -8.407917 567.879
## 100017 -37.25263 -8.407917 568.942
## 100018 -37.25236 -8.407917 569.994
## 100019 -37.25208 -8.407917 571.402
## 100020 -37.25180 -8.407917 572.824
## 100021 -37.25152 -8.407917 574.815
## 100022 -37.25125 -8.407917 576.518
## 100023 -37.25097 -8.407917 577.878
## 100024 -37.25069 -8.407917 578.881
## 100025 -37.25041 -8.407917 579.542
## 100026 -37.25013 -8.407917 580.091
## 100027 -37.24986 -8.407917 580.703
## 100028 -37.24958 -8.407917 581.154
## 100029 -37.24930 -8.407917 581.131
## 100030 -37.24902 -8.407917 580.956
## 100031 -37.24875 -8.407917 580.520
## 100032 -37.24847 -8.407917 580.217
## 100033 -37.24819 -8.407917 580.292
## 100034 -37.24791 -8.407917 580.485
## 100035 -37.24763 -8.407917 580.586
## 100036 -37.24736 -8.407917 580.413
## 100037 -37.24708 -8.407917 580.193
## 100038 -37.24680 -8.407917 580.151
## 100039 -37.24652 -8.407917 580.217
## 100040 -37.24625 -8.407917 580.568
## 100041 -37.24597 -8.407917 581.257
## 100042 -37.24569 -8.407917 581.896
## 100043 -37.24541 -8.407917 582.778
## 100044 -37.24513 -8.407917 583.686
## 100045 -37.24486 -8.407917 584.523
## 100046 -37.24458 -8.407917 585.324
## 100047 -37.24430 -8.407917 586.015
## 100048 -37.24402 -8.407917 586.824
## 100049 -37.24375 -8.407917 587.564
## 100050 -37.24347 -8.407917 588.265
## 100051 -37.24319 -8.407917 589.226
## 100052 -37.24291 -8.407917 590.096
## 100053 -37.24263 -8.407917 590.884
## 100054 -37.24236 -8.407917 591.525
## 100055 -37.24208 -8.407917 592.172
## 100056 -37.24180 -8.407917 592.870
## 100057 -37.24152 -8.407917 593.853
## 100058 -37.24125 -8.407917 594.710
## 100059 -37.24097 -8.407917 595.219
## 100060 -37.24069 -8.407917 595.452
## 100061 -37.24041 -8.407917 595.281
## 100062 -37.24013 -8.407917 594.933
## 100063 -37.23986 -8.407917 594.556
## 100064 -37.23958 -8.407917 593.977
## 100065 -37.23930 -8.407917 593.053
## 100066 -37.23902 -8.407917 591.884
## 100067 -37.23875 -8.407917 590.631
## 100068 -37.23847 -8.407917 589.717
## 100069 -37.23819 -8.407917 588.990
## 100070 -37.23791 -8.407917 588.476
## 100071 -37.23763 -8.407917 587.737
## 100072 -37.23736 -8.407917 586.505
## 100073 -37.23708 -8.407917 585.147
## 100074 -37.23680 -8.407917 583.741
## 100075 -37.23652 -8.407917 582.911
## 100076 -37.23625 -8.407917 582.258
## 100077 -37.23597 -8.407917 581.852
## 100078 -37.23569 -8.407917 582.152
## 100079 -37.23541 -8.407917 582.347
## 100080 -37.23513 -8.407917 582.227
## 100081 -37.23486 -8.407917 581.430
## 100082 -37.23458 -8.407917 580.249
## 100083 -37.23430 -8.407917 578.863
## 100084 -37.23402 -8.407917 577.370
## 100085 -37.23375 -8.407917 576.112
## 100086 -37.23347 -8.407917 575.456
## 100087 -37.23319 -8.407917 575.279
## 100088 -37.23291 -8.407917 575.661
## 100089 -37.23263 -8.407917 576.440
## 100090 -37.23236 -8.407917 576.530
## 100091 -37.23208 -8.407917 576.758
## 100092 -37.23180 -8.407917 576.919
## 100093 -37.23152 -8.407917 576.651
## 100094 -37.23125 -8.407917 576.484
## 100095 -37.23097 -8.407917 576.357
## 100096 -37.23069 -8.407917 576.751
## 100097 -37.23041 -8.407917 577.266
## 100098 -37.23013 -8.407917 577.936
## 100099 -37.22986 -8.407917 578.703
## 100100 -37.22958 -8.407917 579.561
## 100101 -37.22930 -8.407917 580.567
## 100102 -37.22902 -8.407917 581.594
## 100103 -37.22875 -8.407917 582.432
## 100104 -37.22847 -8.407917 582.947
## 100105 -37.22819 -8.407917 582.373
## 100106 -37.22791 -8.407917 581.630
## 100107 -37.22763 -8.407917 580.911
## 100108 -37.22736 -8.407917 580.608
## 100109 -37.22708 -8.407917 580.423
## 100110 -37.22680 -8.407917 580.176
## 100111 -37.22652 -8.407917 579.875
## 100112 -37.22625 -8.407917 579.437
## 100113 -37.22597 -8.407917 578.916
## 100114 -37.22569 -8.407917 578.700
## 100115 -37.22541 -8.407917 578.274
## 100116 -37.22513 -8.407917 577.697
## 100117 -37.22486 -8.407917 576.552
## 100118 -37.22458 -8.407917 575.103
## 100119 -37.22430 -8.407917 573.208
## 100120 -37.22402 -8.407917 570.759
## 100121 -37.22375 -8.407917 568.780
## 100972 -37.36375 -8.408194 522.067
## 100973 -37.36347 -8.408194 522.292
## 100974 -37.36319 -8.408194 522.040
## 100975 -37.36291 -8.408194 521.994
## 100976 -37.36263 -8.408194 522.706
## 100977 -37.36236 -8.408194 525.084
## 100978 -37.36208 -8.408194 527.838
## 100979 -37.36180 -8.408194 530.335
## 100980 -37.36152 -8.408194 531.548
## 100981 -37.36125 -8.408194 532.252
## 100982 -37.36097 -8.408194 532.449
## 100983 -37.36069 -8.408194 532.555
## 100984 -37.36041 -8.408194 532.479
## 100985 -37.36013 -8.408194 532.144
## 100986 -37.35986 -8.408194 532.021
## 100987 -37.35958 -8.408194 531.966
## 100988 -37.35930 -8.408194 532.134
## 100989 -37.35902 -8.408194 532.731
## 100990 -37.35875 -8.408194 533.207
## 100991 -37.35847 -8.408194 533.644
## 100992 -37.35819 -8.408194 533.919
## 100993 -37.35791 -8.408194 534.099
## 100994 -37.35763 -8.408194 534.249
## 100995 -37.35736 -8.408194 534.528
## 100996 -37.35708 -8.408194 534.915
## 100997 -37.35680 -8.408194 535.150
## 100998 -37.35652 -8.408194 535.001
## 100999 -37.35625 -8.408194 534.739
## 101000 -37.35597 -8.408194 534.316
## 101001 -37.35569 -8.408194 533.850
## 101002 -37.35541 -8.408194 533.354
## 101003 -37.35513 -8.408194 532.938
## 101004 -37.35486 -8.408194 532.800
## 101005 -37.35458 -8.408194 532.572
## 101006 -37.35430 -8.408194 532.129
## 101007 -37.35402 -8.408194 531.686
## 101008 -37.35375 -8.408194 531.427
## 101009 -37.35347 -8.408194 531.550
## 101010 -37.35319 -8.408194 532.661
## 101011 -37.35291 -8.408194 533.766
## 101012 -37.35263 -8.408194 534.712
## 101013 -37.35236 -8.408194 534.274
## 101014 -37.35208 -8.408194 533.562
## 101015 -37.35180 -8.408194 532.727
## 101016 -37.35152 -8.408194 532.524
## 101017 -37.35125 -8.408194 533.222
## 101018 -37.35097 -8.408194 534.336
## 101019 -37.35069 -8.408194 535.601
## 101020 -37.35041 -8.408194 536.836
## 101021 -37.35013 -8.408194 538.343
## 101022 -37.34986 -8.408194 539.368
## 101023 -37.34958 -8.408194 539.891
## 101024 -37.34930 -8.408194 540.062
## 101025 -37.34902 -8.408194 540.480
## 101026 -37.34875 -8.408194 541.175
## 101027 -37.34847 -8.408194 541.726
## 101028 -37.34819 -8.408194 542.410
## 101029 -37.34791 -8.408194 542.827
## 101030 -37.34763 -8.408194 542.982
## 101031 -37.34736 -8.408194 542.615
## 101032 -37.34708 -8.408194 542.011
## 101033 -37.34680 -8.408194 541.661
## 101034 -37.34652 -8.408194 541.456
## 101035 -37.34625 -8.408194 541.347
## 101036 -37.34597 -8.408194 541.308
## 101037 -37.34569 -8.408194 541.595
## 101038 -37.34541 -8.408194 541.950
## 101039 -37.34513 -8.408194 541.835
## 101040 -37.34486 -8.408194 541.465
## 101041 -37.34458 -8.408194 541.303
## 101042 -37.34430 -8.408194 541.103
## 101043 -37.34402 -8.408194 541.288
## 101044 -37.34375 -8.408194 541.510
## 101045 -37.34347 -8.408194 542.128
## 101046 -37.34319 -8.408194 543.066
## 101047 -37.34291 -8.408194 544.056
## 101048 -37.34263 -8.408194 544.737
## 101049 -37.34236 -8.408194 545.087
## 101050 -37.34208 -8.408194 545.240
## 101051 -37.34180 -8.408194 545.559
## 101052 -37.34152 -8.408194 545.829
## 101053 -37.34125 -8.408194 546.160
## 101054 -37.34097 -8.408194 546.488
## 101055 -37.34069 -8.408194 546.789
## 101056 -37.34041 -8.408194 547.186
## 101057 -37.34013 -8.408194 547.393
## 101058 -37.33986 -8.408194 547.433
## 101059 -37.33958 -8.408194 547.475
## 101060 -37.33930 -8.408194 547.405
## 101061 -37.33902 -8.408194 547.411
## 101062 -37.33875 -8.408194 547.248
## 101063 -37.33847 -8.408194 547.009
## 101064 -37.33819 -8.408194 546.817
## 101065 -37.33791 -8.408194 546.648
## 101066 -37.33763 -8.408194 546.679
## 101067 -37.33736 -8.408194 546.877
## 101068 -37.33708 -8.408194 547.076
## 101069 -37.33680 -8.408194 547.122
## 101070 -37.33652 -8.408194 546.985
## 101071 -37.33625 -8.408194 546.854
## 101072 -37.33597 -8.408194 546.798
## 101073 -37.33569 -8.408194 547.171
## 101074 -37.33541 -8.408194 547.614
## 101075 -37.33513 -8.408194 547.982
## 101076 -37.33486 -8.408194 548.501
## 101077 -37.33458 -8.408194 548.869
## 101078 -37.33430 -8.408194 549.230
## 101079 -37.33402 -8.408194 549.235
## 101080 -37.33375 -8.408194 549.136
## 101081 -37.33347 -8.408194 549.016
## 101082 -37.33319 -8.408194 549.138
## 101083 -37.33291 -8.408194 549.224
## 101084 -37.33263 -8.408194 549.351
## 101085 -37.33236 -8.408194 549.155
## 101086 -37.33208 -8.408194 548.794
## 101087 -37.33180 -8.408194 548.156
## 101088 -37.33152 -8.408194 547.138
## 101089 -37.33125 -8.408194 546.312
## 101090 -37.33097 -8.408194 545.582
## 101091 -37.33069 -8.408194 544.926
## 101092 -37.33041 -8.408194 544.306
## 101093 -37.33013 -8.408194 544.131
## 101094 -37.32986 -8.408194 544.545
## 101095 -37.32958 -8.408194 545.167
## 101096 -37.32930 -8.408194 545.739
## 101097 -37.32902 -8.408194 546.518
## 101098 -37.32875 -8.408194 547.505
## 101099 -37.32847 -8.408194 548.621
## 101100 -37.32819 -8.408194 549.201
## 101101 -37.32791 -8.408194 549.711
## 101102 -37.32763 -8.408194 550.314
## 101103 -37.32736 -8.408194 551.199
## 101104 -37.32708 -8.408194 552.040
## 101105 -37.32680 -8.408194 552.387
## 101106 -37.32652 -8.408194 552.641
## 101107 -37.32625 -8.408194 552.740
## 101108 -37.32597 -8.408194 552.570
## 101109 -37.32569 -8.408194 552.456
## 101110 -37.32541 -8.408194 552.123
## 101111 -37.32513 -8.408194 552.095
## 101112 -37.32486 -8.408194 551.889
## 101113 -37.32458 -8.408194 551.679
## 101114 -37.32430 -8.408194 551.740
## 101115 -37.32402 -8.408194 551.989
## 101116 -37.32375 -8.408194 552.661
## 101117 -37.32347 -8.408194 553.364
## 101118 -37.32319 -8.408194 553.998
## 101119 -37.32291 -8.408194 554.758
## 101120 -37.32263 -8.408194 555.471
## 101121 -37.32236 -8.408194 556.227
## 101122 -37.32208 -8.408194 556.947
## 101123 -37.32180 -8.408194 557.551
## 101124 -37.32152 -8.408194 558.249
## 101125 -37.32125 -8.408194 558.700
## 101126 -37.32097 -8.408194 559.281
## 101127 -37.32069 -8.408194 559.552
## 101128 -37.32041 -8.408194 559.767
## 101129 -37.32013 -8.408194 559.979
## 101130 -37.31986 -8.408194 560.838
## 101131 -37.31958 -8.408194 561.532
## 101132 -37.31930 -8.408194 561.860
## 101133 -37.31902 -8.408194 561.190
## 101134 -37.31875 -8.408194 560.283
## 101135 -37.31847 -8.408194 559.132
## 101136 -37.31819 -8.408194 558.068
## 101137 -37.31791 -8.408194 557.493
## 101138 -37.31763 -8.408194 557.400
## 101139 -37.31736 -8.408194 558.467
## 101140 -37.31708 -8.408194 559.592
## 101141 -37.31680 -8.408194 560.733
## 101142 -37.31652 -8.408194 561.097
## 101143 -37.31625 -8.408194 560.852
## 101144 -37.31597 -8.408194 560.221
## 101145 -37.31569 -8.408194 559.686
## 101146 -37.31541 -8.408194 558.997
## 101147 -37.31513 -8.408194 558.053
## 101148 -37.31486 -8.408194 556.698
## 101149 -37.31458 -8.408194 555.527
## 101150 -37.31430 -8.408194 554.763
## 101151 -37.31402 -8.408194 554.095
## 101152 -37.31375 -8.408194 553.797
## 101153 -37.31347 -8.408194 553.574
## 101154 -37.31319 -8.408194 553.859
## 101155 -37.31291 -8.408194 553.836
## 101156 -37.31263 -8.408194 553.824
## 101157 -37.31236 -8.408194 552.844
## 101158 -37.31208 -8.408194 551.598
## 101159 -37.31180 -8.408194 550.621
## 101160 -37.31152 -8.408194 549.800
## 101161 -37.31125 -8.408194 548.816
## 101162 -37.31097 -8.408194 547.812
## 101163 -37.31069 -8.408194 547.568
## 101164 -37.31041 -8.408194 547.752
## 101165 -37.31013 -8.408194 548.445
## 101166 -37.30986 -8.408194 549.354
## 101167 -37.30958 -8.408194 550.463
## 101168 -37.30930 -8.408194 551.808
## 101169 -37.30902 -8.408194 552.859
## 101170 -37.30875 -8.408194 553.927
## 101171 -37.30847 -8.408194 554.858
## 101172 -37.30819 -8.408194 556.395
## 101173 -37.30791 -8.408194 557.898
## 101174 -37.30763 -8.408194 559.040
## 101175 -37.30736 -8.408194 558.827
## 101176 -37.30708 -8.408194 558.305
## 101177 -37.30680 -8.408194 557.635
## 101178 -37.30652 -8.408194 557.638
## 101179 -37.30625 -8.408194 557.721
## 101180 -37.30597 -8.408194 558.081
## 101181 -37.30569 -8.408194 558.599
## 101182 -37.30541 -8.408194 558.772
## 101183 -37.30513 -8.408194 558.596
## 101184 -37.30486 -8.408194 557.630
## 101185 -37.30458 -8.408194 556.718
## 101186 -37.30430 -8.408194 556.453
## 101187 -37.30402 -8.408194 557.644
## 101188 -37.30375 -8.408194 559.320
## 101189 -37.30347 -8.408194 561.383
## 101190 -37.30319 -8.408194 562.942
## 101191 -37.30291 -8.408194 564.098
## 101192 -37.30263 -8.408194 564.009
## 101193 -37.30236 -8.408194 562.762
## 101194 -37.30208 -8.408194 561.445
## 101195 -37.30180 -8.408194 560.681
## 101196 -37.30152 -8.408194 560.879
## 101197 -37.30125 -8.408194 561.351
## 101198 -37.30097 -8.408194 562.398
## 101199 -37.30069 -8.408194 562.841
## 101200 -37.30041 -8.408194 563.012
## 101201 -37.30013 -8.408194 562.412
## 101202 -37.29986 -8.408194 561.070
## 101203 -37.29958 -8.408194 559.718
## 101204 -37.29930 -8.408194 558.162
## 101205 -37.29902 -8.408194 557.258
## 101206 -37.29875 -8.408194 556.493
## 101207 -37.29847 -8.408194 556.156
## 101208 -37.29819 -8.408194 555.612
## 101209 -37.29791 -8.408194 555.073
## 101210 -37.29763 -8.408194 554.402
## 101211 -37.29736 -8.408194 553.995
## 101212 -37.29708 -8.408194 554.016
## 101213 -37.29680 -8.408194 554.674
## 101214 -37.29652 -8.408194 556.669
## 101215 -37.29625 -8.408194 558.782
## 101216 -37.29597 -8.408194 560.490
## 101217 -37.29569 -8.408194 560.558
## 101218 -37.29541 -8.408194 559.864
## 101219 -37.29513 -8.408194 558.924
## 101220 -37.29486 -8.408194 557.844
## 101221 -37.29458 -8.408194 556.870
## 101222 -37.29430 -8.408194 555.856
## 101223 -37.29402 -8.408194 555.483
## 101224 -37.29375 -8.408194 555.281
## 101225 -37.29347 -8.408194 555.198
## 101226 -37.29319 -8.408194 554.927
## 101227 -37.29291 -8.408194 554.759
## 101228 -37.29263 -8.408194 555.032
## 101229 -37.29236 -8.408194 555.705
## 101230 -37.29208 -8.408194 556.454
## 101231 -37.29180 -8.408194 556.842
## 101232 -37.29152 -8.408194 557.223
## 101233 -37.29125 -8.408194 557.432
## 101234 -37.29097 -8.408194 557.471
## 101235 -37.29069 -8.408194 557.240
## 101236 -37.29041 -8.408194 556.927
## 101237 -37.29013 -8.408194 556.624
## 101238 -37.28986 -8.408194 556.733
## 101239 -37.28958 -8.408194 556.866
## 101240 -37.28930 -8.408194 556.964
## 101241 -37.28902 -8.408194 556.645
## 101242 -37.28875 -8.408194 555.995
## 101243 -37.28847 -8.408194 555.407
## 101244 -37.28819 -8.408194 555.187
## 101245 -37.28791 -8.408194 555.206
## 101246 -37.28763 -8.408194 555.086
## 101247 -37.28736 -8.408194 555.227
## 101248 -37.28708 -8.408194 555.598
## 101249 -37.28680 -8.408194 556.333
## 101250 -37.28652 -8.408194 557.183
## 101251 -37.28625 -8.408194 557.859
## 101252 -37.28597 -8.408194 558.544
## 101253 -37.28569 -8.408194 558.801
## 101254 -37.28541 -8.408194 558.758
## 101255 -37.28513 -8.408194 558.245
## 101256 -37.28486 -8.408194 557.593
## 101257 -37.28458 -8.408194 556.959
## 101258 -37.28430 -8.408194 556.544
## 101259 -37.28402 -8.408194 556.394
## 101260 -37.28375 -8.408194 556.376
## 101261 -37.28347 -8.408194 556.502
## 101262 -37.28319 -8.408194 556.690
## 101263 -37.28291 -8.408194 556.959
## 101264 -37.28263 -8.408194 557.223
## 101265 -37.28236 -8.408194 557.271
## 101266 -37.28208 -8.408194 557.475
## 101267 -37.28180 -8.408194 558.026
## 101268 -37.28152 -8.408194 559.074
## 101269 -37.28125 -8.408194 560.375
## 101270 -37.28097 -8.408194 561.374
## 101271 -37.28069 -8.408194 562.453
## 101272 -37.28041 -8.408194 563.323
## 101273 -37.28013 -8.408194 564.132
## 101274 -37.27986 -8.408194 564.941
## 101275 -37.27958 -8.408194 565.503
## 101276 -37.27930 -8.408194 566.142
## 101277 -37.27902 -8.408194 566.920
## 101278 -37.27875 -8.408194 567.812
## 101279 -37.27847 -8.408194 568.886
## 101280 -37.27819 -8.408194 570.147
## 101281 -37.27791 -8.408194 571.409
## 101282 -37.27763 -8.408194 572.689
## 101283 -37.27736 -8.408194 573.621
## 101284 -37.27708 -8.408194 574.287
## 101285 -37.27680 -8.408194 574.407
## 101286 -37.27652 -8.408194 574.051
## 101287 -37.27625 -8.408194 573.768
## 101288 -37.27597 -8.408194 573.528
## 101289 -37.27569 -8.408194 574.191
## 101290 -37.27541 -8.408194 574.975
## 101291 -37.27513 -8.408194 575.821
## 101292 -37.27486 -8.408194 575.937
## 101293 -37.27458 -8.408194 575.719
## 101294 -37.27430 -8.408194 575.003
## 101295 -37.27402 -8.408194 574.421
## 101296 -37.27375 -8.408194 573.697
## 101297 -37.27347 -8.408194 573.247
## 101298 -37.27319 -8.408194 572.811
## 101299 -37.27291 -8.408194 572.454
## 101300 -37.27263 -8.408194 572.012
## 101301 -37.27236 -8.408194 571.099
## 101302 -37.27208 -8.408194 570.209
## 101303 -37.27180 -8.408194 569.376
## 101304 -37.27152 -8.408194 569.116
## 101305 -37.27125 -8.408194 568.928
## 101306 -37.27097 -8.408194 568.433
## 101307 -37.27069 -8.408194 567.405
## 101308 -37.27041 -8.408194 566.163
## 101309 -37.27013 -8.408194 565.128
## 101310 -37.26986 -8.408194 564.229
## 101311 -37.26958 -8.408194 563.465
## 101312 -37.26930 -8.408194 563.295
## 101313 -37.26902 -8.408194 563.692
## 101314 -37.26875 -8.408194 564.494
## 101315 -37.26847 -8.408194 565.137
## 101316 -37.26819 -8.408194 566.226
## 101317 -37.26791 -8.408194 567.376
## 101318 -37.26763 -8.408194 568.404
## 101319 -37.26736 -8.408194 569.084
## 101320 -37.26708 -8.408194 569.339
## 101321 -37.26680 -8.408194 569.698
## 101322 -37.26652 -8.408194 569.745
## 101323 -37.26625 -8.408194 569.313
## 101324 -37.26597 -8.408194 568.265
## 101325 -37.26569 -8.408194 567.283
## 101326 -37.26541 -8.408194 566.402
## 101327 -37.26513 -8.408194 565.468
## 101328 -37.26486 -8.408194 564.368
## 101329 -37.26458 -8.408194 563.435
## 101330 -37.26430 -8.408194 563.048
## 101331 -37.26402 -8.408194 562.735
## 101332 -37.26375 -8.408194 562.506
## 101333 -37.26347 -8.408194 562.062
## 101334 -37.26319 -8.408194 561.219
## 101335 -37.26291 -8.408194 560.630
## 101336 -37.26263 -8.408194 560.603
## 101337 -37.26236 -8.408194 561.342
## 101338 -37.26208 -8.408194 562.422
## 101339 -37.26180 -8.408194 563.599
## 101340 -37.26152 -8.408194 564.506
## 101341 -37.26125 -8.408194 565.199
## 101342 -37.26097 -8.408194 565.595
## 101343 -37.26069 -8.408194 565.695
## 101344 -37.26041 -8.408194 565.579
## 101345 -37.26013 -8.408194 565.075
## 101346 -37.25986 -8.408194 563.978
## 101347 -37.25958 -8.408194 563.140
## 101348 -37.25930 -8.408194 562.844
## 101349 -37.25902 -8.408194 563.272
## 101350 -37.25875 -8.408194 563.556
## 101351 -37.25847 -8.408194 563.453
## 101352 -37.25819 -8.408194 562.647
## 101353 -37.25791 -8.408194 561.648
## 101354 -37.25763 -8.408194 560.382
## 101355 -37.25736 -8.408194 559.144
## 101356 -37.25708 -8.408194 557.979
## 101357 -37.25680 -8.408194 557.277
## 101358 -37.25652 -8.408194 556.754
## 101359 -37.25625 -8.408194 556.387
## 101360 -37.25597 -8.408194 555.969
## 101361 -37.25569 -8.408194 555.982
## 101362 -37.25541 -8.408194 556.439
## 101363 -37.25513 -8.408194 557.513
## 101364 -37.25486 -8.408194 559.257
## 101365 -37.25458 -8.408194 561.107
## 101366 -37.25430 -8.408194 563.080
## 101367 -37.25402 -8.408194 564.419
## 101368 -37.25375 -8.408194 565.445
## 101369 -37.25347 -8.408194 566.041
## 101370 -37.25319 -8.408194 566.974
## 101371 -37.25291 -8.408194 568.071
## 101372 -37.25263 -8.408194 569.594
## 101373 -37.25236 -8.408194 571.179
## 101374 -37.25208 -8.408194 572.970
## 101375 -37.25180 -8.408194 574.334
## 101376 -37.25152 -8.408194 575.997
## 101377 -37.25125 -8.408194 577.543
## 101378 -37.25097 -8.408194 578.374
## 101379 -37.25069 -8.408194 578.935
## 101380 -37.25041 -8.408194 579.492
## 101381 -37.25013 -8.408194 580.374
## 101382 -37.24986 -8.408194 581.122
## 101383 -37.24958 -8.408194 581.617
## 101384 -37.24930 -8.408194 581.588
## 101385 -37.24902 -8.408194 581.159
## 101386 -37.24875 -8.408194 580.745
## 101387 -37.24847 -8.408194 580.363
## 101388 -37.24819 -8.408194 580.378
## 101389 -37.24791 -8.408194 580.460
## 101390 -37.24763 -8.408194 580.553
## 101391 -37.24736 -8.408194 580.458
## 101392 -37.24708 -8.408194 580.345
## 101393 -37.24680 -8.408194 580.200
## 101394 -37.24652 -8.408194 580.394
## 101395 -37.24625 -8.408194 580.819
## 101396 -37.24597 -8.408194 581.633
## 101397 -37.24569 -8.408194 582.666
## 101398 -37.24541 -8.408194 583.722
## 101399 -37.24513 -8.408194 584.901
## 101400 -37.24486 -8.408194 585.863
## 101401 -37.24458 -8.408194 586.650
## 101402 -37.24430 -8.408194 587.268
## 101403 -37.24402 -8.408194 587.822
## 101404 -37.24375 -8.408194 588.406
## 101405 -37.24347 -8.408194 588.759
## 101406 -37.24319 -8.408194 589.656
## 101407 -37.24291 -8.408194 590.630
## 101408 -37.24263 -8.408194 591.694
## 101409 -37.24236 -8.408194 592.602
## 101410 -37.24208 -8.408194 593.423
## 101411 -37.24180 -8.408194 594.548
## 101412 -37.24152 -8.408194 595.736
## 101413 -37.24125 -8.408194 596.846
## 101414 -37.24097 -8.408194 597.635
## 101415 -37.24069 -8.408194 597.755
## 101416 -37.24041 -8.408194 597.711
## 101417 -37.24013 -8.408194 597.510
## 101418 -37.23986 -8.408194 597.131
## 101419 -37.23958 -8.408194 596.620
## 101420 -37.23930 -8.408194 595.526
## 101421 -37.23902 -8.408194 594.160
## 101422 -37.23875 -8.408194 592.879
## 101423 -37.23847 -8.408194 591.745
## 101424 -37.23819 -8.408194 591.253
## 101425 -37.23791 -8.408194 590.617
## 101426 -37.23763 -8.408194 590.066
## 101427 -37.23736 -8.408194 588.865
## 101428 -37.23708 -8.408194 587.282
## 101429 -37.23680 -8.408194 585.543
## 101430 -37.23652 -8.408194 584.186
## 101431 -37.23625 -8.408194 583.269
## 101432 -37.23597 -8.408194 582.657
## 101433 -37.23569 -8.408194 582.432
## 101434 -37.23541 -8.408194 582.323
## 101435 -37.23513 -8.408194 582.048
## 101436 -37.23486 -8.408194 581.060
## 101437 -37.23458 -8.408194 579.827
## 101438 -37.23430 -8.408194 578.301
## 101439 -37.23402 -8.408194 576.653
## 101440 -37.23375 -8.408194 575.309
## 101441 -37.23347 -8.408194 574.417
## 101442 -37.23319 -8.408194 574.523
## 101443 -37.23291 -8.408194 574.860
## 101444 -37.23263 -8.408194 575.400
## 101445 -37.23236 -8.408194 575.903
## 101446 -37.23208 -8.408194 576.244
## 101447 -37.23180 -8.408194 576.532
## 101448 -37.23152 -8.408194 576.821
## 101449 -37.23125 -8.408194 577.014
## 101450 -37.23097 -8.408194 577.697
## 101451 -37.23069 -8.408194 578.248
## 101452 -37.23041 -8.408194 578.837
## 101453 -37.23013 -8.408194 578.982
## 101454 -37.22986 -8.408194 579.366
## 101455 -37.22958 -8.408194 580.028
## 101456 -37.22930 -8.408194 580.693
## 101457 -37.22902 -8.408194 581.751
## 101458 -37.22875 -8.408194 582.688
## 101459 -37.22847 -8.408194 583.689
## 101460 -37.22819 -8.408194 583.593
## 101461 -37.22791 -8.408194 582.996
## 101462 -37.22763 -8.408194 582.071
## 101463 -37.22736 -8.408194 581.656
## 101464 -37.22708 -8.408194 581.324
## 101465 -37.22680 -8.408194 580.993
## 101466 -37.22652 -8.408194 580.564
## 101467 -37.22625 -8.408194 580.040
## 101468 -37.22597 -8.408194 579.411
## 101469 -37.22569 -8.408194 578.853
## 101470 -37.22541 -8.408194 578.217
## 101471 -37.22513 -8.408194 577.310
## 101472 -37.22486 -8.408194 576.153
## 101473 -37.22458 -8.408194 574.817
## 101474 -37.22430 -8.408194 573.434
## 101475 -37.22402 -8.408194 571.389
## 101476 -37.22375 -8.408194 569.580
## 102326 -37.36402 -8.408472 520.904
## 102327 -37.36375 -8.408472 521.362
## 102328 -37.36347 -8.408472 521.864
## 102329 -37.36319 -8.408472 521.903
## 102330 -37.36291 -8.408472 522.325
## 102331 -37.36263 -8.408472 523.447
## 102332 -37.36236 -8.408472 525.626
## 102333 -37.36208 -8.408472 528.178
## 102334 -37.36180 -8.408472 530.620
## 102335 -37.36152 -8.408472 531.950
## 102336 -37.36125 -8.408472 532.791
## 102337 -37.36097 -8.408472 533.169
## 102338 -37.36069 -8.408472 533.509
## 102339 -37.36041 -8.408472 533.789
## 102340 -37.36013 -8.408472 533.843
## 102341 -37.35986 -8.408472 533.564
## 102342 -37.35958 -8.408472 533.404
## 102343 -37.35930 -8.408472 533.461
## 102344 -37.35902 -8.408472 534.300
## 102345 -37.35875 -8.408472 535.115
## 102346 -37.35847 -8.408472 535.856
## 102347 -37.35819 -8.408472 535.869
## 102348 -37.35791 -8.408472 535.772
## 102349 -37.35763 -8.408472 535.744
## 102350 -37.35736 -8.408472 536.064
## 102351 -37.35708 -8.408472 536.362
## 102352 -37.35680 -8.408472 536.597
## 102353 -37.35652 -8.408472 536.424
## 102354 -37.35625 -8.408472 536.145
## 102355 -37.35597 -8.408472 535.686
## 102356 -37.35569 -8.408472 535.408
## 102357 -37.35541 -8.408472 535.240
## 102358 -37.35513 -8.408472 535.062
## 102359 -37.35486 -8.408472 534.524
## 102360 -37.35458 -8.408472 533.956
## 102361 -37.35430 -8.408472 533.322
## 102362 -37.35402 -8.408472 532.848
## 102363 -37.35375 -8.408472 532.643
## 102364 -37.35347 -8.408472 532.788
## 102365 -37.35319 -8.408472 533.578
## 102366 -37.35291 -8.408472 534.502
## 102367 -37.35263 -8.408472 535.127
## 102368 -37.35236 -8.408472 534.886
## 102369 -37.35208 -8.408472 534.329
## 102370 -37.35180 -8.408472 533.698
## 102371 -37.35152 -8.408472 533.300
## 102372 -37.35125 -8.408472 533.670
## 102373 -37.35097 -8.408472 534.555
## 102374 -37.35069 -8.408472 536.216
## 102375 -37.35041 -8.408472 537.774
## 102376 -37.35013 -8.408472 539.534
## 102377 -37.34986 -8.408472 540.577
## 102378 -37.34958 -8.408472 541.189
## 102379 -37.34930 -8.408472 541.380
## 102380 -37.34902 -8.408472 541.791
## 102381 -37.34875 -8.408472 542.447
## 102382 -37.34847 -8.408472 543.028
## 102383 -37.34819 -8.408472 543.532
## 102384 -37.34791 -8.408472 544.007
## 102385 -37.34763 -8.408472 544.217
## 102386 -37.34736 -8.408472 543.795
## 102387 -37.34708 -8.408472 543.205
## 102388 -37.34680 -8.408472 542.771
## 102389 -37.34652 -8.408472 542.944
## 102390 -37.34625 -8.408472 543.236
## 102391 -37.34597 -8.408472 543.568
## 102392 -37.34569 -8.408472 543.447
## 102393 -37.34541 -8.408472 543.397
## 102394 -37.34513 -8.408472 542.991
## 102395 -37.34486 -8.408472 542.745
## 102396 -37.34458 -8.408472 542.505
## 102397 -37.34430 -8.408472 542.575
## 102398 -37.34402 -8.408472 542.837
## 102399 -37.34375 -8.408472 543.220
## 102400 -37.34347 -8.408472 543.901
## 102401 -37.34319 -8.408472 544.938
## 102402 -37.34291 -8.408472 545.994
## 102403 -37.34263 -8.408472 546.834
## 102404 -37.34236 -8.408472 546.808
## 102405 -37.34208 -8.408472 546.603
## 102406 -37.34180 -8.408472 546.763
## 102407 -37.34152 -8.408472 547.280
## 102408 -37.34125 -8.408472 547.986
## 102409 -37.34097 -8.408472 548.581
## 102410 -37.34069 -8.408472 548.793
## 102411 -37.34041 -8.408472 549.098
## 102412 -37.34013 -8.408472 549.271
## 102413 -37.33986 -8.408472 549.556
## 102414 -37.33958 -8.408472 549.839
## 102415 -37.33930 -8.408472 549.891
## 102416 -37.33902 -8.408472 549.942
## 102417 -37.33875 -8.408472 549.856
## 102418 -37.33847 -8.408472 549.588
## 102419 -37.33819 -8.408472 549.157
## 102420 -37.33791 -8.408472 548.895
## 102421 -37.33763 -8.408472 548.802
## 102422 -37.33736 -8.408472 548.909
## 102423 -37.33708 -8.408472 548.965
## 102424 -37.33680 -8.408472 548.921
## 102425 -37.33652 -8.408472 548.811
## 102426 -37.33625 -8.408472 548.711
## 102427 -37.33597 -8.408472 548.634
## 102428 -37.33569 -8.408472 549.145
## 102429 -37.33541 -8.408472 549.785
## 102430 -37.33513 -8.408472 550.342
## 102431 -37.33486 -8.408472 550.444
## 102432 -37.33458 -8.408472 550.358
## 102433 -37.33430 -8.408472 550.512
## 102434 -37.33402 -8.408472 550.589
## 102435 -37.33375 -8.408472 550.629
## 102436 -37.33347 -8.408472 550.595
## 102437 -37.33319 -8.408472 550.558
## 102438 -37.33291 -8.408472 550.565
## 102439 -37.33263 -8.408472 550.609
## 102440 -37.33236 -8.408472 550.474
## 102441 -37.33208 -8.408472 550.207
## 102442 -37.33180 -8.408472 549.634
## 102443 -37.33152 -8.408472 548.668
## 102444 -37.33125 -8.408472 547.857
## 102445 -37.33097 -8.408472 547.104
## 102446 -37.33069 -8.408472 546.865
## 102447 -37.33041 -8.408472 546.774
## 102448 -37.33013 -8.408472 547.007
## 102449 -37.32986 -8.408472 546.689
## 102450 -37.32958 -8.408472 546.486
## 102451 -37.32930 -8.408472 546.574
## 102452 -37.32902 -8.408472 547.334
## 102453 -37.32875 -8.408472 548.283
## 102454 -37.32847 -8.408472 549.310
## 102455 -37.32819 -8.408472 550.155
## 102456 -37.32791 -8.408472 551.050
## 102457 -37.32763 -8.408472 551.978
## 102458 -37.32736 -8.408472 552.508
## 102459 -37.32708 -8.408472 552.990
## 102460 -37.32680 -8.408472 553.202
## 102461 -37.32652 -8.408472 553.799
## 102462 -37.32625 -8.408472 554.055
## 102463 -37.32597 -8.408472 554.169
## 102464 -37.32569 -8.408472 553.961
## 102465 -37.32541 -8.408472 553.618
## 102466 -37.32513 -8.408472 553.433
## 102467 -37.32486 -8.408472 553.758
## 102468 -37.32458 -8.408472 554.051
## 102469 -37.32430 -8.408472 554.414
## 102470 -37.32402 -8.408472 554.152
## 102471 -37.32375 -8.408472 554.191
## 102472 -37.32347 -8.408472 554.476
## 102473 -37.32319 -8.408472 555.149
## 102474 -37.32291 -8.408472 555.995
## 102475 -37.32263 -8.408472 556.651
## 102476 -37.32236 -8.408472 557.419
## 102477 -37.32208 -8.408472 558.269
## 102478 -37.32180 -8.408472 559.094
## 102479 -37.32152 -8.408472 559.569
## 102480 -37.32125 -8.408472 559.847
## 102481 -37.32097 -8.408472 560.246
## 102482 -37.32069 -8.408472 560.823
## 102483 -37.32041 -8.408472 561.398
## 102484 -37.32013 -8.408472 561.937
## 102485 -37.31986 -8.408472 561.996
## 102486 -37.31958 -8.408472 561.942
## 102487 -37.31930 -8.408472 562.062
## 102488 -37.31902 -8.408472 561.689
## 102489 -37.31875 -8.408472 561.184
## 102490 -37.31847 -8.408472 560.084
## 102491 -37.31819 -8.408472 559.496
## 102492 -37.31791 -8.408472 559.394
## 102493 -37.31763 -8.408472 559.714
## 102494 -37.31736 -8.408472 560.426
## 102495 -37.31708 -8.408472 561.267
## 102496 -37.31680 -8.408472 562.119
## 102497 -37.31652 -8.408472 562.654
## 102498 -37.31625 -8.408472 562.580
## 102499 -37.31597 -8.408472 562.042
## 102500 -37.31569 -8.408472 561.284
## 102501 -37.31541 -8.408472 560.217
## 102502 -37.31513 -8.408472 559.167
## 102503 -37.31486 -8.408472 557.721
## 102504 -37.31458 -8.408472 556.439
## 102505 -37.31430 -8.408472 555.404
## 102506 -37.31402 -8.408472 555.426
## 102507 -37.31375 -8.408472 555.891
## 102508 -37.31347 -8.408472 556.087
## 102509 -37.31319 -8.408472 555.971
## 102510 -37.31291 -8.408472 555.602
## 102511 -37.31263 -8.408472 554.957
## 102512 -37.31236 -8.408472 554.451
## 102513 -37.31208 -8.408472 553.532
## 102514 -37.31180 -8.408472 552.617
## 102515 -37.31152 -8.408472 551.758
## 102516 -37.31125 -8.408472 550.702
## 102517 -37.31097 -8.408472 549.530
## 102518 -37.31069 -8.408472 548.629
## 102519 -37.31041 -8.408472 548.060
## 102520 -37.31013 -8.408472 548.224
## 102521 -37.30986 -8.408472 549.258
## 102522 -37.30958 -8.408472 550.444
## 102523 -37.30930 -8.408472 551.814
## 102524 -37.30902 -8.408472 552.953
## 102525 -37.30875 -8.408472 554.136
## 102526 -37.30847 -8.408472 555.228
## 102527 -37.30819 -8.408472 556.617
## 102528 -37.30791 -8.408472 558.010
## 102529 -37.30763 -8.408472 559.085
## 102530 -37.30736 -8.408472 559.737
## 102531 -37.30708 -8.408472 560.161
## 102532 -37.30680 -8.408472 559.911
## 102533 -37.30652 -8.408472 560.005
## 102534 -37.30625 -8.408472 560.076
## 102535 -37.30597 -8.408472 560.404
## 102536 -37.30569 -8.408472 560.732
## 102537 -37.30541 -8.408472 560.630
## 102538 -37.30513 -8.408472 560.061
## 102539 -37.30486 -8.408472 559.236
## 102540 -37.30458 -8.408472 558.334
## 102541 -37.30430 -8.408472 557.944
## 102542 -37.30402 -8.408472 558.581
## 102543 -37.30375 -8.408472 559.573
## 102544 -37.30347 -8.408472 561.284
## 102545 -37.30319 -8.408472 562.802
## 102546 -37.30291 -8.408472 564.134
## 102547 -37.30263 -8.408472 564.133
## 102548 -37.30236 -8.408472 563.087
## 102549 -37.30208 -8.408472 562.023
## 102550 -37.30180 -8.408472 561.387
## 102551 -37.30152 -8.408472 561.847
## 102552 -37.30125 -8.408472 562.536
## 102553 -37.30097 -8.408472 563.684
## 102554 -37.30069 -8.408472 563.879
## 102555 -37.30041 -8.408472 563.582
## 102556 -37.30013 -8.408472 562.655
## 102557 -37.29986 -8.408472 561.080
## 102558 -37.29958 -8.408472 559.460
## 102559 -37.29930 -8.408472 557.761
## 102560 -37.29902 -8.408472 556.792
## 102561 -37.29875 -8.408472 556.149
## 102562 -37.29847 -8.408472 555.910
## 102563 -37.29819 -8.408472 555.732
## 102564 -37.29791 -8.408472 555.616
## 102565 -37.29763 -8.408472 555.384
## 102566 -37.29736 -8.408472 554.816
## 102567 -37.29708 -8.408472 554.664
## 102568 -37.29680 -8.408472 555.170
## 102569 -37.29652 -8.408472 557.341
## 102570 -37.29625 -8.408472 559.678
## 102571 -37.29597 -8.408472 561.566
## 102572 -37.29569 -8.408472 561.199
## 102573 -37.29541 -8.408472 559.998
## 102574 -37.29513 -8.408472 558.528
## 102575 -37.29486 -8.408472 558.127
## 102576 -37.29458 -8.408472 557.791
## 102577 -37.29430 -8.408472 557.283
## 102578 -37.29402 -8.408472 556.282
## 102579 -37.29375 -8.408472 555.531
## 102580 -37.29347 -8.408472 555.251
## 102581 -37.29319 -8.408472 555.400
## 102582 -37.29291 -8.408472 555.768
## 102583 -37.29263 -8.408472 556.445
## 102584 -37.29236 -8.408472 556.687
## 102585 -37.29208 -8.408472 557.222
## 102586 -37.29180 -8.408472 557.346
## 102587 -37.29152 -8.408472 557.928
## 102588 -37.29125 -8.408472 558.515
## 102589 -37.29097 -8.408472 558.688
## 102590 -37.29069 -8.408472 558.351
## 102591 -37.29041 -8.408472 557.826
## 102592 -37.29013 -8.408472 557.445
## 102593 -37.28986 -8.408472 557.347
## 102594 -37.28958 -8.408472 557.184
## 102595 -37.28930 -8.408472 557.128
## 102596 -37.28902 -8.408472 556.946
## 102597 -37.28875 -8.408472 556.563
## 102598 -37.28847 -8.408472 556.041
## 102599 -37.28819 -8.408472 555.663
## 102600 -37.28791 -8.408472 555.504
## 102601 -37.28763 -8.408472 555.310
## 102602 -37.28736 -8.408472 555.350
## 102603 -37.28708 -8.408472 555.661
## 102604 -37.28680 -8.408472 556.409
## 102605 -37.28652 -8.408472 557.435
## 102606 -37.28625 -8.408472 558.315
## 102607 -37.28597 -8.408472 559.179
## 102608 -37.28569 -8.408472 559.640
## 102609 -37.28541 -8.408472 559.830
## 102610 -37.28513 -8.408472 559.451
## 102611 -37.28486 -8.408472 558.740
## 102612 -37.28458 -8.408472 557.982
## 102613 -37.28430 -8.408472 557.456
## 102614 -37.28402 -8.408472 557.136
## 102615 -37.28375 -8.408472 557.010
## 102616 -37.28347 -8.408472 557.006
## 102617 -37.28319 -8.408472 557.041
## 102618 -37.28291 -8.408472 557.129
## 102619 -37.28263 -8.408472 557.201
## 102620 -37.28236 -8.408472 557.273
## 102621 -37.28208 -8.408472 557.473
## 102622 -37.28180 -8.408472 558.045
## 102623 -37.28152 -8.408472 558.847
## 102624 -37.28125 -8.408472 559.983
## 102625 -37.28097 -8.408472 560.905
## 102626 -37.28069 -8.408472 562.159
## 102627 -37.28041 -8.408472 563.349
## 102628 -37.28013 -8.408472 564.455
## 102629 -37.27986 -8.408472 564.991
## 102630 -37.27958 -8.408472 565.394
## 102631 -37.27930 -8.408472 565.852
## 102632 -37.27902 -8.408472 566.852
## 102633 -37.27875 -8.408472 567.996
## 102634 -37.27847 -8.408472 569.232
## 102635 -37.27819 -8.408472 570.622
## 102636 -37.27791 -8.408472 572.054
## 102637 -37.27763 -8.408472 573.445
## 102638 -37.27736 -8.408472 574.449
## 102639 -37.27708 -8.408472 575.200
## 102640 -37.27680 -8.408472 575.319
## 102641 -37.27652 -8.408472 574.996
## 102642 -37.27625 -8.408472 574.680
## 102643 -37.27597 -8.408472 574.433
## 102644 -37.27569 -8.408472 575.069
## 102645 -37.27541 -8.408472 575.800
## 102646 -37.27513 -8.408472 576.471
## 102647 -37.27486 -8.408472 576.780
## 102648 -37.27458 -8.408472 576.599
## 102649 -37.27430 -8.408472 576.149
## 102650 -37.27402 -8.408472 575.090
## 102651 -37.27375 -8.408472 573.950
## 102652 -37.27347 -8.408472 572.994
## 102653 -37.27319 -8.408472 572.539
## 102654 -37.27291 -8.408472 572.126
## 102655 -37.27263 -8.408472 571.639
## 102656 -37.27236 -8.408472 570.540
## 102657 -37.27208 -8.408472 569.514
## 102658 -37.27180 -8.408472 568.557
## 102659 -37.27152 -8.408472 568.348
## 102660 -37.27125 -8.408472 568.236
## 102661 -37.27097 -8.408472 567.834
## 102662 -37.27069 -8.408472 567.017
## 102663 -37.27041 -8.408472 566.029
## 102664 -37.27013 -8.408472 565.056
## 102665 -37.26986 -8.408472 564.717
## 102666 -37.26958 -8.408472 564.319
## 102667 -37.26930 -8.408472 564.455
## 102668 -37.26902 -8.408472 564.327
## 102669 -37.26875 -8.408472 564.269
## 102670 -37.26847 -8.408472 564.461
## 102671 -37.26819 -8.408472 565.728
## 102672 -37.26791 -8.408472 567.236
## 102673 -37.26763 -8.408472 568.435
## 102674 -37.26736 -8.408472 569.284
## 102675 -37.26708 -8.408472 569.741
## 102676 -37.26680 -8.408472 570.292
## 102677 -37.26652 -8.408472 570.198
## 102678 -37.26625 -8.408472 569.613
## 102679 -37.26597 -8.408472 568.493
## 102680 -37.26569 -8.408472 567.409
## 102681 -37.26541 -8.408472 566.384
## 102682 -37.26513 -8.408472 565.249
## 102683 -37.26486 -8.408472 564.759
## 102684 -37.26458 -8.408472 564.259
## 102685 -37.26430 -8.408472 564.209
## 102686 -37.26402 -8.408472 563.609
## 102687 -37.26375 -8.408472 562.897
## 102688 -37.26347 -8.408472 562.176
## 102689 -37.26319 -8.408472 561.516
## 102690 -37.26291 -8.408472 561.159
## 102691 -37.26263 -8.408472 561.223
## 102692 -37.26236 -8.408472 562.048
## 102693 -37.26208 -8.408472 563.291
## 102694 -37.26180 -8.408472 564.526
## 102695 -37.26152 -8.408472 565.375
## 102696 -37.26125 -8.408472 565.903
## 102697 -37.26097 -8.408472 566.306
## 102698 -37.26069 -8.408472 566.069
## 102699 -37.26041 -8.408472 565.457
## 102700 -37.26013 -8.408472 564.455
## 102701 -37.25986 -8.408472 564.026
## 102702 -37.25958 -8.408472 563.809
## 102703 -37.25930 -8.408472 563.954
## 102704 -37.25902 -8.408472 563.946
## 102705 -37.25875 -8.408472 563.777
## 102706 -37.25847 -8.408472 563.459
## 102707 -37.25819 -8.408472 562.653
## 102708 -37.25791 -8.408472 561.662
## 102709 -37.25763 -8.408472 560.346
## 102710 -37.25736 -8.408472 559.324
## 102711 -37.25708 -8.408472 558.406
## 102712 -37.25680 -8.408472 557.786
## 102713 -37.25652 -8.408472 557.271
## 102714 -37.25625 -8.408472 556.815
## 102715 -37.25597 -8.408472 556.357
## 102716 -37.25569 -8.408472 556.080
## 102717 -37.25541 -8.408472 556.123
## 102718 -37.25513 -8.408472 556.896
## 102719 -37.25486 -8.408472 558.756
## 102720 -37.25458 -8.408472 560.685
## 102721 -37.25430 -8.408472 562.668
## 102722 -37.25402 -8.408472 563.775
## 102723 -37.25375 -8.408472 564.603
## 102724 -37.25347 -8.408472 565.201
## 102725 -37.25319 -8.408472 566.369
## 102726 -37.25291 -8.408472 567.794
## 102727 -37.25263 -8.408472 569.463
## 102728 -37.25236 -8.408472 571.389
## 102729 -37.25208 -8.408472 573.415
## 102730 -37.25180 -8.408472 575.308
## 102731 -37.25152 -8.408472 576.466
## 102732 -37.25125 -8.408472 577.405
## 102733 -37.25097 -8.408472 577.924
## 102734 -37.25069 -8.408472 578.455
## 102735 -37.25041 -8.408472 579.033
## 102736 -37.25013 -8.408472 579.881
## 102737 -37.24986 -8.408472 580.825
## 102738 -37.24958 -8.408472 581.650
## 102739 -37.24930 -8.408472 581.811
## 102740 -37.24902 -8.408472 581.314
## 102741 -37.24875 -8.408472 580.881
## 102742 -37.24847 -8.408472 580.457
## 102743 -37.24819 -8.408472 580.558
## 102744 -37.24791 -8.408472 580.692
## 102745 -37.24763 -8.408472 580.844
## 102746 -37.24736 -8.408472 580.712
## 102747 -37.24708 -8.408472 580.474
## 102748 -37.24680 -8.408472 580.420
## 102749 -37.24652 -8.408472 580.724
## 102750 -37.24625 -8.408472 581.195
## 102751 -37.24597 -8.408472 582.117
## 102752 -37.24569 -8.408472 583.199
## 102753 -37.24541 -8.408472 584.347
## 102754 -37.24513 -8.408472 585.542
## 102755 -37.24486 -8.408472 586.710
## 102756 -37.24458 -8.408472 587.751
## 102757 -37.24430 -8.408472 588.478
## 102758 -37.24402 -8.408472 588.726
## 102759 -37.24375 -8.408472 589.033
## 102760 -37.24347 -8.408472 589.233
## 102761 -37.24319 -8.408472 590.289
## 102762 -37.24291 -8.408472 591.461
## 102763 -37.24263 -8.408472 592.848
## 102764 -37.24236 -8.408472 593.720
## 102765 -37.24208 -8.408472 594.563
## 102766 -37.24180 -8.408472 595.759
## 102767 -37.24152 -8.408472 597.521
## 102768 -37.24125 -8.408472 599.158
## 102769 -37.24097 -8.408472 600.340
## 102770 -37.24069 -8.408472 600.643
## 102771 -37.24041 -8.408472 600.799
## 102772 -37.24013 -8.408472 600.691
## 102773 -37.23986 -8.408472 600.715
## 102774 -37.23958 -8.408472 600.518
## 102775 -37.23930 -8.408472 599.604
## 102776 -37.23902 -8.408472 597.983
## 102777 -37.23875 -8.408472 596.390
## 102778 -37.23847 -8.408472 594.982
## 102779 -37.23819 -8.408472 594.430
## 102780 -37.23791 -8.408472 593.731
## 102781 -37.23763 -8.408472 593.053
## 102782 -37.23736 -8.408472 591.341
## 102783 -37.23708 -8.408472 589.369
## 102784 -37.23680 -8.408472 587.232
## 102785 -37.23652 -8.408472 585.653
## 102786 -37.23625 -8.408472 584.489
## 102787 -37.23597 -8.408472 583.627
## 102788 -37.23569 -8.408472 583.007
## 102789 -37.23541 -8.408472 582.467
## 102790 -37.23513 -8.408472 581.792
## 102791 -37.23486 -8.408472 580.936
## 102792 -37.23458 -8.408472 579.747
## 102793 -37.23430 -8.408472 578.437
## 102794 -37.23402 -8.408472 576.569
## 102795 -37.23375 -8.408472 574.994
## 102796 -37.23347 -8.408472 573.992
## 102797 -37.23319 -8.408472 573.864
## 102798 -37.23291 -8.408472 573.951
## 102799 -37.23263 -8.408472 574.406
## 102800 -37.23236 -8.408472 574.841
## 102801 -37.23208 -8.408472 575.269
## 102802 -37.23180 -8.408472 575.703
## 102803 -37.23152 -8.408472 576.387
## 102804 -37.23125 -8.408472 577.118
## 102805 -37.23097 -8.408472 578.079
## 102806 -37.23069 -8.408472 579.029
## 102807 -37.23041 -8.408472 579.969
## 102808 -37.23013 -8.408472 580.443
## 102809 -37.22986 -8.408472 580.117
## 102810 -37.22958 -8.408472 580.014
## 102811 -37.22930 -8.408472 580.320
## 102812 -37.22902 -8.408472 581.593
## 102813 -37.22875 -8.408472 582.795
## 102814 -37.22847 -8.408472 583.898
## 102815 -37.22819 -8.408472 584.095
## 102816 -37.22791 -8.408472 583.948
## 102817 -37.22763 -8.408472 583.460
## 102818 -37.22736 -8.408472 582.472
## 102819 -37.22708 -8.408472 581.741
## 102820 -37.22680 -8.408472 580.791
## 102821 -37.22652 -8.408472 580.714
## 102822 -37.22625 -8.408472 580.662
## 102823 -37.22597 -8.408472 580.264
## 102824 -37.22569 -8.408472 579.129
## 102825 -37.22541 -8.408472 577.813
## 102826 -37.22513 -8.408472 576.463
## 102827 -37.22486 -8.408472 575.769
## 102828 -37.22458 -8.408472 574.949
## 102829 -37.22430 -8.408472 573.831
## 102830 -37.22402 -8.408472 571.880
## 102831 -37.22375 -8.408472 570.086
## 103681 -37.36402 -8.408750 520.413
## 103682 -37.36375 -8.408750 520.998
## 103683 -37.36347 -8.408750 521.650
## 103684 -37.36319 -8.408750 521.988
## 103685 -37.36291 -8.408750 522.568
## 103686 -37.36263 -8.408750 523.728
## 103687 -37.36236 -8.408750 525.904
## 103688 -37.36208 -8.408750 528.373
## 103689 -37.36180 -8.408750 530.658
## 103690 -37.36152 -8.408750 532.033
## 103691 -37.36125 -8.408750 533.004
## 103692 -37.36097 -8.408750 533.637
## 103693 -37.36069 -8.408750 534.367
## 103694 -37.36041 -8.408750 534.892
## 103695 -37.36013 -8.408750 535.173
## 103696 -37.35986 -8.408750 535.074
## 103697 -37.35958 -8.408750 534.962
## 103698 -37.35930 -8.408750 535.015
## 103699 -37.35902 -8.408750 535.739
## 103700 -37.35875 -8.408750 536.599
## 103701 -37.35847 -8.408750 537.259
## 103702 -37.35819 -8.408750 537.365
## 103703 -37.35791 -8.408750 537.215
## 103704 -37.35763 -8.408750 537.047
## 103705 -37.35736 -8.408750 537.380
## 103706 -37.35708 -8.408750 537.710
## 103707 -37.35680 -8.408750 537.848
## 103708 -37.35652 -8.408750 537.833
## 103709 -37.35625 -8.408750 537.617
## 103710 -37.35597 -8.408750 537.354
## 103711 -37.35569 -8.408750 537.303
## 103712 -37.35541 -8.408750 537.216
## 103713 -37.35513 -8.408750 536.990
## 103714 -37.35486 -8.408750 536.447
## 103715 -37.35458 -8.408750 535.798
## 103716 -37.35430 -8.408750 535.068
## 103717 -37.35402 -8.408750 534.580
## 103718 -37.35375 -8.408750 534.272
## 103719 -37.35347 -8.408750 534.357
## 103720 -37.35319 -8.408750 534.989
## 103721 -37.35291 -8.408750 535.730
## 103722 -37.35263 -8.408750 536.193
## 103723 -37.35236 -8.408750 535.880
## 103724 -37.35208 -8.408750 535.324
## 103725 -37.35180 -8.408750 534.807
## 103726 -37.35152 -8.408750 534.764
## 103727 -37.35125 -8.408750 535.188
## 103728 -37.35097 -8.408750 536.154
## 103729 -37.35069 -8.408750 537.514
## 103730 -37.35041 -8.408750 539.093
## 103731 -37.35013 -8.408750 540.574
## 103732 -37.34986 -8.408750 541.452
## 103733 -37.34958 -8.408750 542.114
## 103734 -37.34930 -8.408750 542.453
## 103735 -37.34902 -8.408750 543.276
## 103736 -37.34875 -8.408750 543.898
## 103737 -37.34847 -8.408750 544.526
## 103738 -37.34819 -8.408750 545.084
## 103739 -37.34791 -8.408750 545.475
## 103740 -37.34763 -8.408750 545.499
## 103741 -37.34736 -8.408750 544.961
## 103742 -37.34708 -8.408750 544.332
## 103743 -37.34680 -8.408750 543.928
## 103744 -37.34652 -8.408750 544.262
## 103745 -37.34625 -8.408750 544.758
## 103746 -37.34597 -8.408750 545.168
## 103747 -37.34569 -8.408750 545.281
## 103748 -37.34541 -8.408750 545.145
## 103749 -37.34513 -8.408750 544.888
## 103750 -37.34486 -8.408750 544.647
## 103751 -37.34458 -8.408750 544.467
## 103752 -37.34430 -8.408750 544.521
## 103753 -37.34402 -8.408750 544.549
## 103754 -37.34375 -8.408750 544.938
## 103755 -37.34347 -8.408750 545.540
## 103756 -37.34319 -8.408750 546.623
## 103757 -37.34291 -8.408750 547.602
## 103758 -37.34263 -8.408750 548.230
## 103759 -37.34236 -8.408750 548.073
## 103760 -37.34208 -8.408750 547.736
## 103761 -37.34180 -8.408750 547.549
## 103762 -37.34152 -8.408750 548.229
## 103763 -37.34125 -8.408750 549.056
## 103764 -37.34097 -8.408750 549.788
## 103765 -37.34069 -8.408750 550.443
## 103766 -37.34041 -8.408750 550.886
## 103767 -37.34013 -8.408750 551.318
## 103768 -37.33986 -8.408750 551.906
## 103769 -37.33958 -8.408750 552.425
## 103770 -37.33930 -8.408750 552.753
## 103771 -37.33902 -8.408750 552.879
## 103772 -37.33875 -8.408750 552.735
## 103773 -37.33847 -8.408750 552.391
## 103774 -37.33819 -8.408750 551.892
## 103775 -37.33791 -8.408750 551.362
## 103776 -37.33763 -8.408750 550.882
## 103777 -37.33736 -8.408750 550.797
## 103778 -37.33708 -8.408750 550.757
## 103779 -37.33680 -8.408750 550.743
## 103780 -37.33652 -8.408750 550.598
## 103781 -37.33625 -8.408750 550.553
## 103782 -37.33597 -8.408750 550.645
## 103783 -37.33569 -8.408750 551.261
## 103784 -37.33541 -8.408750 551.874
## 103785 -37.33513 -8.408750 552.294
## 103786 -37.33486 -8.408750 552.198
## 103787 -37.33458 -8.408750 551.917
## 103788 -37.33430 -8.408750 551.783
## 103789 -37.33402 -8.408750 551.581
## 103790 -37.33375 -8.408750 551.584
## 103791 -37.33347 -8.408750 551.558
## 103792 -37.33319 -8.408750 551.615
## 103793 -37.33291 -8.408750 551.599
## 103794 -37.33263 -8.408750 551.572
## 103795 -37.33236 -8.408750 551.561
## 103796 -37.33208 -8.408750 551.430
## 103797 -37.33180 -8.408750 551.106
## 103798 -37.33152 -8.408750 550.431
## 103799 -37.33125 -8.408750 549.689
## 103800 -37.33097 -8.408750 549.144
## 103801 -37.33069 -8.408750 548.978
## 103802 -37.33041 -8.408750 548.995
## 103803 -37.33013 -8.408750 548.801
## 103804 -37.32986 -8.408750 548.293
## 103805 -37.32958 -8.408750 547.731
## 103806 -37.32930 -8.408750 547.481
## 103807 -37.32902 -8.408750 548.101
## 103808 -37.32875 -8.408750 548.987
## 103809 -37.32847 -8.408750 549.972
## 103810 -37.32819 -8.408750 551.056
## 103811 -37.32791 -8.408750 552.027
## 103812 -37.32763 -8.408750 552.898
## 103813 -37.32736 -8.408750 553.550
## 103814 -37.32708 -8.408750 554.117
## 103815 -37.32680 -8.408750 554.518
## 103816 -37.32652 -8.408750 555.262
## 103817 -37.32625 -8.408750 555.727
## 103818 -37.32597 -8.408750 556.092
## 103819 -37.32569 -8.408750 555.890
## 103820 -37.32541 -8.408750 555.684
## 103821 -37.32513 -8.408750 555.550
## 103822 -37.32486 -8.408750 555.800
## 103823 -37.32458 -8.408750 556.117
## 103824 -37.32430 -8.408750 556.297
## 103825 -37.32402 -8.408750 556.192
## 103826 -37.32375 -8.408750 555.973
## 103827 -37.32347 -8.408750 555.844
## 103828 -37.32319 -8.408750 556.486
## 103829 -37.32291 -8.408750 557.262
## 103830 -37.32263 -8.408750 558.196
## 103831 -37.32236 -8.408750 558.987
## 103832 -37.32208 -8.408750 559.765
## 103833 -37.32180 -8.408750 560.569
## 103834 -37.32152 -8.408750 560.730
## 103835 -37.32125 -8.408750 560.988
## 103836 -37.32097 -8.408750 561.285
## 103837 -37.32069 -8.408750 561.728
## 103838 -37.32041 -8.408750 562.176
## 103839 -37.32013 -8.408750 562.477
## 103840 -37.31986 -8.408750 562.416
## 103841 -37.31958 -8.408750 562.217
## 103842 -37.31930 -8.408750 561.900
## 103843 -37.31902 -8.408750 561.826
## 103844 -37.31875 -8.408750 561.668
## 103845 -37.31847 -8.408750 561.291
## 103846 -37.31819 -8.408750 561.402
## 103847 -37.31791 -8.408750 561.469
## 103848 -37.31763 -8.408750 561.789
## 103849 -37.31736 -8.408750 562.478
## 103850 -37.31708 -8.408750 563.233
## 103851 -37.31680 -8.408750 563.778
## 103852 -37.31652 -8.408750 564.049
## 103853 -37.31625 -8.408750 563.867
## 103854 -37.31597 -8.408750 563.437
## 103855 -37.31569 -8.408750 562.562
## 103856 -37.31541 -8.408750 561.524
## 103857 -37.31513 -8.408750 560.207
## 103858 -37.31486 -8.408750 558.869
## 103859 -37.31458 -8.408750 557.673
## 103860 -37.31430 -8.408750 556.848
## 103861 -37.31402 -8.408750 557.593
## 103862 -37.31375 -8.408750 558.379
## 103863 -37.31347 -8.408750 558.986
## 103864 -37.31319 -8.408750 558.939
## 103865 -37.31291 -8.408750 558.464
## 103866 -37.31263 -8.408750 557.778
## 103867 -37.31236 -8.408750 557.078
## 103868 -37.31208 -8.408750 556.202
## 103869 -37.31180 -8.408750 555.306
## 103870 -37.31152 -8.408750 553.904
## 103871 -37.31125 -8.408750 552.524
## 103872 -37.31097 -8.408750 551.109
## 103873 -37.31069 -8.408750 549.560
## 103874 -37.31041 -8.408750 548.431
## 103875 -37.31013 -8.408750 548.036
## 103876 -37.30986 -8.408750 548.664
## 103877 -37.30958 -8.408750 549.849
## 103878 -37.30930 -8.408750 551.121
## 103879 -37.30902 -8.408750 552.414
## 103880 -37.30875 -8.408750 553.643
## 103881 -37.30847 -8.408750 554.771
## 103882 -37.30819 -8.408750 556.553
## 103883 -37.30791 -8.408750 558.154
## 103884 -37.30763 -8.408750 559.615
## 103885 -37.30736 -8.408750 560.845
## 103886 -37.30708 -8.408750 561.795
## 103887 -37.30680 -8.408750 562.384
## 103888 -37.30652 -8.408750 562.694
## 103889 -37.30625 -8.408750 562.787
## 103890 -37.30597 -8.408750 562.985
## 103891 -37.30569 -8.408750 562.789
## 103892 -37.30541 -8.408750 562.567
## 103893 -37.30513 -8.408750 561.963
## 103894 -37.30486 -8.408750 560.750
## 103895 -37.30458 -8.408750 559.503
## 103896 -37.30430 -8.408750 558.604
## 103897 -37.30402 -8.408750 558.515
## 103898 -37.30375 -8.408750 559.095
## 103899 -37.30347 -8.408750 560.050
## 103900 -37.30319 -8.408750 561.793
## 103901 -37.30291 -8.408750 563.239
## 103902 -37.30263 -8.408750 564.027
## 103903 -37.30236 -8.408750 563.636
## 103904 -37.30208 -8.408750 562.894
## 103905 -37.30180 -8.408750 562.538
## 103906 -37.30152 -8.408750 562.889
## 103907 -37.30125 -8.408750 563.579
## 103908 -37.30097 -8.408750 564.297
## 103909 -37.30069 -8.408750 564.259
## 103910 -37.30041 -8.408750 563.813
## 103911 -37.30013 -8.408750 562.786
## 103912 -37.29986 -8.408750 561.166
## 103913 -37.29958 -8.408750 559.384
## 103914 -37.29930 -8.408750 557.756
## 103915 -37.29902 -8.408750 556.919
## 103916 -37.29875 -8.408750 556.408
## 103917 -37.29847 -8.408750 556.268
## 103918 -37.29819 -8.408750 556.256
## 103919 -37.29791 -8.408750 556.357
## 103920 -37.29763 -8.408750 556.346
## 103921 -37.29736 -8.408750 555.913
## 103922 -37.29708 -8.408750 555.767
## 103923 -37.29680 -8.408750 556.257
## 103924 -37.29652 -8.408750 558.226
## 103925 -37.29625 -8.408750 560.382
## 103926 -37.29597 -8.408750 561.987
## 103927 -37.29569 -8.408750 561.260
## 103928 -37.29541 -8.408750 559.915
## 103929 -37.29513 -8.408750 558.573
## 103930 -37.29486 -8.408750 558.126
## 103931 -37.29458 -8.408750 557.946
## 103932 -37.29430 -8.408750 557.623
## 103933 -37.29402 -8.408750 556.779
## 103934 -37.29375 -8.408750 555.977
## 103935 -37.29347 -8.408750 555.480
## 103936 -37.29319 -8.408750 555.695
## 103937 -37.29291 -8.408750 556.218
## 103938 -37.29263 -8.408750 556.827
## 103939 -37.29236 -8.408750 557.204
## 103940 -37.29208 -8.408750 557.617
## 103941 -37.29180 -8.408750 557.941
## 103942 -37.29152 -8.408750 559.028
## 103943 -37.29125 -8.408750 559.756
## 103944 -37.29097 -8.408750 560.151
## 103945 -37.29069 -8.408750 559.805
## 103946 -37.29041 -8.408750 559.194
## 103947 -37.29013 -8.408750 558.546
## 103948 -37.28986 -8.408750 558.127
## 103949 -37.28958 -8.408750 557.794
## 103950 -37.28930 -8.408750 557.579
## 103951 -37.28902 -8.408750 557.205
## 103952 -37.28875 -8.408750 556.883
## 103953 -37.28847 -8.408750 556.405
## 103954 -37.28819 -8.408750 556.234
## 103955 -37.28791 -8.408750 556.011
## 103956 -37.28763 -8.408750 555.879
## 103957 -37.28736 -8.408750 556.042
## 103958 -37.28708 -8.408750 556.375
## 103959 -37.28680 -8.408750 557.055
## 103960 -37.28652 -8.408750 557.839
## 103961 -37.28625 -8.408750 558.764
## 103962 -37.28597 -8.408750 559.659
## 103963 -37.28569 -8.408750 560.294
## 103964 -37.28541 -8.408750 560.644
## 103965 -37.28513 -8.408750 560.555
## 103966 -37.28486 -8.408750 559.940
## 103967 -37.28458 -8.408750 559.110
## 103968 -37.28430 -8.408750 558.407
## 103969 -37.28402 -8.408750 557.881
## 103970 -37.28375 -8.408750 557.591
## 103971 -37.28347 -8.408750 557.455
## 103972 -37.28319 -8.408750 557.325
## 103973 -37.28291 -8.408750 557.278
## 103974 -37.28263 -8.408750 557.282
## 103975 -37.28236 -8.408750 557.320
## 103976 -37.28208 -8.408750 557.522
## 103977 -37.28180 -8.408750 557.758
## 103978 -37.28152 -8.408750 558.756
## 103979 -37.28125 -8.408750 559.801
## 103980 -37.28097 -8.408750 561.042
## 103981 -37.28069 -8.408750 562.409
## 103982 -37.28041 -8.408750 563.687
## 103983 -37.28013 -8.408750 564.651
## 103984 -37.27986 -8.408750 565.035
## 103985 -37.27958 -8.408750 565.280
## 103986 -37.27930 -8.408750 565.781
## 103987 -37.27902 -8.408750 566.612
## 103988 -37.27875 -8.408750 567.800
## 103989 -37.27847 -8.408750 569.139
## 103990 -37.27819 -8.408750 570.724
## 103991 -37.27791 -8.408750 572.242
## 103992 -37.27763 -8.408750 573.629
## 103993 -37.27736 -8.408750 574.747
## 103994 -37.27708 -8.408750 575.550
## 103995 -37.27680 -8.408750 575.904
## 103996 -37.27652 -8.408750 575.830
## 103997 -37.27625 -8.408750 575.640
## 103998 -37.27597 -8.408750 575.532
## 103999 -37.27569 -8.408750 576.121
## 104000 -37.27541 -8.408750 576.758
## 104001 -37.27513 -8.408750 577.290
## 104002 -37.27486 -8.408750 577.475
## 104003 -37.27458 -8.408750 577.292
## 104004 -37.27430 -8.408750 576.714
## 104005 -37.27402 -8.408750 575.420
## 104006 -37.27375 -8.408750 574.089
## 104007 -37.27347 -8.408750 572.866
## 104008 -37.27319 -8.408750 572.285
## 104009 -37.27291 -8.408750 571.793
## 104010 -37.27263 -8.408750 571.186
## 104011 -37.27236 -8.408750 570.186
## 104012 -37.27208 -8.408750 569.202
## 104013 -37.27180 -8.408750 568.325
## 104014 -37.27152 -8.408750 568.336
## 104015 -37.27125 -8.408750 568.296
## 104016 -37.27097 -8.408750 568.242
## 104017 -37.27069 -8.408750 567.546
## 104018 -37.27041 -8.408750 566.804
## 104019 -37.27013 -8.408750 566.116
## 104020 -37.26986 -8.408750 565.759
## 104021 -37.26958 -8.408750 565.470
## 104022 -37.26930 -8.408750 565.089
## 104023 -37.26902 -8.408750 564.594
## 104024 -37.26875 -8.408750 564.216
## 104025 -37.26847 -8.408750 564.319
## 104026 -37.26819 -8.408750 565.600
## 104027 -37.26791 -8.408750 567.162
## 104028 -37.26763 -8.408750 568.706
## 104029 -37.26736 -8.408750 569.567
## 104030 -37.26708 -8.408750 570.070
## 104031 -37.26680 -8.408750 570.297
## 104032 -37.26652 -8.408750 569.913
## 104033 -37.26625 -8.408750 569.337
## 104034 -37.26597 -8.408750 568.353
## 104035 -37.26569 -8.408750 567.467
## 104036 -37.26541 -8.408750 566.482
## 104037 -37.26513 -8.408750 565.727
## 104038 -37.26486 -8.408750 565.479
## 104039 -37.26458 -8.408750 565.318
## 104040 -37.26430 -8.408750 565.043
## 104041 -37.26402 -8.408750 564.219
## 104042 -37.26375 -8.408750 563.325
## 104043 -37.26347 -8.408750 562.422
## 104044 -37.26319 -8.408750 561.813
## 104045 -37.26291 -8.408750 561.531
## 104046 -37.26263 -8.408750 561.769
## 104047 -37.26236 -8.408750 562.732
## 104048 -37.26208 -8.408750 563.995
## 104049 -37.26180 -8.408750 565.204
## 104050 -37.26152 -8.408750 566.138
## 104051 -37.26125 -8.408750 566.615
## 104052 -37.26097 -8.408750 566.675
## 104053 -37.26069 -8.408750 566.162
## 104054 -37.26041 -8.408750 565.449
## 104055 -37.26013 -8.408750 564.739
## 104056 -37.25986 -8.408750 564.530
## 104057 -37.25958 -8.408750 564.457
## 104058 -37.25930 -8.408750 564.608
## 104059 -37.25902 -8.408750 564.450
## 104060 -37.25875 -8.408750 564.252
## 104061 -37.25847 -8.408750 563.608
## 104062 -37.25819 -8.408750 562.844
## 104063 -37.25791 -8.408750 561.756
## 104064 -37.25763 -8.408750 560.704
## 104065 -37.25736 -8.408750 559.967
## 104066 -37.25708 -8.408750 559.345
## 104067 -37.25680 -8.408750 558.727
## 104068 -37.25652 -8.408750 558.077
## 104069 -37.25625 -8.408750 557.454
## 104070 -37.25597 -8.408750 557.090
## 104071 -37.25569 -8.408750 556.465
## 104072 -37.25541 -8.408750 556.371
## 104073 -37.25513 -8.408750 556.880
## 104074 -37.25486 -8.408750 558.255
## 104075 -37.25458 -8.408750 559.892
## 104076 -37.25430 -8.408750 561.388
## 104077 -37.25402 -8.408750 562.422
## 104078 -37.25375 -8.408750 563.207
## 104079 -37.25347 -8.408750 564.087
## 104080 -37.25319 -8.408750 565.392
## 104081 -37.25291 -8.408750 567.006
## 104082 -37.25263 -8.408750 568.961
## 104083 -37.25236 -8.408750 571.048
## 104084 -37.25208 -8.408750 573.135
## 104085 -37.25180 -8.408750 574.793
## 104086 -37.25152 -8.408750 575.893
## 104087 -37.25125 -8.408750 576.613
## 104088 -37.25097 -8.408750 576.969
## 104089 -37.25069 -8.408750 577.610
## 104090 -37.25041 -8.408750 578.163
## 104091 -37.25013 -8.408750 578.902
## 104092 -37.24986 -8.408750 579.949
## 104093 -37.24958 -8.408750 580.924
## 104094 -37.24930 -8.408750 581.303
## 104095 -37.24902 -8.408750 581.372
## 104096 -37.24875 -8.408750 581.051
## 104097 -37.24847 -8.408750 580.745
## 104098 -37.24819 -8.408750 580.879
## 104099 -37.24791 -8.408750 581.092
## 104100 -37.24763 -8.408750 581.241
## 104101 -37.24736 -8.408750 581.123
## 104102 -37.24708 -8.408750 580.998
## 104103 -37.24680 -8.408750 581.109
## 104104 -37.24652 -8.408750 581.289
## 104105 -37.24625 -8.408750 581.795
## 104106 -37.24597 -8.408750 582.632
## 104107 -37.24569 -8.408750 583.529
## 104108 -37.24541 -8.408750 584.657
## 104109 -37.24513 -8.408750 585.867
## 104110 -37.24486 -8.408750 587.112
## 104111 -37.24458 -8.408750 588.212
## 104112 -37.24430 -8.408750 588.913
## 104113 -37.24402 -8.408750 589.303
## 104114 -37.24375 -8.408750 589.591
## 104115 -37.24347 -8.408750 590.053
## 104116 -37.24319 -8.408750 591.141
## 104117 -37.24291 -8.408750 592.415
## 104118 -37.24263 -8.408750 593.702
## 104119 -37.24236 -8.408750 594.705
## 104120 -37.24208 -8.408750 595.812
## 104121 -37.24180 -8.408750 597.178
## 104122 -37.24152 -8.408750 599.275
## 104123 -37.24125 -8.408750 601.283
## 104124 -37.24097 -8.408750 602.843
## 104125 -37.24069 -8.408750 603.939
## 104126 -37.24041 -8.408750 604.511
## 104127 -37.24013 -8.408750 604.863
## 104128 -37.23986 -8.408750 605.243
## 104129 -37.23958 -8.408750 605.251
## 104130 -37.23930 -8.408750 604.617
## 104131 -37.23902 -8.408750 603.134
## 104132 -37.23875 -8.408750 601.376
## 104133 -37.23847 -8.408750 599.725
## 104134 -37.23819 -8.408750 598.560
## 104135 -37.23791 -8.408750 597.415
## 104136 -37.23763 -8.408750 595.933
## 104137 -37.23736 -8.408750 593.682
## 104138 -37.23708 -8.408750 591.281
## 104139 -37.23680 -8.408750 589.015
## 104140 -37.23652 -8.408750 587.332
## 104141 -37.23625 -8.408750 585.939
## 104142 -37.23597 -8.408750 584.694
## 104143 -37.23569 -8.408750 583.914
## 104144 -37.23541 -8.408750 583.099
## 104145 -37.23513 -8.408750 582.281
## 104146 -37.23486 -8.408750 581.392
## 104147 -37.23458 -8.408750 580.320
## 104148 -37.23430 -8.408750 579.023
## 104149 -37.23402 -8.408750 577.255
## 104150 -37.23375 -8.408750 575.533
## 104151 -37.23347 -8.408750 574.289
## 104152 -37.23319 -8.408750 573.498
## 104153 -37.23291 -8.408750 573.285
## 104154 -37.23263 -8.408750 573.535
## 104155 -37.23236 -8.408750 573.558
## 104156 -37.23208 -8.408750 573.952
## 104157 -37.23180 -8.408750 574.619
## 104158 -37.23152 -8.408750 575.475
## 104159 -37.23125 -8.408750 576.541
## 104160 -37.23097 -8.408750 577.629
## 104161 -37.23069 -8.408750 579.066
## 104162 -37.23041 -8.408750 580.190
## 104163 -37.23013 -8.408750 580.798
## 104164 -37.22986 -8.408750 580.585
## 104165 -37.22958 -8.408750 580.269
## 104166 -37.22930 -8.408750 580.387
## 104167 -37.22902 -8.408750 581.424
## 104168 -37.22875 -8.408750 582.627
## 104169 -37.22847 -8.408750 583.776
## 104170 -37.22819 -8.408750 584.096
## 104171 -37.22791 -8.408750 584.075
## 104172 -37.22763 -8.408750 583.611
## 104173 -37.22736 -8.408750 582.683
## 104174 -37.22708 -8.408750 581.694
## 104175 -37.22680 -8.408750 580.966
## 104176 -37.22652 -8.408750 580.798
## 104177 -37.22625 -8.408750 580.780
## 104178 -37.22597 -8.408750 580.404
## 104179 -37.22569 -8.408750 579.261
## 104180 -37.22541 -8.408750 577.826
## 104181 -37.22513 -8.408750 576.467
## 104182 -37.22486 -8.408750 575.794
## 104183 -37.22458 -8.408750 575.064
## 104184 -37.22430 -8.408750 573.980
## 104185 -37.22402 -8.408750 572.195
## 104186 -37.22375 -8.408750 570.574
## 105035 -37.36430 -8.409028 520.041
## 105036 -37.36402 -8.409028 520.334
## 105037 -37.36375 -8.409028 520.973
## 105038 -37.36347 -8.409028 521.721
## 105039 -37.36319 -8.409028 522.278
## 105040 -37.36291 -8.409028 522.893
## 105041 -37.36263 -8.409028 524.054
## 105042 -37.36236 -8.409028 526.063
## 105043 -37.36208 -8.409028 528.324
## 105044 -37.36180 -8.409028 530.429
## 105045 -37.36152 -8.409028 531.879
## 105046 -37.36125 -8.409028 533.031
## 105047 -37.36097 -8.409028 533.980
## 105048 -37.36069 -8.409028 535.075
## 105049 -37.36041 -8.409028 535.846
## 105050 -37.36013 -8.409028 536.462
## 105051 -37.35986 -8.409028 536.486
## 105052 -37.35958 -8.409028 536.394
## 105053 -37.35930 -8.409028 536.434
## 105054 -37.35902 -8.409028 537.051
## 105055 -37.35875 -8.409028 537.897
## 105056 -37.35847 -8.409028 538.586
## 105057 -37.35819 -8.409028 538.633
## 105058 -37.35791 -8.409028 538.514
## 105059 -37.35763 -8.409028 538.335
## 105060 -37.35736 -8.409028 538.736
## 105061 -37.35708 -8.409028 539.129
## 105062 -37.35680 -8.409028 539.383
## 105063 -37.35652 -8.409028 539.388
## 105064 -37.35625 -8.409028 539.286
## 105065 -37.35597 -8.409028 539.129
## 105066 -37.35569 -8.409028 539.314
## 105067 -37.35541 -8.409028 539.241
## 105068 -37.35513 -8.409028 539.021
## 105069 -37.35486 -8.409028 538.455
## 105070 -37.35458 -8.409028 537.815
## 105071 -37.35430 -8.409028 537.148
## 105072 -37.35402 -8.409028 536.555
## 105073 -37.35375 -8.409028 536.127
## 105074 -37.35347 -8.409028 536.045
## 105075 -37.35319 -8.409028 536.633
## 105076 -37.35291 -8.409028 537.240
## 105077 -37.35263 -8.409028 537.521
## 105078 -37.35236 -8.409028 537.156
## 105079 -37.35208 -8.409028 536.492
## 105080 -37.35180 -8.409028 536.268
## 105081 -37.35152 -8.409028 536.616
## 105082 -37.35125 -8.409028 537.041
## 105083 -37.35097 -8.409028 537.945
## 105084 -37.35069 -8.409028 539.156
## 105085 -37.35041 -8.409028 540.629
## 105086 -37.35013 -8.409028 541.656
## 105087 -37.34986 -8.409028 542.364
## 105088 -37.34958 -8.409028 543.044
## 105089 -37.34930 -8.409028 543.925
## 105090 -37.34902 -8.409028 544.789
## 105091 -37.34875 -8.409028 545.407
## 105092 -37.34847 -8.409028 545.994
## 105093 -37.34819 -8.409028 546.649
## 105094 -37.34791 -8.409028 546.916
## 105095 -37.34763 -8.409028 546.782
## 105096 -37.34736 -8.409028 546.145
## 105097 -37.34708 -8.409028 545.566
## 105098 -37.34680 -8.409028 545.090
## 105099 -37.34652 -8.409028 545.530
## 105100 -37.34625 -8.409028 546.245
## 105101 -37.34597 -8.409028 546.829
## 105102 -37.34569 -8.409028 546.998
## 105103 -37.34541 -8.409028 546.903
## 105104 -37.34513 -8.409028 546.846
## 105105 -37.34486 -8.409028 546.714
## 105106 -37.34458 -8.409028 546.564
## 105107 -37.34430 -8.409028 546.361
## 105108 -37.34402 -8.409028 546.328
## 105109 -37.34375 -8.409028 546.629
## 105110 -37.34347 -8.409028 547.191
## 105111 -37.34319 -8.409028 548.200
## 105112 -37.34291 -8.409028 549.054
## 105113 -37.34263 -8.409028 549.476
## 105114 -37.34236 -8.409028 549.217
## 105115 -37.34208 -8.409028 548.824
## 105116 -37.34180 -8.409028 548.446
## 105117 -37.34152 -8.409028 549.000
## 105118 -37.34125 -8.409028 549.819
## 105119 -37.34097 -8.409028 550.941
## 105120 -37.34069 -8.409028 551.744
## 105121 -37.34041 -8.409028 552.402
## 105122 -37.34013 -8.409028 553.116
## 105123 -37.33986 -8.409028 554.048
## 105124 -37.33958 -8.409028 554.702
## 105125 -37.33930 -8.409028 555.366
## 105126 -37.33902 -8.409028 555.532
## 105127 -37.33875 -8.409028 555.313
## 105128 -37.33847 -8.409028 554.863
## 105129 -37.33819 -8.409028 554.116
## 105130 -37.33791 -8.409028 553.400
## 105131 -37.33763 -8.409028 552.665
## 105132 -37.33736 -8.409028 552.308
## 105133 -37.33708 -8.409028 552.260
## 105134 -37.33680 -8.409028 552.281
## 105135 -37.33652 -8.409028 552.207
## 105136 -37.33625 -8.409028 552.244
## 105137 -37.33597 -8.409028 552.575
## 105138 -37.33569 -8.409028 553.205
## 105139 -37.33541 -8.409028 553.758
## 105140 -37.33513 -8.409028 554.116
## 105141 -37.33486 -8.409028 553.743
## 105142 -37.33458 -8.409028 553.232
## 105143 -37.33430 -8.409028 552.616
## 105144 -37.33402 -8.409028 552.433
## 105145 -37.33375 -8.409028 552.419
## 105146 -37.33347 -8.409028 552.568
## 105147 -37.33319 -8.409028 552.598
## 105148 -37.33291 -8.409028 552.577
## 105149 -37.33263 -8.409028 552.461
## 105150 -37.33236 -8.409028 552.610
## 105151 -37.33208 -8.409028 552.580
## 105152 -37.33180 -8.409028 552.610
## 105153 -37.33152 -8.409028 552.184
## 105154 -37.33125 -8.409028 551.482
## 105155 -37.33097 -8.409028 551.006
## 105156 -37.33069 -8.409028 550.914
## 105157 -37.33041 -8.409028 550.890
## 105158 -37.33013 -8.409028 550.594
## 105159 -37.32986 -8.409028 549.620
## 105160 -37.32958 -8.409028 548.878
## 105161 -37.32930 -8.409028 548.414
## 105162 -37.32902 -8.409028 548.914
## 105163 -37.32875 -8.409028 549.733
## 105164 -37.32847 -8.409028 550.845
## 105165 -37.32819 -8.409028 551.836
## 105166 -37.32791 -8.409028 552.788
## 105167 -37.32763 -8.409028 553.647
## 105168 -37.32736 -8.409028 554.410
## 105169 -37.32708 -8.409028 555.146
## 105170 -37.32680 -8.409028 556.004
## 105171 -37.32652 -8.409028 556.776
## 105172 -37.32625 -8.409028 557.466
## 105173 -37.32597 -8.409028 557.886
## 105174 -37.32569 -8.409028 557.859
## 105175 -37.32541 -8.409028 557.758
## 105176 -37.32513 -8.409028 557.575
## 105177 -37.32486 -8.409028 557.707
## 105178 -37.32458 -8.409028 558.005
## 105179 -37.32430 -8.409028 558.150
## 105180 -37.32402 -8.409028 557.911
## 105181 -37.32375 -8.409028 557.613
## 105182 -37.32347 -8.409028 557.399
## 105183 -37.32319 -8.409028 557.898
## 105184 -37.32291 -8.409028 558.567
## 105185 -37.32263 -8.409028 559.686
## 105186 -37.32236 -8.409028 560.424
## 105187 -37.32208 -8.409028 561.094
## 105188 -37.32180 -8.409028 561.508
## 105189 -37.32152 -8.409028 561.658
## 105190 -37.32125 -8.409028 561.813
## 105191 -37.32097 -8.409028 562.084
## 105192 -37.32069 -8.409028 562.316
## 105193 -37.32041 -8.409028 562.556
## 105194 -37.32013 -8.409028 562.730
## 105195 -37.31986 -8.409028 562.548
## 105196 -37.31958 -8.409028 562.332
## 105197 -37.31930 -8.409028 561.793
## 105198 -37.31902 -8.409028 561.967
## 105199 -37.31875 -8.409028 562.152
## 105200 -37.31847 -8.409028 562.906
## 105201 -37.31819 -8.409028 563.275
## 105202 -37.31791 -8.409028 563.451
## 105203 -37.31763 -8.409028 563.803
## 105204 -37.31736 -8.409028 564.286
## 105205 -37.31708 -8.409028 564.705
## 105206 -37.31680 -8.409028 565.220
## 105207 -37.31652 -8.409028 565.047
## 105208 -37.31625 -8.409028 564.747
## 105209 -37.31597 -8.409028 564.318
## 105210 -37.31569 -8.409028 563.626
## 105211 -37.31541 -8.409028 562.748
## 105212 -37.31513 -8.409028 561.456
## 105213 -37.31486 -8.409028 560.224
## 105214 -37.31458 -8.409028 559.260
## 105215 -37.31430 -8.409028 559.042
## 105216 -37.31402 -8.409028 560.034
## 105217 -37.31375 -8.409028 561.179
## 105218 -37.31347 -8.409028 562.103
## 105219 -37.31319 -8.409028 561.956
## 105220 -37.31291 -8.409028 561.458
## 105221 -37.31263 -8.409028 560.610
## 105222 -37.31236 -8.409028 559.883
## 105223 -37.31208 -8.409028 559.159
## 105224 -37.31180 -8.409028 557.759
## 105225 -37.31152 -8.409028 556.073
## 105226 -37.31125 -8.409028 554.294
## 105227 -37.31097 -8.409028 552.620
## 105228 -37.31069 -8.409028 550.437
## 105229 -37.31041 -8.409028 548.785
## 105230 -37.31013 -8.409028 547.685
## 105231 -37.30986 -8.409028 548.104
## 105232 -37.30958 -8.409028 549.405
## 105233 -37.30930 -8.409028 550.702
## 105234 -37.30902 -8.409028 551.952
## 105235 -37.30875 -8.409028 553.288
## 105236 -37.30847 -8.409028 554.708
## 105237 -37.30819 -8.409028 556.577
## 105238 -37.30791 -8.409028 558.384
## 105239 -37.30763 -8.409028 560.138
## 105240 -37.30736 -8.409028 561.898
## 105241 -37.30708 -8.409028 563.346
## 105242 -37.30680 -8.409028 564.679
## 105243 -37.30652 -8.409028 565.139
## 105244 -37.30625 -8.409028 565.272
## 105245 -37.30597 -8.409028 564.930
## 105246 -37.30569 -8.409028 564.672
## 105247 -37.30541 -8.409028 564.378
## 105248 -37.30513 -8.409028 563.771
## 105249 -37.30486 -8.409028 562.227
## 105250 -37.30458 -8.409028 560.966
## 105251 -37.30430 -8.409028 559.143
## 105252 -37.30402 -8.409028 558.379
## 105253 -37.30375 -8.409028 558.489
## 105254 -37.30347 -8.409028 558.993
## 105255 -37.30319 -8.409028 560.610
## 105256 -37.30291 -8.409028 562.239
## 105257 -37.30263 -8.409028 563.958
## 105258 -37.30236 -8.409028 564.249
## 105259 -37.30208 -8.409028 563.871
## 105260 -37.30180 -8.409028 563.498
## 105261 -37.30152 -8.409028 563.932
## 105262 -37.30125 -8.409028 564.465
## 105263 -37.30097 -8.409028 564.646
## 105264 -37.30069 -8.409028 564.481
## 105265 -37.30041 -8.409028 563.949
## 105266 -37.30013 -8.409028 562.980
## 105267 -37.29986 -8.409028 561.406
## 105268 -37.29958 -8.409028 559.577
## 105269 -37.29930 -8.409028 558.173
## 105270 -37.29902 -8.409028 557.404
## 105271 -37.29875 -8.409028 556.992
## 105272 -37.29847 -8.409028 556.869
## 105273 -37.29819 -8.409028 556.985
## 105274 -37.29791 -8.409028 557.242
## 105275 -37.29763 -8.409028 557.455
## 105276 -37.29736 -8.409028 557.165
## 105277 -37.29708 -8.409028 557.096
## 105278 -37.29680 -8.409028 557.362
## 105279 -37.29652 -8.409028 559.141
## 105280 -37.29625 -8.409028 560.970
## 105281 -37.29597 -8.409028 561.958
## 105282 -37.29569 -8.409028 561.089
## 105283 -37.29541 -8.409028 559.617
## 105284 -37.29513 -8.409028 558.208
## 105285 -37.29486 -8.409028 557.912
## 105286 -37.29458 -8.409028 557.821
## 105287 -37.29430 -8.409028 557.841
## 105288 -37.29402 -8.409028 557.118
## 105289 -37.29375 -8.409028 556.270
## 105290 -37.29347 -8.409028 555.655
## 105291 -37.29319 -8.409028 555.930
## 105292 -37.29291 -8.409028 556.491
## 105293 -37.29263 -8.409028 557.169
## 105294 -37.29236 -8.409028 557.567
## 105295 -37.29208 -8.409028 558.059
## 105296 -37.29180 -8.409028 558.956
## 105297 -37.29152 -8.409028 560.134
## 105298 -37.29125 -8.409028 560.937
## 105299 -37.29097 -8.409028 561.538
## 105300 -37.29069 -8.409028 561.143
## 105301 -37.29041 -8.409028 560.453
## 105302 -37.29013 -8.409028 559.531
## 105303 -37.28986 -8.409028 558.855
## 105304 -37.28958 -8.409028 558.419
## 105305 -37.28930 -8.409028 557.870
## 105306 -37.28902 -8.409028 557.450
## 105307 -37.28875 -8.409028 557.201
## 105308 -37.28847 -8.409028 557.072
## 105309 -37.28819 -8.409028 556.782
## 105310 -37.28791 -8.409028 556.543
## 105311 -37.28763 -8.409028 556.613
## 105312 -37.28736 -8.409028 556.902
## 105313 -37.28708 -8.409028 557.317
## 105314 -37.28680 -8.409028 557.678
## 105315 -37.28652 -8.409028 558.361
## 105316 -37.28625 -8.409028 559.219
## 105317 -37.28597 -8.409028 560.050
## 105318 -37.28569 -8.409028 560.828
## 105319 -37.28541 -8.409028 561.340
## 105320 -37.28513 -8.409028 561.579
## 105321 -37.28486 -8.409028 561.086
## 105322 -37.28458 -8.409028 560.228
## 105323 -37.28430 -8.409028 559.228
## 105324 -37.28402 -8.409028 558.604
## 105325 -37.28375 -8.409028 558.219
## 105326 -37.28347 -8.409028 557.948
## 105327 -37.28319 -8.409028 557.727
## 105328 -37.28291 -8.409028 557.606
## 105329 -37.28263 -8.409028 557.483
## 105330 -37.28236 -8.409028 557.600
## 105331 -37.28208 -8.409028 557.755
## 105332 -37.28180 -8.409028 558.069
## 105333 -37.28152 -8.409028 558.794
## 105334 -37.28125 -8.409028 559.813
## 105335 -37.28097 -8.409028 561.143
## 105336 -37.28069 -8.409028 562.656
## 105337 -37.28041 -8.409028 563.996
## 105338 -37.28013 -8.409028 564.852
## 105339 -37.27986 -8.409028 565.034
## 105340 -37.27958 -8.409028 565.131
## 105341 -37.27930 -8.409028 565.521
## 105342 -37.27902 -8.409028 566.317
## 105343 -37.27875 -8.409028 567.478
## 105344 -37.27847 -8.409028 569.036
## 105345 -37.27819 -8.409028 570.587
## 105346 -37.27791 -8.409028 572.088
## 105347 -37.27763 -8.409028 573.444
## 105348 -37.27736 -8.409028 574.609
## 105349 -37.27708 -8.409028 575.529
## 105350 -37.27680 -8.409028 576.215
## 105351 -37.27652 -8.409028 576.413
## 105352 -37.27625 -8.409028 576.442
## 105353 -37.27597 -8.409028 576.599
## 105354 -37.27569 -8.409028 577.085
## 105355 -37.27541 -8.409028 577.568
## 105356 -37.27513 -8.409028 577.899
## 105357 -37.27486 -8.409028 577.861
## 105358 -37.27458 -8.409028 577.600
## 105359 -37.27430 -8.409028 576.867
## 105360 -37.27402 -8.409028 575.522
## 105361 -37.27375 -8.409028 574.077
## 105362 -37.27347 -8.409028 572.804
## 105363 -37.27319 -8.409028 572.143
## 105364 -37.27291 -8.409028 571.589
## 105365 -37.27263 -8.409028 570.916
## 105366 -37.27236 -8.409028 570.081
## 105367 -37.27208 -8.409028 569.239
## 105368 -37.27180 -8.409028 568.798
## 105369 -37.27152 -8.409028 568.696
## 105370 -37.27125 -8.409028 568.697
## 105371 -37.27097 -8.409028 568.757
## 105372 -37.27069 -8.409028 568.408
## 105373 -37.27041 -8.409028 567.921
## 105374 -37.27013 -8.409028 567.337
## 105375 -37.26986 -8.409028 566.940
## 105376 -37.26958 -8.409028 566.503
## 105377 -37.26930 -8.409028 565.885
## 105378 -37.26902 -8.409028 564.766
## 105379 -37.26875 -8.409028 564.173
## 105380 -37.26847 -8.409028 564.296
## 105381 -37.26819 -8.409028 565.614
## 105382 -37.26791 -8.409028 567.201
## 105383 -37.26763 -8.409028 568.912
## 105384 -37.26736 -8.409028 569.822
## 105385 -37.26708 -8.409028 570.282
## 105386 -37.26680 -8.409028 569.972
## 105387 -37.26652 -8.409028 569.454
## 105388 -37.26625 -8.409028 568.974
## 105389 -37.26597 -8.409028 568.364
## 105390 -37.26569 -8.409028 567.587
## 105391 -37.26541 -8.409028 566.740
## 105392 -37.26513 -8.409028 566.280
## 105393 -37.26486 -8.409028 566.289
## 105394 -37.26458 -8.409028 566.224
## 105395 -37.26430 -8.409028 565.748
## 105396 -37.26402 -8.409028 564.726
## 105397 -37.26375 -8.409028 563.712
## 105398 -37.26347 -8.409028 562.655
## 105399 -37.26319 -8.409028 562.088
## 105400 -37.26291 -8.409028 561.803
## 105401 -37.26263 -8.409028 562.251
## 105402 -37.26236 -8.409028 563.190
## 105403 -37.26208 -8.409028 564.413
## 105404 -37.26180 -8.409028 565.711
## 105405 -37.26152 -8.409028 566.608
## 105406 -37.26125 -8.409028 567.042
## 105407 -37.26097 -8.409028 566.862
## 105408 -37.26069 -8.409028 566.200
## 105409 -37.26041 -8.409028 565.495
## 105410 -37.26013 -8.409028 565.117
## 105411 -37.25986 -8.409028 565.157
## 105412 -37.25958 -8.409028 565.188
## 105413 -37.25930 -8.409028 565.164
## 105414 -37.25902 -8.409028 565.045
## 105415 -37.25875 -8.409028 564.846
## 105416 -37.25847 -8.409028 564.228
## 105417 -37.25819 -8.409028 563.212
## 105418 -37.25791 -8.409028 562.019
## 105419 -37.25763 -8.409028 561.214
## 105420 -37.25736 -8.409028 560.741
## 105421 -37.25708 -8.409028 560.366
## 105422 -37.25680 -8.409028 559.833
## 105423 -37.25652 -8.409028 558.931
## 105424 -37.25625 -8.409028 558.135
## 105425 -37.25597 -8.409028 557.504
## 105426 -37.25569 -8.409028 557.014
## 105427 -37.25541 -8.409028 556.881
## 105428 -37.25513 -8.409028 557.030
## 105429 -37.25486 -8.409028 557.930
## 105430 -37.25458 -8.409028 559.010
## 105431 -37.25430 -8.409028 560.230
## 105432 -37.25402 -8.409028 560.973
## 105433 -37.25375 -8.409028 561.748
## 105434 -37.25347 -8.409028 562.819
## 105435 -37.25319 -8.409028 564.393
## 105436 -37.25291 -8.409028 566.198
## 105437 -37.25263 -8.409028 568.173
## 105438 -37.25236 -8.409028 570.401
## 105439 -37.25208 -8.409028 572.492
## 105440 -37.25180 -8.409028 574.111
## 105441 -37.25152 -8.409028 575.016
## 105442 -37.25125 -8.409028 575.633
## 105443 -37.25097 -8.409028 576.121
## 105444 -37.25069 -8.409028 576.654
## 105445 -37.25041 -8.409028 577.121
## 105446 -37.25013 -8.409028 577.659
## 105447 -37.24986 -8.409028 578.736
## 105448 -37.24958 -8.409028 579.797
## 105449 -37.24930 -8.409028 580.805
## 105450 -37.24902 -8.409028 581.067
## 105451 -37.24875 -8.409028 580.943
## 105452 -37.24847 -8.409028 580.804
## 105453 -37.24819 -8.409028 580.960
## 105454 -37.24791 -8.409028 581.240
## 105455 -37.24763 -8.409028 581.422
## 105456 -37.24736 -8.409028 581.403
## 105457 -37.24708 -8.409028 581.577
## 105458 -37.24680 -8.409028 581.588
## 105459 -37.24652 -8.409028 581.919
## 105460 -37.24625 -8.409028 582.374
## 105461 -37.24597 -8.409028 582.961
## 105462 -37.24569 -8.409028 583.824
## 105463 -37.24541 -8.409028 584.883
## 105464 -37.24513 -8.409028 586.032
## 105465 -37.24486 -8.409028 587.291
## 105466 -37.24458 -8.409028 588.346
## 105467 -37.24430 -8.409028 589.276
## 105468 -37.24402 -8.409028 589.682
## 105469 -37.24375 -8.409028 590.065
## 105470 -37.24347 -8.409028 590.832
## 105471 -37.24319 -8.409028 592.010
## 105472 -37.24291 -8.409028 593.385
## 105473 -37.24263 -8.409028 594.706
## 105474 -37.24236 -8.409028 595.821
## 105475 -37.24208 -8.409028 597.337
## 105476 -37.24180 -8.409028 598.943
## 105477 -37.24152 -8.409028 601.263
## 105478 -37.24125 -8.409028 603.703
## 105479 -37.24097 -8.409028 605.852
## 105480 -37.24069 -8.409028 607.438
## 105481 -37.24041 -8.409028 608.490
## 105482 -37.24013 -8.409028 609.213
## 105483 -37.23986 -8.409028 610.017
## 105484 -37.23958 -8.409028 610.121
## 105485 -37.23930 -8.409028 609.934
## 105486 -37.23902 -8.409028 608.540
## 105487 -37.23875 -8.409028 606.575
## 105488 -37.23847 -8.409028 604.630
## 105489 -37.23819 -8.409028 602.838
## 105490 -37.23791 -8.409028 601.030
## 105491 -37.23763 -8.409028 598.741
## 105492 -37.23736 -8.409028 595.790
## 105493 -37.23708 -8.409028 593.157
## 105494 -37.23680 -8.409028 590.712
## 105495 -37.23652 -8.409028 589.007
## 105496 -37.23625 -8.409028 587.463
## 105497 -37.23597 -8.409028 586.137
## 105498 -37.23569 -8.409028 584.938
## 105499 -37.23541 -8.409028 583.820
## 105500 -37.23513 -8.409028 582.840
## 105501 -37.23486 -8.409028 581.904
## 105502 -37.23458 -8.409028 580.981
## 105503 -37.23430 -8.409028 579.752
## 105504 -37.23402 -8.409028 578.109
## 105505 -37.23375 -8.409028 576.194
## 105506 -37.23347 -8.409028 574.535
## 105507 -37.23319 -8.409028 573.373
## 105508 -37.23291 -8.409028 572.655
## 105509 -37.23263 -8.409028 572.556
## 105510 -37.23236 -8.409028 572.393
## 105511 -37.23208 -8.409028 572.764
## 105512 -37.23180 -8.409028 573.497
## 105513 -37.23152 -8.409028 574.598
## 105514 -37.23125 -8.409028 575.879
## 105515 -37.23097 -8.409028 577.373
## 105516 -37.23069 -8.409028 578.877
## 105517 -37.23041 -8.409028 580.128
## 105518 -37.23013 -8.409028 581.101
## 105519 -37.22986 -8.409028 581.025
## 105520 -37.22958 -8.409028 580.863
## 105521 -37.22930 -8.409028 580.615
## 105522 -37.22902 -8.409028 581.421
## 105523 -37.22875 -8.409028 582.462
## 105524 -37.22847 -8.409028 583.484
## 105525 -37.22819 -8.409028 583.881
## 105526 -37.22791 -8.409028 583.957
## 105527 -37.22763 -8.409028 583.636
## 105528 -37.22736 -8.409028 582.795
## 105529 -37.22708 -8.409028 581.756
## 105530 -37.22680 -8.409028 581.019
## 105531 -37.22652 -8.409028 580.978
## 105532 -37.22625 -8.409028 581.024
## 105533 -37.22597 -8.409028 580.693
## 105534 -37.22569 -8.409028 579.501
## 105535 -37.22541 -8.409028 578.019
## 105536 -37.22513 -8.409028 576.716
## 105537 -37.22486 -8.409028 576.054
## 105538 -37.22458 -8.409028 575.311
## 105539 -37.22430 -8.409028 574.171
## 105540 -37.22402 -8.409028 572.502
## 105541 -37.22375 -8.409028 571.112
## 106390 -37.36430 -8.409306 520.198
## 106391 -37.36402 -8.409306 520.710
## 106392 -37.36375 -8.409306 521.533
## 106393 -37.36347 -8.409306 522.330
## 106394 -37.36319 -8.409306 522.933
## 106395 -37.36291 -8.409306 523.353
## 106396 -37.36263 -8.409306 524.378
## 106397 -37.36236 -8.409306 526.195
## 106398 -37.36208 -8.409306 528.258
## 106399 -37.36180 -8.409306 530.039
## 106400 -37.36152 -8.409306 531.715
## 106401 -37.36125 -8.409306 533.040
## 106402 -37.36097 -8.409306 534.230
## 106403 -37.36069 -8.409306 535.580
## 106404 -37.36041 -8.409306 536.737
## 106405 -37.36013 -8.409306 537.610
## 106406 -37.35986 -8.409306 537.747
## 106407 -37.35958 -8.409306 537.677
## 106408 -37.35930 -8.409306 537.836
## 106409 -37.35902 -8.409306 538.340
## 106410 -37.35875 -8.409306 538.875
## 106411 -37.35847 -8.409306 539.415
## 106412 -37.35819 -8.409306 539.770
## 106413 -37.35791 -8.409306 539.795
## 106414 -37.35763 -8.409306 539.882
## 106415 -37.35736 -8.409306 540.322
## 106416 -37.35708 -8.409306 540.894
## 106417 -37.35680 -8.409306 541.208
## 106418 -37.35652 -8.409306 541.356
## 106419 -37.35625 -8.409306 541.290
## 106420 -37.35597 -8.409306 541.225
## 106421 -37.35569 -8.409306 541.277
## 106422 -37.35541 -8.409306 541.077
## 106423 -37.35513 -8.409306 540.695
## 106424 -37.35486 -8.409306 540.297
## 106425 -37.35458 -8.409306 539.814
## 106426 -37.35430 -8.409306 539.355
## 106427 -37.35402 -8.409306 538.483
## 106428 -37.35375 -8.409306 537.871
## 106429 -37.35347 -8.409306 537.608
## 106430 -37.35319 -8.409306 538.161
## 106431 -37.35291 -8.409306 538.731
## 106432 -37.35263 -8.409306 539.189
## 106433 -37.35236 -8.409306 538.670
## 106434 -37.35208 -8.409306 538.018
## 106435 -37.35180 -8.409306 537.507
## 106436 -37.35152 -8.409306 538.128
## 106437 -37.35125 -8.409306 539.036
## 106438 -37.35097 -8.409306 540.175
## 106439 -37.35069 -8.409306 540.925
## 106440 -37.35041 -8.409306 542.213
## 106441 -37.35013 -8.409306 542.821
## 106442 -37.34986 -8.409306 543.648
## 106443 -37.34958 -8.409306 544.355
## 106444 -37.34930 -8.409306 545.261
## 106445 -37.34902 -8.409306 546.133
## 106446 -37.34875 -8.409306 546.865
## 106447 -37.34847 -8.409306 547.563
## 106448 -37.34819 -8.409306 547.864
## 106449 -37.34791 -8.409306 548.035
## 106450 -37.34763 -8.409306 547.747
## 106451 -37.34736 -8.409306 547.360
## 106452 -37.34708 -8.409306 546.853
## 106453 -37.34680 -8.409306 546.715
## 106454 -37.34652 -8.409306 546.955
## 106455 -37.34625 -8.409306 547.228
## 106456 -37.34597 -8.409306 547.721
## 106457 -37.34569 -8.409306 548.365
## 106458 -37.34541 -8.409306 548.576
## 106459 -37.34513 -8.409306 548.733
## 106460 -37.34486 -8.409306 548.521
## 106461 -37.34458 -8.409306 548.438
## 106462 -37.34430 -8.409306 548.185
## 106463 -37.34402 -8.409306 548.114
## 106464 -37.34375 -8.409306 548.418
## 106465 -37.34347 -8.409306 548.784
## 106466 -37.34319 -8.409306 549.649
## 106467 -37.34291 -8.409306 550.434
## 106468 -37.34263 -8.409306 550.690
## 106469 -37.34236 -8.409306 550.505
## 106470 -37.34208 -8.409306 550.088
## 106471 -37.34180 -8.409306 549.926
## 106472 -37.34152 -8.409306 549.895
## 106473 -37.34125 -8.409306 550.445
## 106474 -37.34097 -8.409306 551.250
## 106475 -37.34069 -8.409306 552.463
## 106476 -37.34041 -8.409306 553.690
## 106477 -37.34013 -8.409306 554.726
## 106478 -37.33986 -8.409306 555.656
## 106479 -37.33958 -8.409306 556.379
## 106480 -37.33930 -8.409306 556.898
## 106481 -37.33902 -8.409306 557.130
## 106482 -37.33875 -8.409306 556.951
## 106483 -37.33847 -8.409306 556.593
## 106484 -37.33819 -8.409306 555.384
## 106485 -37.33791 -8.409306 554.206
## 106486 -37.33763 -8.409306 553.039
## 106487 -37.33736 -8.409306 553.003
## 106488 -37.33708 -8.409306 553.401
## 106489 -37.33680 -8.409306 553.622
## 106490 -37.33652 -8.409306 553.557
## 106491 -37.33625 -8.409306 553.631
## 106492 -37.33597 -8.409306 554.021
## 106493 -37.33569 -8.409306 554.682
## 106494 -37.33541 -8.409306 555.210
## 106495 -37.33513 -8.409306 555.578
## 106496 -37.33486 -8.409306 554.990
## 106497 -37.33458 -8.409306 554.314
## 106498 -37.33430 -8.409306 553.439
## 106499 -37.33402 -8.409306 553.334
## 106500 -37.33375 -8.409306 553.632
## 106501 -37.33347 -8.409306 553.905
## 106502 -37.33319 -8.409306 553.863
## 106503 -37.33291 -8.409306 553.710
## 106504 -37.33263 -8.409306 553.548
## 106505 -37.33236 -8.409306 553.804
## 106506 -37.33208 -8.409306 553.844
## 106507 -37.33180 -8.409306 553.907
## 106508 -37.33152 -8.409306 553.608
## 106509 -37.33125 -8.409306 553.167
## 106510 -37.33097 -8.409306 552.894
## 106511 -37.33069 -8.409306 552.366
## 106512 -37.33041 -8.409306 552.158
## 106513 -37.33013 -8.409306 551.317
## 106514 -37.32986 -8.409306 550.614
## 106515 -37.32958 -8.409306 550.046
## 106516 -37.32930 -8.409306 549.710
## 106517 -37.32902 -8.409306 550.021
## 106518 -37.32875 -8.409306 550.622
## 106519 -37.32847 -8.409306 551.683
## 106520 -37.32819 -8.409306 552.435
## 106521 -37.32791 -8.409306 553.151
## 106522 -37.32763 -8.409306 553.891
## 106523 -37.32736 -8.409306 554.942
## 106524 -37.32708 -8.409306 555.992
## 106525 -37.32680 -8.409306 557.170
## 106526 -37.32652 -8.409306 558.010
## 106527 -37.32625 -8.409306 558.963
## 106528 -37.32597 -8.409306 559.507
## 106529 -37.32569 -8.409306 559.541
## 106530 -37.32541 -8.409306 559.385
## 106531 -37.32513 -8.409306 559.262
## 106532 -37.32486 -8.409306 559.259
## 106533 -37.32458 -8.409306 559.392
## 106534 -37.32430 -8.409306 559.167
## 106535 -37.32402 -8.409306 559.160
## 106536 -37.32375 -8.409306 559.103
## 106537 -37.32347 -8.409306 559.210
## 106538 -37.32319 -8.409306 559.394
## 106539 -37.32291 -8.409306 559.849
## 106540 -37.32263 -8.409306 560.804
## 106541 -37.32236 -8.409306 561.422
## 106542 -37.32208 -8.409306 561.889
## 106543 -37.32180 -8.409306 561.990
## 106544 -37.32152 -8.409306 562.206
## 106545 -37.32125 -8.409306 562.547
## 106546 -37.32097 -8.409306 562.778
## 106547 -37.32069 -8.409306 562.588
## 106548 -37.32041 -8.409306 562.623
## 106549 -37.32013 -8.409306 562.619
## 106550 -37.31986 -8.409306 562.583
## 106551 -37.31958 -8.409306 562.595
## 106552 -37.31930 -8.409306 562.305
## 106553 -37.31902 -8.409306 562.539
## 106554 -37.31875 -8.409306 563.125
## 106555 -37.31847 -8.409306 563.990
## 106556 -37.31819 -8.409306 564.640
## 106557 -37.31791 -8.409306 565.064
## 106558 -37.31763 -8.409306 565.452
## 106559 -37.31736 -8.409306 565.517
## 106560 -37.31708 -8.409306 565.557
## 106561 -37.31680 -8.409306 565.471
## 106562 -37.31652 -8.409306 565.293
## 106563 -37.31625 -8.409306 565.121
## 106564 -37.31597 -8.409306 564.872
## 106565 -37.31569 -8.409306 564.272
## 106566 -37.31541 -8.409306 563.856
## 106567 -37.31513 -8.409306 562.685
## 106568 -37.31486 -8.409306 561.863
## 106569 -37.31458 -8.409306 561.481
## 106570 -37.31430 -8.409306 561.668
## 106571 -37.31402 -8.409306 562.391
## 106572 -37.31375 -8.409306 563.024
## 106573 -37.31347 -8.409306 564.045
## 106574 -37.31319 -8.409306 564.124
## 106575 -37.31291 -8.409306 563.553
## 106576 -37.31263 -8.409306 562.749
## 106577 -37.31236 -8.409306 562.125
## 106578 -37.31208 -8.409306 561.466
## 106579 -37.31180 -8.409306 560.098
## 106580 -37.31152 -8.409306 558.215
## 106581 -37.31125 -8.409306 556.067
## 106582 -37.31097 -8.409306 554.030
## 106583 -37.31069 -8.409306 551.346
## 106584 -37.31041 -8.409306 549.008
## 106585 -37.31013 -8.409306 547.530
## 106586 -37.30986 -8.409306 548.109
## 106587 -37.30958 -8.409306 549.503
## 106588 -37.30930 -8.409306 551.061
## 106589 -37.30902 -8.409306 552.359
## 106590 -37.30875 -8.409306 553.673
## 106591 -37.30847 -8.409306 555.136
## 106592 -37.30819 -8.409306 557.030
## 106593 -37.30791 -8.409306 558.911
## 106594 -37.30763 -8.409306 560.866
## 106595 -37.30736 -8.409306 562.741
## 106596 -37.30708 -8.409306 564.252
## 106597 -37.30680 -8.409306 565.877
## 106598 -37.30652 -8.409306 566.598
## 106599 -37.30625 -8.409306 566.901
## 106600 -37.30597 -8.409306 566.757
## 106601 -37.30569 -8.409306 566.318
## 106602 -37.30541 -8.409306 565.867
## 106603 -37.30513 -8.409306 564.931
## 106604 -37.30486 -8.409306 563.759
## 106605 -37.30458 -8.409306 562.343
## 106606 -37.30430 -8.409306 561.018
## 106607 -37.30402 -8.409306 559.313
## 106608 -37.30375 -8.409306 558.093
## 106609 -37.30347 -8.409306 557.810
## 106610 -37.30319 -8.409306 559.863
## 106611 -37.30291 -8.409306 561.923
## 106612 -37.30263 -8.409306 564.243
## 106613 -37.30236 -8.409306 564.761
## 106614 -37.30208 -8.409306 564.770
## 106615 -37.30180 -8.409306 564.729
## 106616 -37.30152 -8.409306 564.943
## 106617 -37.30125 -8.409306 565.198
## 106618 -37.30097 -8.409306 565.137
## 106619 -37.30069 -8.409306 564.922
## 106620 -37.30041 -8.409306 564.439
## 106621 -37.30013 -8.409306 563.382
## 106622 -37.29986 -8.409306 561.936
## 106623 -37.29958 -8.409306 560.201
## 106624 -37.29930 -8.409306 558.982
## 106625 -37.29902 -8.409306 558.113
## 106626 -37.29875 -8.409306 557.560
## 106627 -37.29847 -8.409306 557.437
## 106628 -37.29819 -8.409306 557.700
## 106629 -37.29791 -8.409306 558.104
## 106630 -37.29763 -8.409306 558.320
## 106631 -37.29736 -8.409306 558.321
## 106632 -37.29708 -8.409306 558.313
## 106633 -37.29680 -8.409306 559.006
## 106634 -37.29652 -8.409306 560.110
## 106635 -37.29625 -8.409306 560.927
## 106636 -37.29597 -8.409306 561.391
## 106637 -37.29569 -8.409306 560.754
## 106638 -37.29541 -8.409306 559.012
## 106639 -37.29513 -8.409306 557.931
## 106640 -37.29486 -8.409306 557.629
## 106641 -37.29458 -8.409306 557.614
## 106642 -37.29430 -8.409306 557.751
## 106643 -37.29402 -8.409306 557.236
## 106644 -37.29375 -8.409306 556.905
## 106645 -37.29347 -8.409306 556.480
## 106646 -37.29319 -8.409306 556.238
## 106647 -37.29291 -8.409306 556.687
## 106648 -37.29263 -8.409306 557.068
## 106649 -37.29236 -8.409306 557.942
## 106650 -37.29208 -8.409306 558.679
## 106651 -37.29180 -8.409306 559.932
## 106652 -37.29152 -8.409306 560.932
## 106653 -37.29125 -8.409306 561.593
## 106654 -37.29097 -8.409306 562.140
## 106655 -37.29069 -8.409306 561.712
## 106656 -37.29041 -8.409306 560.906
## 106657 -37.29013 -8.409306 559.959
## 106658 -37.28986 -8.409306 559.226
## 106659 -37.28958 -8.409306 558.855
## 106660 -37.28930 -8.409306 558.273
## 106661 -37.28902 -8.409306 557.854
## 106662 -37.28875 -8.409306 557.554
## 106663 -37.28847 -8.409306 557.483
## 106664 -37.28819 -8.409306 557.182
## 106665 -37.28791 -8.409306 556.924
## 106666 -37.28763 -8.409306 556.919
## 106667 -37.28736 -8.409306 557.470
## 106668 -37.28708 -8.409306 558.263
## 106669 -37.28680 -8.409306 558.804
## 106670 -37.28652 -8.409306 559.127
## 106671 -37.28625 -8.409306 559.490
## 106672 -37.28597 -8.409306 560.103
## 106673 -37.28569 -8.409306 561.297
## 106674 -37.28541 -8.409306 562.089
## 106675 -37.28513 -8.409306 562.529
## 106676 -37.28486 -8.409306 562.054
## 106677 -37.28458 -8.409306 561.268
## 106678 -37.28430 -8.409306 560.297
## 106679 -37.28402 -8.409306 559.497
## 106680 -37.28375 -8.409306 558.847
## 106681 -37.28347 -8.409306 558.454
## 106682 -37.28319 -8.409306 558.367
## 106683 -37.28291 -8.409306 558.388
## 106684 -37.28263 -8.409306 558.278
## 106685 -37.28236 -8.409306 558.318
## 106686 -37.28208 -8.409306 558.416
## 106687 -37.28180 -8.409306 558.713
## 106688 -37.28152 -8.409306 559.012
## 106689 -37.28125 -8.409306 559.453
## 106690 -37.28097 -8.409306 560.644
## 106691 -37.28069 -8.409306 562.422
## 106692 -37.28041 -8.409306 563.913
## 106693 -37.28013 -8.409306 564.915
## 106694 -37.27986 -8.409306 564.937
## 106695 -37.27958 -8.409306 564.904
## 106696 -37.27930 -8.409306 564.971
## 106697 -37.27902 -8.409306 566.072
## 106698 -37.27875 -8.409306 567.443
## 106699 -37.27847 -8.409306 569.032
## 106700 -37.27819 -8.409306 570.270
## 106701 -37.27791 -8.409306 571.510
## 106702 -37.27763 -8.409306 572.771
## 106703 -37.27736 -8.409306 573.985
## 106704 -37.27708 -8.409306 575.055
## 106705 -37.27680 -8.409306 575.798
## 106706 -37.27652 -8.409306 576.476
## 106707 -37.27625 -8.409306 577.152
## 106708 -37.27597 -8.409306 577.567
## 106709 -37.27569 -8.409306 577.678
## 106710 -37.27541 -8.409306 577.842
## 106711 -37.27513 -8.409306 578.016
## 106712 -37.27486 -8.409306 577.745
## 106713 -37.27458 -8.409306 577.247
## 106714 -37.27430 -8.409306 576.355
## 106715 -37.27402 -8.409306 575.291
## 106716 -37.27375 -8.409306 574.356
## 106717 -37.27347 -8.409306 573.217
## 106718 -37.27319 -8.409306 572.164
## 106719 -37.27291 -8.409306 571.601
## 106720 -37.27263 -8.409306 570.871
## 106721 -37.27236 -8.409306 570.263
## 106722 -37.27208 -8.409306 569.519
## 106723 -37.27180 -8.409306 569.351
## 106724 -37.27152 -8.409306 568.985
## 106725 -37.27125 -8.409306 568.874
## 106726 -37.27097 -8.409306 568.794
## 106727 -37.27069 -8.409306 568.908
## 106728 -37.27041 -8.409306 569.022
## 106729 -37.27013 -8.409306 568.784
## 106730 -37.26986 -8.409306 568.025
## 106731 -37.26958 -8.409306 567.280
## 106732 -37.26930 -8.409306 566.047
## 106733 -37.26902 -8.409306 564.901
## 106734 -37.26875 -8.409306 564.210
## 106735 -37.26847 -8.409306 564.170
## 106736 -37.26819 -8.409306 565.609
## 106737 -37.26791 -8.409306 567.416
## 106738 -37.26763 -8.409306 569.278
## 106739 -37.26736 -8.409306 569.976
## 106740 -37.26708 -8.409306 570.170
## 106741 -37.26680 -8.409306 569.755
## 106742 -37.26652 -8.409306 569.299
## 106743 -37.26625 -8.409306 568.721
## 106744 -37.26597 -8.409306 568.122
## 106745 -37.26569 -8.409306 567.854
## 106746 -37.26541 -8.409306 567.511
## 106747 -37.26513 -8.409306 567.407
## 106748 -37.26486 -8.409306 567.115
## 106749 -37.26458 -8.409306 566.888
## 106750 -37.26430 -8.409306 566.106
## 106751 -37.26402 -8.409306 565.230
## 106752 -37.26375 -8.409306 564.171
## 106753 -37.26347 -8.409306 563.014
## 106754 -37.26319 -8.409306 562.380
## 106755 -37.26291 -8.409306 562.004
## 106756 -37.26263 -8.409306 562.433
## 106757 -37.26236 -8.409306 563.213
## 106758 -37.26208 -8.409306 564.284
## 106759 -37.26180 -8.409306 565.392
## 106760 -37.26152 -8.409306 566.427
## 106761 -37.26125 -8.409306 567.150
## 106762 -37.26097 -8.409306 567.048
## 106763 -37.26069 -8.409306 566.331
## 106764 -37.26041 -8.409306 565.557
## 106765 -37.26013 -8.409306 565.375
## 106766 -37.25986 -8.409306 565.631
## 106767 -37.25958 -8.409306 565.997
## 106768 -37.25930 -8.409306 566.090
## 106769 -37.25902 -8.409306 565.956
## 106770 -37.25875 -8.409306 565.664
## 106771 -37.25847 -8.409306 564.930
## 106772 -37.25819 -8.409306 563.749
## 106773 -37.25791 -8.409306 562.599
## 106774 -37.25763 -8.409306 561.773
## 106775 -37.25736 -8.409306 561.369
## 106776 -37.25708 -8.409306 560.941
## 106777 -37.25680 -8.409306 560.527
## 106778 -37.25652 -8.409306 559.357
## 106779 -37.25625 -8.409306 558.551
## 106780 -37.25597 -8.409306 557.775
## 106781 -37.25569 -8.409306 557.485
## 106782 -37.25541 -8.409306 557.725
## 106783 -37.25513 -8.409306 557.835
## 106784 -37.25486 -8.409306 558.260
## 106785 -37.25458 -8.409306 558.938
## 106786 -37.25430 -8.409306 559.340
## 106787 -37.25402 -8.409306 559.972
## 106788 -37.25375 -8.409306 560.625
## 106789 -37.25347 -8.409306 561.625
## 106790 -37.25319 -8.409306 563.732
## 106791 -37.25291 -8.409306 565.969
## 106792 -37.25263 -8.409306 568.467
## 106793 -37.25236 -8.409306 570.241
## 106794 -37.25208 -8.409306 571.808
## 106795 -37.25180 -8.409306 573.034
## 106796 -37.25152 -8.409306 574.354
## 106797 -37.25125 -8.409306 575.308
## 106798 -37.25097 -8.409306 576.005
## 106799 -37.25069 -8.409306 576.065
## 106800 -37.25041 -8.409306 576.097
## 106801 -37.25013 -8.409306 576.346
## 106802 -37.24986 -8.409306 577.477
## 106803 -37.24958 -8.409306 578.546
## 106804 -37.24930 -8.409306 579.565
## 106805 -37.24902 -8.409306 580.042
## 106806 -37.24875 -8.409306 580.293
## 106807 -37.24847 -8.409306 580.475
## 106808 -37.24819 -8.409306 580.328
## 106809 -37.24791 -8.409306 580.452
## 106810 -37.24763 -8.409306 580.614
## 106811 -37.24736 -8.409306 581.098
## 106812 -37.24708 -8.409306 581.707
## 106813 -37.24680 -8.409306 582.356
## 106814 -37.24652 -8.409306 582.559
## 106815 -37.24625 -8.409306 582.927
## 106816 -37.24597 -8.409306 583.329
## 106817 -37.24569 -8.409306 584.216
## 106818 -37.24541 -8.409306 585.365
## 106819 -37.24513 -8.409306 586.578
## 106820 -37.24486 -8.409306 587.544
## 106821 -37.24458 -8.409306 588.368
## 106822 -37.24430 -8.409306 589.167
## 106823 -37.24402 -8.409306 589.840
## 106824 -37.24375 -8.409306 590.591
## 106825 -37.24347 -8.409306 591.657
## 106826 -37.24319 -8.409306 592.620
## 106827 -37.24291 -8.409306 594.165
## 106828 -37.24263 -8.409306 595.704
## 106829 -37.24236 -8.409306 597.321
## 106830 -37.24208 -8.409306 599.164
## 106831 -37.24180 -8.409306 601.341
## 106832 -37.24152 -8.409306 603.939
## 106833 -37.24125 -8.409306 606.422
## 106834 -37.24097 -8.409306 608.945
## 106835 -37.24069 -8.409306 611.252
## 106836 -37.24041 -8.409306 612.670
## 106837 -37.24013 -8.409306 613.828
## 106838 -37.23986 -8.409306 614.544
## 106839 -37.23958 -8.409306 614.814
## 106840 -37.23930 -8.409306 614.226
## 106841 -37.23902 -8.409306 613.204
## 106842 -37.23875 -8.409306 611.768
## 106843 -37.23847 -8.409306 609.669
## 106844 -37.23819 -8.409306 606.549
## 106845 -37.23791 -8.409306 603.551
## 106846 -37.23763 -8.409306 600.371
## 106847 -37.23736 -8.409306 597.458
## 106848 -37.23708 -8.409306 594.616
## 106849 -37.23680 -8.409306 592.218
## 106850 -37.23652 -8.409306 590.561
## 106851 -37.23625 -8.409306 589.155
## 106852 -37.23597 -8.409306 587.819
## 106853 -37.23569 -8.409306 586.044
## 106854 -37.23541 -8.409306 584.289
## 106855 -37.23513 -8.409306 582.834
## 106856 -37.23486 -8.409306 581.943
## 106857 -37.23458 -8.409306 581.052
## 106858 -37.23430 -8.409306 580.040
## 106859 -37.23402 -8.409306 578.502
## 106860 -37.23375 -8.409306 577.019
## 106861 -37.23347 -8.409306 575.356
## 106862 -37.23319 -8.409306 573.456
## 106863 -37.23291 -8.409306 572.477
## 106864 -37.23263 -8.409306 571.588
## 106865 -37.23236 -8.409306 571.699
## 106866 -37.23208 -8.409306 572.320
## 106867 -37.23180 -8.409306 573.149
## 106868 -37.23152 -8.409306 574.385
## 106869 -37.23125 -8.409306 575.798
## 106870 -37.23097 -8.409306 577.484
## 106871 -37.23069 -8.409306 578.822
## 106872 -37.23041 -8.409306 580.073
## 106873 -37.23013 -8.409306 580.952
## 106874 -37.22986 -8.409306 581.451
## 106875 -37.22958 -8.409306 581.727
## 106876 -37.22930 -8.409306 581.982
## 106877 -37.22902 -8.409306 581.857
## 106878 -37.22875 -8.409306 582.342
## 106879 -37.22847 -8.409306 582.965
## 106880 -37.22819 -8.409306 583.669
## 106881 -37.22791 -8.409306 584.126
## 106882 -37.22763 -8.409306 584.005
## 106883 -37.22736 -8.409306 583.264
## 106884 -37.22708 -8.409306 582.381
## 106885 -37.22680 -8.409306 581.775
## 106886 -37.22652 -8.409306 581.659
## 106887 -37.22625 -8.409306 581.407
## 106888 -37.22597 -8.409306 581.043
## 106889 -37.22569 -8.409306 580.133
## 106890 -37.22541 -8.409306 578.599
## 106891 -37.22513 -8.409306 577.390
## 106892 -37.22486 -8.409306 576.596
## 106893 -37.22458 -8.409306 575.659
## 106894 -37.22430 -8.409306 574.505
## 106895 -37.22402 -8.409306 572.898
## 106896 -37.22375 -8.409306 571.416
## 107744 -37.36458 -8.409583 520.327
## 107745 -37.36430 -8.409583 520.572
## 107746 -37.36402 -8.409583 521.376
## 107747 -37.36375 -8.409583 522.315
## 107748 -37.36347 -8.409583 523.138
## 107749 -37.36319 -8.409583 523.563
## 107750 -37.36291 -8.409583 523.977
## 107751 -37.36263 -8.409583 524.731
## 107752 -37.36236 -8.409583 526.173
## 107753 -37.36208 -8.409583 527.930
## 107754 -37.36180 -8.409583 529.761
## 107755 -37.36152 -8.409583 531.419
## 107756 -37.36125 -8.409583 532.980
## 107757 -37.36097 -8.409583 534.453
## 107758 -37.36069 -8.409583 536.026
## 107759 -37.36041 -8.409583 537.395
## 107760 -37.36013 -8.409583 538.408
## 107761 -37.35986 -8.409583 538.782
## 107762 -37.35958 -8.409583 538.926
## 107763 -37.35930 -8.409583 539.028
## 107764 -37.35902 -8.409583 539.432
## 107765 -37.35875 -8.409583 539.938
## 107766 -37.35847 -8.409583 540.468
## 107767 -37.35819 -8.409583 540.749
## 107768 -37.35791 -8.409583 541.064
## 107769 -37.35763 -8.409583 541.620
## 107770 -37.35736 -8.409583 542.200
## 107771 -37.35708 -8.409583 542.930
## 107772 -37.35680 -8.409583 543.481
## 107773 -37.35652 -8.409583 543.662
## 107774 -37.35625 -8.409583 543.614
## 107775 -37.35597 -8.409583 543.406
## 107776 -37.35569 -8.409583 543.186
## 107777 -37.35541 -8.409583 542.879
## 107778 -37.35513 -8.409583 542.510
## 107779 -37.35486 -8.409583 542.096
## 107780 -37.35458 -8.409583 541.620
## 107781 -37.35430 -8.409583 541.036
## 107782 -37.35402 -8.409583 540.257
## 107783 -37.35375 -8.409583 539.649
## 107784 -37.35347 -8.409583 539.375
## 107785 -37.35319 -8.409583 539.902
## 107786 -37.35291 -8.409583 540.508
## 107787 -37.35263 -8.409583 540.811
## 107788 -37.35236 -8.409583 540.236
## 107789 -37.35208 -8.409583 539.511
## 107790 -37.35180 -8.409583 539.031
## 107791 -37.35152 -8.409583 539.498
## 107792 -37.35125 -8.409583 540.486
## 107793 -37.35097 -8.409583 541.651
## 107794 -37.35069 -8.409583 542.740
## 107795 -37.35041 -8.409583 543.695
## 107796 -37.35013 -8.409583 544.540
## 107797 -37.34986 -8.409583 545.282
## 107798 -37.34958 -8.409583 545.945
## 107799 -37.34930 -8.409583 546.622
## 107800 -37.34902 -8.409583 547.398
## 107801 -37.34875 -8.409583 548.114
## 107802 -37.34847 -8.409583 548.595
## 107803 -37.34819 -8.409583 548.969
## 107804 -37.34791 -8.409583 549.048
## 107805 -37.34763 -8.409583 548.953
## 107806 -37.34736 -8.409583 548.736
## 107807 -37.34708 -8.409583 548.494
## 107808 -37.34680 -8.409583 548.337
## 107809 -37.34652 -8.409583 548.349
## 107810 -37.34625 -8.409583 548.515
## 107811 -37.34597 -8.409583 548.864
## 107812 -37.34569 -8.409583 549.331
## 107813 -37.34541 -8.409583 549.796
## 107814 -37.34513 -8.409583 550.072
## 107815 -37.34486 -8.409583 549.984
## 107816 -37.34458 -8.409583 549.802
## 107817 -37.34430 -8.409583 549.681
## 107818 -37.34402 -8.409583 549.787
## 107819 -37.34375 -8.409583 550.084
## 107820 -37.34347 -8.409583 550.600
## 107821 -37.34319 -8.409583 551.209
## 107822 -37.34291 -8.409583 551.801
## 107823 -37.34263 -8.409583 552.145
## 107824 -37.34236 -8.409583 552.046
## 107825 -37.34208 -8.409583 551.769
## 107826 -37.34180 -8.409583 551.478
## 107827 -37.34152 -8.409583 551.337
## 107828 -37.34125 -8.409583 551.461
## 107829 -37.34097 -8.409583 551.949
## 107830 -37.34069 -8.409583 553.038
## 107831 -37.34041 -8.409583 554.335
## 107832 -37.34013 -8.409583 555.615
## 107833 -37.33986 -8.409583 556.568
## 107834 -37.33958 -8.409583 557.258
## 107835 -37.33930 -8.409583 557.633
## 107836 -37.33902 -8.409583 557.751
## 107837 -37.33875 -8.409583 557.479
## 107838 -37.33847 -8.409583 556.765
## 107839 -37.33819 -8.409583 555.421
## 107840 -37.33791 -8.409583 554.049
## 107841 -37.33763 -8.409583 553.125
## 107842 -37.33736 -8.409583 553.278
## 107843 -37.33708 -8.409583 553.840
## 107844 -37.33680 -8.409583 554.405
## 107845 -37.33652 -8.409583 554.570
## 107846 -37.33625 -8.409583 554.706
## 107847 -37.33597 -8.409583 554.938
## 107848 -37.33569 -8.409583 555.605
## 107849 -37.33541 -8.409583 556.183
## 107850 -37.33513 -8.409583 556.393
## 107851 -37.33486 -8.409583 555.818
## 107852 -37.33458 -8.409583 555.051
## 107853 -37.33430 -8.409583 554.493
## 107854 -37.33402 -8.409583 554.587
## 107855 -37.33375 -8.409583 554.898
## 107856 -37.33347 -8.409583 555.255
## 107857 -37.33319 -8.409583 555.212
## 107858 -37.33291 -8.409583 555.105
## 107859 -37.33263 -8.409583 555.020
## 107860 -37.33236 -8.409583 555.121
## 107861 -37.33208 -8.409583 555.182
## 107862 -37.33180 -8.409583 555.227
## 107863 -37.33152 -8.409583 554.830
## 107864 -37.33125 -8.409583 554.383
## 107865 -37.33097 -8.409583 553.858
## 107866 -37.33069 -8.409583 553.282
## 107867 -37.33041 -8.409583 552.704
## 107868 -37.33013 -8.409583 552.129
## 107869 -37.32986 -8.409583 551.586
## 107870 -37.32958 -8.409583 551.192
## 107871 -37.32930 -8.409583 551.056
## 107872 -37.32902 -8.409583 551.289
## 107873 -37.32875 -8.409583 551.749
## 107874 -37.32847 -8.409583 552.362
## 107875 -37.32819 -8.409583 552.910
## 107876 -37.32791 -8.409583 553.557
## 107877 -37.32763 -8.409583 554.364
## 107878 -37.32736 -8.409583 555.458
## 107879 -37.32708 -8.409583 556.646
## 107880 -37.32680 -8.409583 557.849
## 107881 -37.32652 -8.409583 559.010
## 107882 -37.32625 -8.409583 559.969
## 107883 -37.32597 -8.409583 560.633
## 107884 -37.32569 -8.409583 560.707
## 107885 -37.32541 -8.409583 560.554
## 107886 -37.32513 -8.409583 560.328
## 107887 -37.32486 -8.409583 560.222
## 107888 -37.32458 -8.409583 560.168
## 107889 -37.32430 -8.409583 560.180
## 107890 -37.32402 -8.409583 560.301
## 107891 -37.32375 -8.409583 560.487
## 107892 -37.32347 -8.409583 560.735
## 107893 -37.32319 -8.409583 561.025
## 107894 -37.32291 -8.409583 561.330
## 107895 -37.32263 -8.409583 561.618
## 107896 -37.32236 -8.409583 561.830
## 107897 -37.32208 -8.409583 562.017
## 107898 -37.32180 -8.409583 562.228
## 107899 -37.32152 -8.409583 562.530
## 107900 -37.32125 -8.409583 562.815
## 107901 -37.32097 -8.409583 563.011
## 107902 -37.32069 -8.409583 562.972
## 107903 -37.32041 -8.409583 562.865
## 107904 -37.32013 -8.409583 562.777
## 107905 -37.31986 -8.409583 562.815
## 107906 -37.31958 -8.409583 562.977
## 107907 -37.31930 -8.409583 563.297
## 107908 -37.31902 -8.409583 563.849
## 107909 -37.31875 -8.409583 564.471
## 107910 -37.31847 -8.409583 565.090
## 107911 -37.31819 -8.409583 565.626
## 107912 -37.31791 -8.409583 565.998
## 107913 -37.31763 -8.409583 566.132
## 107914 -37.31736 -8.409583 565.797
## 107915 -37.31708 -8.409583 565.388
## 107916 -37.31680 -8.409583 565.040
## 107917 -37.31652 -8.409583 565.042
## 107918 -37.31625 -8.409583 565.117
## 107919 -37.31597 -8.409583 565.119
## 107920 -37.31569 -8.409583 564.948
## 107921 -37.31541 -8.409583 564.643
## 107922 -37.31513 -8.409583 564.253
## 107923 -37.31486 -8.409583 563.922
## 107924 -37.31458 -8.409583 563.739
## 107925 -37.31430 -8.409583 563.837
## 107926 -37.31402 -8.409583 564.251
## 107927 -37.31375 -8.409583 564.733
## 107928 -37.31347 -8.409583 565.100
## 107929 -37.31319 -8.409583 564.926
## 107930 -37.31291 -8.409583 564.539
## 107931 -37.31263 -8.409583 564.052
## 107932 -37.31236 -8.409583 563.729
## 107933 -37.31208 -8.409583 563.117
## 107934 -37.31180 -8.409583 561.940
## 107935 -37.31152 -8.409583 560.000
## 107936 -37.31125 -8.409583 557.587
## 107937 -37.31097 -8.409583 554.928
## 107938 -37.31069 -8.409583 551.977
## 107939 -37.31041 -8.409583 549.595
## 107940 -37.31013 -8.409583 548.350
## 107941 -37.30986 -8.409583 548.958
## 107942 -37.30958 -8.409583 550.462
## 107943 -37.30930 -8.409583 552.232
## 107944 -37.30902 -8.409583 553.668
## 107945 -37.30875 -8.409583 555.058
## 107946 -37.30847 -8.409583 556.470
## 107947 -37.30819 -8.409583 558.071
## 107948 -37.30791 -8.409583 559.759
## 107949 -37.30763 -8.409583 561.539
## 107950 -37.30736 -8.409583 563.403
## 107951 -37.30708 -8.409583 565.093
## 107952 -37.30680 -8.409583 566.406
## 107953 -37.30652 -8.409583 567.162
## 107954 -37.30625 -8.409583 567.529
## 107955 -37.30597 -8.409583 567.601
## 107956 -37.30569 -8.409583 567.516
## 107957 -37.30541 -8.409583 567.181
## 107958 -37.30513 -8.409583 566.532
## 107959 -37.30486 -8.409583 565.607
## 107960 -37.30458 -8.409583 564.336
## 107961 -37.30430 -8.409583 562.804
## 107962 -37.30402 -8.409583 560.623
## 107963 -37.30375 -8.409583 558.898
## 107964 -37.30347 -8.409583 558.266
## 107965 -37.30319 -8.409583 559.936
## 107966 -37.30291 -8.409583 562.312
## 107967 -37.30263 -8.409583 564.473
## 107968 -37.30236 -8.409583 565.276
## 107969 -37.30208 -8.409583 565.496
## 107970 -37.30180 -8.409583 565.524
## 107971 -37.30152 -8.409583 565.768
## 107972 -37.30125 -8.409583 565.946
## 107973 -37.30097 -8.409583 565.965
## 107974 -37.30069 -8.409583 565.727
## 107975 -37.30041 -8.409583 565.167
## 107976 -37.30013 -8.409583 564.219
## 107977 -37.29986 -8.409583 562.806
## 107978 -37.29958 -8.409583 561.276
## 107979 -37.29930 -8.409583 559.901
## 107980 -37.29902 -8.409583 558.914
## 107981 -37.29875 -8.409583 558.316
## 107982 -37.29847 -8.409583 558.134
## 107983 -37.29819 -8.409583 558.438
## 107984 -37.29791 -8.409583 558.940
## 107985 -37.29763 -8.409583 559.417
## 107986 -37.29736 -8.409583 559.607
## 107987 -37.29708 -8.409583 559.785
## 107988 -37.29680 -8.409583 560.110
## 107989 -37.29652 -8.409583 560.673
## 107990 -37.29625 -8.409583 561.147
## 107991 -37.29597 -8.409583 561.155
## 107992 -37.29569 -8.409583 560.134
## 107993 -37.29541 -8.409583 558.823
## 107994 -37.29513 -8.409583 557.716
## 107995 -37.29486 -8.409583 557.492
## 107996 -37.29458 -8.409583 557.572
## 107997 -37.29430 -8.409583 557.662
## 107998 -37.29402 -8.409583 557.444
## 107999 -37.29375 -8.409583 557.196
## 108000 -37.29347 -8.409583 557.008
## 108001 -37.29319 -8.409583 556.995
## 108002 -37.29291 -8.409583 557.210
## 108003 -37.29263 -8.409583 557.702
## 108004 -37.29236 -8.409583 558.508
## 108005 -37.29208 -8.409583 559.471
## 108006 -37.29180 -8.409583 560.478
## 108007 -37.29152 -8.409583 561.365
## 108008 -37.29125 -8.409583 561.961
## 108009 -37.29097 -8.409583 562.136
## 108010 -37.29069 -8.409583 561.603
## 108011 -37.29041 -8.409583 560.773
## 108012 -37.29013 -8.409583 559.903
## 108013 -37.28986 -8.409583 559.372
## 108014 -37.28958 -8.409583 558.971
## 108015 -37.28930 -8.409583 558.340
## 108016 -37.28902 -8.409583 558.326
## 108017 -37.28875 -8.409583 558.017
## 108018 -37.28847 -8.409583 557.726
## 108019 -37.28819 -8.409583 557.333
## 108020 -37.28791 -8.409583 557.107
## 108021 -37.28763 -8.409583 557.213
## 108022 -37.28736 -8.409583 557.878
## 108023 -37.28708 -8.409583 558.724
## 108024 -37.28680 -8.409583 559.435
## 108025 -37.28652 -8.409583 559.740
## 108026 -37.28625 -8.409583 560.046
## 108027 -37.28597 -8.409583 560.526
## 108028 -37.28569 -8.409583 561.614
## 108029 -37.28541 -8.409583 562.610
## 108030 -37.28513 -8.409583 563.157
## 108031 -37.28486 -8.409583 562.841
## 108032 -37.28458 -8.409583 562.118
## 108033 -37.28430 -8.409583 561.245
## 108034 -37.28402 -8.409583 560.473
## 108035 -37.28375 -8.409583 559.850
## 108036 -37.28347 -8.409583 559.443
## 108037 -37.28319 -8.409583 559.401
## 108038 -37.28291 -8.409583 559.476
## 108039 -37.28263 -8.409583 559.551
## 108040 -37.28236 -8.409583 559.523
## 108041 -37.28208 -8.409583 559.457
## 108042 -37.28180 -8.409583 559.356
## 108043 -37.28152 -8.409583 559.219
## 108044 -37.28125 -8.409583 559.378
## 108045 -37.28097 -8.409583 560.013
## 108046 -37.28069 -8.409583 561.526
## 108047 -37.28041 -8.409583 563.134
## 108048 -37.28013 -8.409583 564.353
## 108049 -37.27986 -8.409583 564.587
## 108050 -37.27958 -8.409583 564.621
## 108051 -37.27930 -8.409583 564.961
## 108052 -37.27902 -8.409583 566.063
## 108053 -37.27875 -8.409583 567.433
## 108054 -37.27847 -8.409583 568.858
## 108055 -37.27819 -8.409583 569.953
## 108056 -37.27791 -8.409583 570.974
## 108057 -37.27763 -8.409583 571.992
## 108058 -37.27736 -8.409583 573.096
## 108059 -37.27708 -8.409583 574.201
## 108060 -37.27680 -8.409583 575.283
## 108061 -37.27652 -8.409583 576.348
## 108062 -37.27625 -8.409583 577.240
## 108063 -37.27597 -8.409583 577.865
## 108064 -37.27569 -8.409583 578.040
## 108065 -37.27541 -8.409583 577.935
## 108066 -37.27513 -8.409583 577.618
## 108067 -37.27486 -8.409583 577.136
## 108068 -37.27458 -8.409583 576.509
## 108069 -37.27430 -8.409583 575.784
## 108070 -37.27402 -8.409583 575.040
## 108071 -37.27375 -8.409583 574.267
## 108072 -37.27347 -8.409583 573.487
## 108073 -37.27319 -8.409583 572.717
## 108074 -37.27291 -8.409583 571.997
## 108075 -37.27263 -8.409583 571.343
## 108076 -37.27236 -8.409583 570.768
## 108077 -37.27208 -8.409583 570.265
## 108078 -37.27180 -8.409583 569.820
## 108079 -37.27152 -8.409583 569.390
## 108080 -37.27125 -8.409583 569.092
## 108081 -37.27097 -8.409583 568.975
## 108082 -37.27069 -8.409583 569.255
## 108083 -37.27041 -8.409583 569.467
## 108084 -37.27013 -8.409583 569.346
## 108085 -37.26986 -8.409583 568.566
## 108086 -37.26958 -8.409583 567.481
## 108087 -37.26930 -8.409583 566.381
## 108088 -37.26902 -8.409583 565.041
## 108089 -37.26875 -8.409583 564.265
## 108090 -37.26847 -8.409583 564.286
## 108091 -37.26819 -8.409583 565.721
## 108092 -37.26791 -8.409583 567.580
## 108093 -37.26763 -8.409583 569.223
## 108094 -37.26736 -8.409583 569.906
## 108095 -37.26708 -8.409583 570.055
## 108096 -37.26680 -8.409583 569.833
## 108097 -37.26652 -8.409583 569.457
## 108098 -37.26625 -8.409583 568.986
## 108099 -37.26597 -8.409583 568.534
## 108100 -37.26569 -8.409583 568.358
## 108101 -37.26541 -8.409583 568.215
## 108102 -37.26513 -8.409583 568.036
## 108103 -37.26486 -8.409583 567.705
## 108104 -37.26458 -8.409583 567.228
## 108105 -37.26430 -8.409583 566.532
## 108106 -37.26402 -8.409583 565.585
## 108107 -37.26375 -8.409583 564.547
## 108108 -37.26347 -8.409583 563.538
## 108109 -37.26319 -8.409583 562.684
## 108110 -37.26291 -8.409583 562.168
## 108111 -37.26263 -8.409583 562.161
## 108112 -37.26236 -8.409583 562.778
## 108113 -37.26208 -8.409583 563.747
## 108114 -37.26180 -8.409583 564.990
## 108115 -37.26152 -8.409583 565.913
## 108116 -37.26125 -8.409583 566.691
## 108117 -37.26097 -8.409583 567.021
## 108118 -37.26069 -8.409583 566.600
## 108119 -37.26041 -8.409583 566.028
## 108120 -37.26013 -8.409583 565.706
## 108121 -37.25986 -8.409583 566.106
## 108122 -37.25958 -8.409583 566.683
## 108123 -37.25930 -8.409583 567.099
## 108124 -37.25902 -8.409583 567.064
## 108125 -37.25875 -8.409583 566.662
## 108126 -37.25847 -8.409583 565.879
## 108127 -37.25819 -8.409583 564.691
## 108128 -37.25791 -8.409583 563.431
## 108129 -37.25763 -8.409583 562.390
## 108130 -37.25736 -8.409583 561.841
## 108131 -37.25708 -8.409583 561.409
## 108132 -37.25680 -8.409583 560.805
## 108133 -37.25652 -8.409583 559.809
## 108134 -37.25625 -8.409583 558.830
## 108135 -37.25597 -8.409583 558.106
## 108136 -37.25569 -8.409583 558.071
## 108137 -37.25541 -8.409583 558.324
## 108138 -37.25513 -8.409583 558.653
## 108139 -37.25486 -8.409583 558.795
## 108140 -37.25458 -8.409583 558.948
## 108141 -37.25430 -8.409583 559.331
## 108142 -37.25402 -8.409583 559.482
## 108143 -37.25375 -8.409583 560.141
## 108144 -37.25347 -8.409583 561.369
## 108145 -37.25319 -8.409583 563.597
## 108146 -37.25291 -8.409583 566.134
## 108147 -37.25263 -8.409583 568.558
## 108148 -37.25236 -8.409583 570.355
## 108149 -37.25208 -8.409583 571.807
## 108150 -37.25180 -8.409583 573.060
## 108151 -37.25152 -8.409583 574.290
## 108152 -37.25125 -8.409583 575.216
## 108153 -37.25097 -8.409583 575.765
## 108154 -37.25069 -8.409583 575.663
## 108155 -37.25041 -8.409583 575.494
## 108156 -37.25013 -8.409583 575.574
## 108157 -37.24986 -8.409583 576.240
## 108158 -37.24958 -8.409583 577.103
## 108159 -37.24930 -8.409583 577.946
## 108160 -37.24902 -8.409583 578.546
## 108161 -37.24875 -8.409583 578.976
## 108162 -37.24847 -8.409583 579.232
## 108163 -37.24819 -8.409583 579.242
## 108164 -37.24791 -8.409583 579.310
## 108165 -37.24763 -8.409583 579.656
## 108166 -37.24736 -8.409583 580.537
## 108167 -37.24708 -8.409583 581.571
## 108168 -37.24680 -8.409583 582.471
## 108169 -37.24652 -8.409583 583.013
## 108170 -37.24625 -8.409583 583.493
## 108171 -37.24597 -8.409583 584.035
## 108172 -37.24569 -8.409583 584.928
## 108173 -37.24541 -8.409583 585.904
## 108174 -37.24513 -8.409583 586.882
## 108175 -37.24486 -8.409583 587.719
## 108176 -37.24458 -8.409583 588.498
## 108177 -37.24430 -8.409583 589.236
## 108178 -37.24402 -8.409583 589.986
## 108179 -37.24375 -8.409583 590.821
## 108180 -37.24347 -8.409583 591.854
## 108181 -37.24319 -8.409583 593.178
## 108182 -37.24291 -8.409583 594.832
## 108183 -37.24263 -8.409583 596.808
## 108184 -37.24236 -8.409583 599.086
## 108185 -37.24208 -8.409583 601.576
## 108186 -37.24180 -8.409583 604.184
## 108187 -37.24152 -8.409583 606.855
## 108188 -37.24125 -8.409583 609.463
## 108189 -37.24097 -8.409583 611.950
## 108190 -37.24069 -8.409583 614.229
## 108191 -37.24041 -8.409583 616.119
## 108192 -37.24013 -8.409583 617.444
## 108193 -37.23986 -8.409583 618.045
## 108194 -37.23958 -8.409583 618.047
## 108195 -37.23930 -8.409583 617.573
## 108196 -37.23902 -8.409583 616.714
## 108197 -37.23875 -8.409583 615.226
## 108198 -37.23847 -8.409583 612.967
## 108199 -37.23819 -8.409583 609.545
## 108200 -37.23791 -8.409583 605.724
## 108201 -37.23763 -8.409583 601.940
## 108202 -37.23736 -8.409583 598.665
## 108203 -37.23708 -8.409583 595.830
## 108204 -37.23680 -8.409583 593.555
## 108205 -37.23652 -8.409583 591.898
## 108206 -37.23625 -8.409583 590.454
## 108207 -37.23597 -8.409583 588.935
## 108208 -37.23569 -8.409583 586.786
## 108209 -37.23541 -8.409583 584.627
## 108210 -37.23513 -8.409583 582.783
## 108211 -37.23486 -8.409583 581.647
## 108212 -37.23458 -8.409583 580.722
## 108213 -37.23430 -8.409583 579.745
## 108214 -37.23402 -8.409583 578.572
## 108215 -37.23375 -8.409583 577.171
## 108216 -37.23347 -8.409583 575.632
## 108217 -37.23319 -8.409583 573.891
## 108218 -37.23291 -8.409583 572.425
## 108219 -37.23263 -8.409583 571.566
## 108220 -37.23236 -8.409583 571.652
## 108221 -37.23208 -8.409583 572.356
## 108222 -37.23180 -8.409583 573.480
## 108223 -37.23152 -8.409583 574.819
## 108224 -37.23125 -8.409583 576.304
## 108225 -37.23097 -8.409583 577.820
## 108226 -37.23069 -8.409583 579.230
## 108227 -37.23041 -8.409583 580.463
## 108228 -37.23013 -8.409583 581.468
## 108229 -37.22986 -8.409583 582.275
## 108230 -37.22958 -8.409583 582.837
## 108231 -37.22930 -8.409583 583.116
## 108232 -37.22902 -8.409583 583.101
## 108233 -37.22875 -8.409583 583.075
## 108234 -37.22847 -8.409583 583.191
## 108235 -37.22819 -8.409583 583.769
## 108236 -37.22791 -8.409583 584.304
## 108237 -37.22763 -8.409583 584.522
## 108238 -37.22736 -8.409583 584.109
## 108239 -37.22708 -8.409583 583.503
## 108240 -37.22680 -8.409583 582.917
## 108241 -37.22652 -8.409583 582.656
## 108242 -37.22625 -8.409583 582.388
## 108243 -37.22597 -8.409583 581.868
## 108244 -37.22569 -8.409583 580.780
## 108245 -37.22541 -8.409583 579.487
## 108246 -37.22513 -8.409583 578.221
## 108247 -37.22486 -8.409583 577.237
## 108248 -37.22458 -8.409583 576.242
## 108249 -37.22430 -8.409583 575.006
## 108250 -37.22402 -8.409583 573.390
## 108251 -37.22375 -8.409583 571.847
## 109098 -37.36486 -8.409861 519.899
## 109099 -37.36458 -8.409861 520.097
## 109100 -37.36430 -8.409861 520.936
## 109101 -37.36402 -8.409861 522.003
## 109102 -37.36375 -8.409861 522.983
## 109103 -37.36347 -8.409861 523.947
## 109104 -37.36319 -8.409861 524.055
## 109105 -37.36291 -8.409861 524.470
## 109106 -37.36263 -8.409861 524.966
## 109107 -37.36236 -8.409861 526.136
## 109108 -37.36208 -8.409861 527.675
## 109109 -37.36180 -8.409861 529.507
## 109110 -37.36152 -8.409861 531.171
## 109111 -37.36125 -8.409861 532.987
## 109112 -37.36097 -8.409861 534.579
## 109113 -37.36069 -8.409861 536.380
## 109114 -37.36041 -8.409861 537.849
## 109115 -37.36013 -8.409861 539.033
## 109116 -37.35986 -8.409861 539.581
## 109117 -37.35958 -8.409861 540.089
## 109118 -37.35930 -8.409861 540.148
## 109119 -37.35902 -8.409861 540.486
## 109120 -37.35875 -8.409861 540.991
## 109121 -37.35847 -8.409861 541.465
## 109122 -37.35819 -8.409861 541.742
## 109123 -37.35791 -8.409861 542.329
## 109124 -37.35763 -8.409861 543.116
## 109125 -37.35736 -8.409861 544.096
## 109126 -37.35708 -8.409861 544.985
## 109127 -37.35680 -8.409861 545.766
## 109128 -37.35652 -8.409861 545.992
## 109129 -37.35625 -8.409861 545.961
## 109130 -37.35597 -8.409861 545.580
## 109131 -37.35569 -8.409861 545.057
## 109132 -37.35541 -8.409861 544.630
## 109133 -37.35513 -8.409861 544.285
## 109134 -37.35486 -8.409861 543.742
## 109135 -37.35458 -8.409861 543.210
## 109136 -37.35430 -8.409861 542.555
## 109137 -37.35402 -8.409861 541.873
## 109138 -37.35375 -8.409861 541.388
## 109139 -37.35347 -8.409861 541.231
## 109140 -37.35319 -8.409861 541.695
## 109141 -37.35291 -8.409861 542.204
## 109142 -37.35263 -8.409861 542.507
## 109143 -37.35236 -8.409861 541.839
## 109144 -37.35208 -8.409861 540.949
## 109145 -37.35180 -8.409861 540.423
## 109146 -37.35152 -8.409861 540.754
## 109147 -37.35125 -8.409861 541.754
## 109148 -37.35097 -8.409861 543.122
## 109149 -37.35069 -8.409861 544.350
## 109150 -37.35041 -8.409861 545.194
## 109151 -37.35013 -8.409861 546.150
## 109152 -37.34986 -8.409861 546.934
## 109153 -37.34958 -8.409861 547.556
## 109154 -37.34930 -8.409861 548.035
## 109155 -37.34902 -8.409861 548.593
## 109156 -37.34875 -8.409861 549.224
## 109157 -37.34847 -8.409861 549.648
## 109158 -37.34819 -8.409861 549.912
## 109159 -37.34791 -8.409861 549.987
## 109160 -37.34763 -8.409861 550.126
## 109161 -37.34736 -8.409861 550.138
## 109162 -37.34708 -8.409861 550.162
## 109163 -37.34680 -8.409861 549.962
## 109164 -37.34652 -8.409861 549.836
## 109165 -37.34625 -8.409861 549.906
## 109166 -37.34597 -8.409861 549.993
## 109167 -37.34569 -8.409861 550.358
## 109168 -37.34541 -8.409861 550.977
## 109169 -37.34513 -8.409861 551.363
## 109170 -37.34486 -8.409861 551.301
## 109171 -37.34458 -8.409861 551.019
## 109172 -37.34430 -8.409861 550.995
## 109173 -37.34402 -8.409861 551.313
## 109174 -37.34375 -8.409861 551.680
## 109175 -37.34347 -8.409861 552.218
## 109176 -37.34319 -8.409861 552.679
## 109177 -37.34291 -8.409861 553.037
## 109178 -37.34263 -8.409861 553.508
## 109179 -37.34236 -8.409861 553.468
## 109180 -37.34208 -8.409861 553.375
## 109181 -37.34180 -8.409861 552.896
## 109182 -37.34152 -8.409861 552.661
## 109183 -37.34125 -8.409861 552.502
## 109184 -37.34097 -8.409861 552.668
## 109185 -37.34069 -8.409861 553.499
## 109186 -37.34041 -8.409861 554.710
## 109187 -37.34013 -8.409861 556.154
## 109188 -37.33986 -8.409861 557.017
## 109189 -37.33958 -8.409861 557.719
## 109190 -37.33930 -8.409861 557.844
## 109191 -37.33902 -8.409861 557.788
## 109192 -37.33875 -8.409861 557.383
## 109193 -37.33847 -8.409861 556.515
## 109194 -37.33819 -8.409861 554.876
## 109195 -37.33791 -8.409861 553.729
## 109196 -37.33763 -8.409861 552.918
## 109197 -37.33736 -8.409861 553.388
## 109198 -37.33708 -8.409861 554.045
## 109199 -37.33680 -8.409861 554.968
## 109200 -37.33652 -8.409861 555.257
## 109201 -37.33625 -8.409861 555.436
## 109202 -37.33597 -8.409861 555.525
## 109203 -37.33569 -8.409861 556.193
## 109204 -37.33541 -8.409861 556.778
## 109205 -37.33513 -8.409861 556.857
## 109206 -37.33486 -8.409861 556.408
## 109207 -37.33458 -8.409861 555.712
## 109208 -37.33430 -8.409861 555.436
## 109209 -37.33402 -8.409861 555.828
## 109210 -37.33375 -8.409861 555.999
## 109211 -37.33347 -8.409861 556.433
## 109212 -37.33319 -8.409861 556.397
## 109213 -37.33291 -8.409861 556.406
## 109214 -37.33263 -8.409861 556.361
## 109215 -37.33236 -8.409861 556.391
## 109216 -37.33208 -8.409861 556.393
## 109217 -37.33180 -8.409861 556.151
## 109218 -37.33152 -8.409861 555.875
## 109219 -37.33125 -8.409861 555.351
## 109220 -37.33097 -8.409861 554.507
## 109221 -37.33069 -8.409861 553.877
## 109222 -37.33041 -8.409861 553.097
## 109223 -37.33013 -8.409861 552.780
## 109224 -37.32986 -8.409861 552.416
## 109225 -37.32958 -8.409861 552.231
## 109226 -37.32930 -8.409861 552.344
## 109227 -37.32902 -8.409861 552.560
## 109228 -37.32875 -8.409861 552.930
## 109229 -37.32847 -8.409861 553.078
## 109230 -37.32819 -8.409861 553.460
## 109231 -37.32791 -8.409861 554.134
## 109232 -37.32763 -8.409861 554.929
## 109233 -37.32736 -8.409861 556.081
## 109234 -37.32708 -8.409861 557.249
## 109235 -37.32680 -8.409861 558.557
## 109236 -37.32652 -8.409861 559.917
## 109237 -37.32625 -8.409861 560.576
## 109238 -37.32597 -8.409861 561.310
## 109239 -37.32569 -8.409861 561.416
## 109240 -37.32541 -8.409861 561.351
## 109241 -37.32513 -8.409861 560.974
## 109242 -37.32486 -8.409861 560.939
## 109243 -37.32458 -8.409861 560.705
## 109244 -37.32430 -8.409861 560.969
## 109245 -37.32402 -8.409861 561.237
## 109246 -37.32375 -8.409861 561.646
## 109247 -37.32347 -8.409861 562.061
## 109248 -37.32319 -8.409861 562.454
## 109249 -37.32291 -8.409861 562.720
## 109250 -37.32263 -8.409861 562.342
## 109251 -37.32236 -8.409861 562.128
## 109252 -37.32208 -8.409861 562.110
## 109253 -37.32180 -8.409861 562.360
## 109254 -37.32152 -8.409861 562.752
## 109255 -37.32125 -8.409861 563.018
## 109256 -37.32097 -8.409861 563.188
## 109257 -37.32069 -8.409861 563.360
## 109258 -37.32041 -8.409861 563.215
## 109259 -37.32013 -8.409861 563.067
## 109260 -37.31986 -8.409861 563.247
## 109261 -37.31958 -8.409861 563.537
## 109262 -37.31930 -8.409861 564.406
## 109263 -37.31902 -8.409861 565.241
## 109264 -37.31875 -8.409861 565.846
## 109265 -37.31847 -8.409861 566.250
## 109266 -37.31819 -8.409861 566.336
## 109267 -37.31791 -8.409861 566.497
## 109268 -37.31763 -8.409861 566.415
## 109269 -37.31736 -8.409861 565.684
## 109270 -37.31708 -8.409861 565.203
## 109271 -37.31680 -8.409861 564.697
## 109272 -37.31652 -8.409861 564.884
## 109273 -37.31625 -8.409861 565.308
## 109274 -37.31597 -8.409861 565.550
## 109275 -37.31569 -8.409861 565.817
## 109276 -37.31541 -8.409861 565.504
## 109277 -37.31513 -8.409861 565.967
## 109278 -37.31486 -8.409861 565.957
## 109279 -37.31458 -8.409861 565.889
## 109280 -37.31430 -8.409861 565.779
## 109281 -37.31402 -8.409861 565.746
## 109282 -37.31375 -8.409861 566.005
## 109283 -37.31347 -8.409861 565.676
## 109284 -37.31319 -8.409861 565.208
## 109285 -37.31291 -8.409861 565.025
## 109286 -37.31263 -8.409861 564.796
## 109287 -37.31236 -8.409861 564.750
## 109288 -37.31208 -8.409861 564.089
## 109289 -37.31180 -8.409861 563.244
## 109290 -37.31152 -8.409861 561.157
## 109291 -37.31125 -8.409861 558.587
## 109292 -37.31097 -8.409861 555.423
## 109293 -37.31069 -8.409861 552.419
## 109294 -37.31041 -8.409861 550.415
## 109295 -37.31013 -8.409861 549.433
## 109296 -37.30986 -8.409861 550.324
## 109297 -37.30958 -8.409861 551.795
## 109298 -37.30930 -8.409861 553.931
## 109299 -37.30902 -8.409861 555.438
## 109300 -37.30875 -8.409861 556.883
## 109301 -37.30847 -8.409861 558.228
## 109302 -37.30819 -8.409861 559.459
## 109303 -37.30791 -8.409861 560.842
## 109304 -37.30763 -8.409861 562.297
## 109305 -37.30736 -8.409861 564.108
## 109306 -37.30708 -8.409861 565.907
## 109307 -37.30680 -8.409861 566.879
## 109308 -37.30652 -8.409861 567.572
## 109309 -37.30625 -8.409861 567.733
## 109310 -37.30597 -8.409861 567.992
## 109311 -37.30569 -8.409861 568.326
## 109312 -37.30541 -8.409861 568.237
## 109313 -37.30513 -8.409861 567.952
## 109314 -37.30486 -8.409861 567.299
## 109315 -37.30458 -8.409861 566.089
## 109316 -37.30430 -8.409861 564.622
## 109317 -37.30402 -8.409861 562.031
## 109318 -37.30375 -8.409861 560.070
## 109319 -37.30347 -8.409861 559.119
## 109320 -37.30319 -8.409861 560.538
## 109321 -37.30291 -8.409861 562.816
## 109322 -37.30263 -8.409861 565.010
## 109323 -37.30236 -8.409861 565.867
## 109324 -37.30208 -8.409861 566.254
## 109325 -37.30180 -8.409861 566.314
## 109326 -37.30152 -8.409861 566.586
## 109327 -37.30125 -8.409861 566.687
## 109328 -37.30097 -8.409861 566.804
## 109329 -37.30069 -8.409861 566.565
## 109330 -37.30041 -8.409861 565.934
## 109331 -37.30013 -8.409861 565.138
## 109332 -37.29986 -8.409861 563.792
## 109333 -37.29958 -8.409861 562.527
## 109334 -37.29930 -8.409861 561.005
## 109335 -37.29902 -8.409861 559.927
## 109336 -37.29875 -8.409861 559.332
## 109337 -37.29847 -8.409861 559.037
## 109338 -37.29819 -8.409861 559.372
## 109339 -37.29791 -8.409861 559.896
## 109340 -37.29763 -8.409861 560.672
## 109341 -37.29736 -8.409861 560.869
## 109342 -37.29708 -8.409861 561.176
## 109343 -37.29680 -8.409861 561.073
## 109344 -37.29652 -8.409861 561.229
## 109345 -37.29625 -8.409861 561.487
## 109346 -37.29597 -8.409861 561.104
## 109347 -37.29569 -8.409861 559.813
## 109348 -37.29541 -8.409861 559.079
## 109349 -37.29513 -8.409861 557.913
## 109350 -37.29486 -8.409861 557.802
## 109351 -37.29458 -8.409861 557.854
## 109352 -37.29430 -8.409861 557.872
## 109353 -37.29402 -8.409861 557.761
## 109354 -37.29375 -8.409861 557.526
## 109355 -37.29347 -8.409861 557.504
## 109356 -37.29319 -8.409861 557.686
## 109357 -37.29291 -8.409861 557.659
## 109358 -37.29263 -8.409861 558.246
## 109359 -37.29236 -8.409861 558.945
## 109360 -37.29208 -8.409861 560.093
## 109361 -37.29180 -8.409861 560.903
## 109362 -37.29152 -8.409861 561.657
## 109363 -37.29125 -8.409861 562.187
## 109364 -37.29097 -8.409861 561.944
## 109365 -37.29069 -8.409861 561.411
## 109366 -37.29041 -8.409861 560.572
## 109367 -37.29013 -8.409861 559.813
## 109368 -37.28986 -8.409861 559.481
## 109369 -37.28958 -8.409861 558.957
## 109370 -37.28930 -8.409861 558.883
## 109371 -37.28902 -8.409861 558.662
## 109372 -37.28875 -8.409861 558.315
## 109373 -37.28847 -8.409861 557.803
## 109374 -37.28819 -8.409861 557.293
## 109375 -37.28791 -8.409861 557.173
## 109376 -37.28763 -8.409861 557.351
## 109377 -37.28736 -8.409861 558.102
## 109378 -37.28708 -8.409861 559.093
## 109379 -37.28680 -8.409861 559.866
## 109380 -37.28652 -8.409861 560.189
## 109381 -37.28625 -8.409861 560.530
## 109382 -37.28597 -8.409861 560.871
## 109383 -37.28569 -8.409861 561.907
## 109384 -37.28541 -8.409861 563.029
## 109385 -37.28513 -8.409861 563.766
## 109386 -37.28486 -8.409861 563.521
## 109387 -37.28458 -8.409861 562.939
## 109388 -37.28430 -8.409861 562.188
## 109389 -37.28402 -8.409861 561.611
## 109390 -37.28375 -8.409861 561.143
## 109391 -37.28347 -8.409861 560.712
## 109392 -37.28319 -8.409861 560.785
## 109393 -37.28291 -8.409861 560.922
## 109394 -37.28263 -8.409861 561.159
## 109395 -37.28236 -8.409861 560.933
## 109396 -37.28208 -8.409861 560.565
## 109397 -37.28180 -8.409861 560.082
## 109398 -37.28152 -8.409861 559.469
## 109399 -37.28125 -8.409861 559.348
## 109400 -37.28097 -8.409861 559.447
## 109401 -37.28069 -8.409861 560.670
## 109402 -37.28041 -8.409861 562.194
## 109403 -37.28013 -8.409861 563.690
## 109404 -37.27986 -8.409861 564.186
## 109405 -37.27958 -8.409861 564.565
## 109406 -37.27930 -8.409861 565.026
## 109407 -37.27902 -8.409861 566.268
## 109408 -37.27875 -8.409861 567.607
## 109409 -37.27847 -8.409861 568.883
## 109410 -37.27819 -8.409861 569.779
## 109411 -37.27791 -8.409861 570.596
## 109412 -37.27763 -8.409861 571.305
## 109413 -37.27736 -8.409861 572.323
## 109414 -37.27708 -8.409861 573.403
## 109415 -37.27680 -8.409861 574.798
## 109416 -37.27652 -8.409861 576.114
## 109417 -37.27625 -8.409861 577.121
## 109418 -37.27597 -8.409861 577.956
## 109419 -37.27569 -8.409861 578.157
## 109420 -37.27541 -8.409861 577.843
## 109421 -37.27513 -8.409861 577.017
## 109422 -37.27486 -8.409861 576.459
## 109423 -37.27458 -8.409861 575.757
## 109424 -37.27430 -8.409861 575.221
## 109425 -37.27402 -8.409861 574.795
## 109426 -37.27375 -8.409861 574.299
## 109427 -37.27347 -8.409861 573.751
## 109428 -37.27319 -8.409861 573.260
## 109429 -37.27291 -8.409861 572.416
## 109430 -37.27263 -8.409861 571.846
## 109431 -37.27236 -8.409861 571.308
## 109432 -37.27208 -8.409861 571.027
## 109433 -37.27180 -8.409861 570.304
## 109434 -37.27152 -8.409861 569.773
## 109435 -37.27125 -8.409861 569.347
## 109436 -37.27097 -8.409861 569.168
## 109437 -37.27069 -8.409861 569.479
## 109438 -37.27041 -8.409861 569.653
## 109439 -37.27013 -8.409861 569.629
## 109440 -37.26986 -8.409861 568.784
## 109441 -37.26958 -8.409861 567.539
## 109442 -37.26930 -8.409861 566.508
## 109443 -37.26902 -8.409861 565.152
## 109444 -37.26875 -8.409861 564.419
## 109445 -37.26847 -8.409861 564.506
## 109446 -37.26819 -8.409861 566.014
## 109447 -37.26791 -8.409861 567.716
## 109448 -37.26763 -8.409861 569.261
## 109449 -37.26736 -8.409861 569.817
## 109450 -37.26708 -8.409861 569.965
## 109451 -37.26680 -8.409861 569.917
## 109452 -37.26652 -8.409861 569.815
## 109453 -37.26625 -8.409861 569.541
## 109454 -37.26597 -8.409861 569.240
## 109455 -37.26569 -8.409861 569.125
## 109456 -37.26541 -8.409861 568.968
## 109457 -37.26513 -8.409861 568.663
## 109458 -37.26486 -8.409861 568.136
## 109459 -37.26458 -8.409861 567.435
## 109460 -37.26430 -8.409861 566.791
## 109461 -37.26402 -8.409861 565.765
## 109462 -37.26375 -8.409861 564.799
## 109463 -37.26347 -8.409861 563.928
## 109464 -37.26319 -8.409861 562.912
## 109465 -37.26291 -8.409861 562.256
## 109466 -37.26263 -8.409861 561.840
## 109467 -37.26236 -8.409861 562.316
## 109468 -37.26208 -8.409861 563.235
## 109469 -37.26180 -8.409861 564.290
## 109470 -37.26152 -8.409861 565.421
## 109471 -37.26125 -8.409861 566.220
## 109472 -37.26097 -8.409861 566.982
## 109473 -37.26069 -8.409861 566.852
## 109474 -37.26041 -8.409861 566.755
## 109475 -37.26013 -8.409861 566.149
## 109476 -37.25986 -8.409861 566.709
## 109477 -37.25958 -8.409861 567.271
## 109478 -37.25930 -8.409861 568.128
## 109479 -37.25902 -8.409861 568.128
## 109480 -37.25875 -8.409861 567.653
## 109481 -37.25847 -8.409861 566.874
## 109482 -37.25819 -8.409861 565.693
## 109483 -37.25791 -8.409861 564.263
## 109484 -37.25763 -8.409861 562.929
## 109485 -37.25736 -8.409861 562.274
## 109486 -37.25708 -8.409861 561.867
## 109487 -37.25680 -8.409861 561.049
## 109488 -37.25652 -8.409861 560.189
## 109489 -37.25625 -8.409861 559.010
## 109490 -37.25597 -8.409861 558.386
## 109491 -37.25569 -8.409861 558.538
## 109492 -37.25541 -8.409861 558.799
## 109493 -37.25513 -8.409861 559.405
## 109494 -37.25486 -8.409861 559.330
## 109495 -37.25458 -8.409861 559.161
## 109496 -37.25430 -8.409861 559.385
## 109497 -37.25402 -8.409861 559.363
## 109498 -37.25375 -8.409861 560.152
## 109499 -37.25347 -8.409861 561.613
## 109500 -37.25319 -8.409861 563.997
## 109501 -37.25291 -8.409861 566.524
## 109502 -37.25263 -8.409861 568.921
## 109503 -37.25236 -8.409861 570.708
## 109504 -37.25208 -8.409861 572.077
## 109505 -37.25180 -8.409861 573.312
## 109506 -37.25152 -8.409861 574.316
## 109507 -37.25125 -8.409861 574.973
## 109508 -37.25097 -8.409861 575.417
## 109509 -37.25069 -8.409861 575.090
## 109510 -37.25041 -8.409861 574.870
## 109511 -37.25013 -8.409861 574.736
## 109512 -37.24986 -8.409861 574.982
## 109513 -37.24958 -8.409861 575.499
## 109514 -37.24930 -8.409861 576.269
## 109515 -37.24902 -8.409861 576.887
## 109516 -37.24875 -8.409861 577.496
## 109517 -37.24847 -8.409861 577.817
## 109518 -37.24819 -8.409861 578.017
## 109519 -37.24791 -8.409861 578.139
## 109520 -37.24763 -8.409861 578.650
## 109521 -37.24736 -8.409861 579.889
## 109522 -37.24708 -8.409861 581.207
## 109523 -37.24680 -8.409861 582.419
## 109524 -37.24652 -8.409861 583.328
## 109525 -37.24625 -8.409861 583.996
## 109526 -37.24597 -8.409861 584.715
## 109527 -37.24569 -8.409861 585.640
## 109528 -37.24541 -8.409861 586.312
## 109529 -37.24513 -8.409861 587.041
## 109530 -37.24486 -8.409861 587.783
## 109531 -37.24458 -8.409861 588.657
## 109532 -37.24430 -8.409861 589.247
## 109533 -37.24402 -8.409861 590.057
## 109534 -37.24375 -8.409861 590.906
## 109535 -37.24347 -8.409861 591.882
## 109536 -37.24319 -8.409861 593.499
## 109537 -37.24291 -8.409861 595.181
## 109538 -37.24263 -8.409861 597.576
## 109539 -37.24236 -8.409861 600.523
## 109540 -37.24208 -8.409861 603.697
## 109541 -37.24180 -8.409861 606.554
## 109542 -37.24152 -8.409861 609.161
## 109543 -37.24125 -8.409861 611.662
## 109544 -37.24097 -8.409861 613.927
## 109545 -37.24069 -8.409861 615.967
## 109546 -37.24041 -8.409861 618.237
## 109547 -37.24013 -8.409861 619.638
## 109548 -37.23986 -8.409861 619.952
## 109549 -37.23958 -8.409861 619.526
## 109550 -37.23930 -8.409861 619.278
## 109551 -37.23902 -8.409861 618.393
## 109552 -37.23875 -8.409861 616.872
## 109553 -37.23847 -8.409861 614.528
## 109554 -37.23819 -8.409861 610.821
## 109555 -37.23791 -8.409861 606.787
## 109556 -37.23763 -8.409861 602.509
## 109557 -37.23736 -8.409861 599.186
## 109558 -37.23708 -8.409861 596.342
## 109559 -37.23680 -8.409861 594.414
## 109560 -37.23652 -8.409861 592.807
## 109561 -37.23625 -8.409861 591.261
## 109562 -37.23597 -8.409861 589.635
## 109563 -37.23569 -8.409861 587.226
## 109564 -37.23541 -8.409861 584.928
## 109565 -37.23513 -8.409861 582.570
## 109566 -37.23486 -8.409861 581.287
## 109567 -37.23458 -8.409861 580.167
## 109568 -37.23430 -8.409861 579.314
## 109569 -37.23402 -8.409861 578.422
## 109570 -37.23375 -8.409861 577.096
## 109571 -37.23347 -8.409861 575.728
## 109572 -37.23319 -8.409861 574.223
## 109573 -37.23291 -8.409861 572.629
## 109574 -37.23263 -8.409861 571.731
## 109575 -37.23236 -8.409861 571.926
## 109576 -37.23208 -8.409861 572.706
## 109577 -37.23180 -8.409861 574.091
## 109578 -37.23152 -8.409861 575.526
## 109579 -37.23125 -8.409861 577.057
## 109580 -37.23097 -8.409861 578.312
## 109581 -37.23069 -8.409861 579.757
## 109582 -37.23041 -8.409861 581.022
## 109583 -37.23013 -8.409861 582.263
## 109584 -37.22986 -8.409861 583.133
## 109585 -37.22958 -8.409861 583.810
## 109586 -37.22930 -8.409861 584.179
## 109587 -37.22902 -8.409861 584.257
## 109588 -37.22875 -8.409861 583.984
## 109589 -37.22847 -8.409861 583.582
## 109590 -37.22819 -8.409861 584.016
## 109591 -37.22791 -8.409861 584.513
## 109592 -37.22763 -8.409861 585.116
## 109593 -37.22736 -8.409861 584.935
## 109594 -37.22708 -8.409861 584.739
## 109595 -37.22680 -8.409861 584.053
## 109596 -37.22652 -8.409861 583.727
## 109597 -37.22625 -8.409861 583.422
## 109598 -37.22597 -8.409861 582.816
## 109599 -37.22569 -8.409861 581.495
## 109600 -37.22541 -8.409861 580.389
## 109601 -37.22513 -8.409861 579.080
## 109602 -37.22486 -8.409861 577.901
## 109603 -37.22458 -8.409861 576.826
## 109604 -37.22430 -8.409861 575.478
## 109605 -37.22402 -8.409861 573.961
## 109606 -37.22375 -8.409861 572.429
## 110453 -37.36486 -8.410139 519.582
## 110454 -37.36458 -8.410139 520.284
## 110455 -37.36430 -8.410139 521.384
## 110456 -37.36402 -8.410139 522.329
## 110457 -37.36375 -8.410139 523.130
## 110458 -37.36347 -8.410139 523.868
## 110459 -37.36319 -8.410139 524.134
## 110460 -37.36291 -8.410139 524.566
## 110461 -37.36263 -8.410139 524.969
## 110462 -37.36236 -8.410139 526.153
## 110463 -37.36208 -8.410139 527.802
## 110464 -37.36180 -8.410139 529.525
## 110465 -37.36152 -8.410139 531.444
## 110466 -37.36125 -8.410139 533.250
## 110467 -37.36097 -8.410139 535.020
## 110468 -37.36069 -8.410139 536.730
## 110469 -37.36041 -8.410139 537.978
## 110470 -37.36013 -8.410139 539.086
## 110471 -37.35986 -8.410139 540.020
## 110472 -37.35958 -8.410139 540.681
## 110473 -37.35930 -8.410139 541.418
## 110474 -37.35902 -8.410139 541.678
## 110475 -37.35875 -8.410139 541.950
## 110476 -37.35847 -8.410139 542.334
## 110477 -37.35819 -8.410139 542.935
## 110478 -37.35791 -8.410139 543.620
## 110479 -37.35763 -8.410139 544.709
## 110480 -37.35736 -8.410139 545.781
## 110481 -37.35708 -8.410139 546.813
## 110482 -37.35680 -8.410139 547.651
## 110483 -37.35652 -8.410139 548.037
## 110484 -37.35625 -8.410139 548.074
## 110485 -37.35597 -8.410139 547.786
## 110486 -37.35569 -8.410139 547.003
## 110487 -37.35541 -8.410139 546.312
## 110488 -37.35513 -8.410139 545.829
## 110489 -37.35486 -8.410139 545.216
## 110490 -37.35458 -8.410139 544.570
## 110491 -37.35430 -8.410139 543.862
## 110492 -37.35402 -8.410139 543.477
## 110493 -37.35375 -8.410139 543.127
## 110494 -37.35347 -8.410139 543.055
## 110495 -37.35319 -8.410139 543.525
## 110496 -37.35291 -8.410139 544.091
## 110497 -37.35263 -8.410139 544.438
## 110498 -37.35236 -8.410139 543.521
## 110499 -37.35208 -8.410139 542.357
## 110500 -37.35180 -8.410139 541.602
## 110501 -37.35152 -8.410139 541.960
## 110502 -37.35125 -8.410139 542.987
## 110503 -37.35097 -8.410139 544.317
## 110504 -37.35069 -8.410139 545.503
## 110505 -37.35041 -8.410139 546.551
## 110506 -37.35013 -8.410139 547.493
## 110507 -37.34986 -8.410139 548.312
## 110508 -37.34958 -8.410139 549.018
## 110509 -37.34930 -8.410139 549.486
## 110510 -37.34902 -8.410139 549.816
## 110511 -37.34875 -8.410139 550.086
## 110512 -37.34847 -8.410139 550.349
## 110513 -37.34819 -8.410139 550.677
## 110514 -37.34791 -8.410139 550.960
## 110515 -37.34763 -8.410139 551.233
## 110516 -37.34736 -8.410139 551.449
## 110517 -37.34708 -8.410139 551.655
## 110518 -37.34680 -8.410139 551.684
## 110519 -37.34652 -8.410139 551.520
## 110520 -37.34625 -8.410139 551.371
## 110521 -37.34597 -8.410139 551.424
## 110522 -37.34569 -8.410139 551.878
## 110523 -37.34541 -8.410139 552.392
## 110524 -37.34513 -8.410139 552.810
## 110525 -37.34486 -8.410139 552.631
## 110526 -37.34458 -8.410139 552.295
## 110527 -37.34430 -8.410139 552.173
## 110528 -37.34402 -8.410139 552.576
## 110529 -37.34375 -8.410139 553.175
## 110530 -37.34347 -8.410139 553.727
## 110531 -37.34319 -8.410139 553.837
## 110532 -37.34291 -8.410139 553.961
## 110533 -37.34263 -8.410139 554.227
## 110534 -37.34236 -8.410139 554.382
## 110535 -37.34208 -8.410139 554.376
## 110536 -37.34180 -8.410139 554.132
## 110537 -37.34152 -8.410139 553.641
## 110538 -37.34125 -8.410139 553.372
## 110539 -37.34097 -8.410139 553.342
## 110540 -37.34069 -8.410139 554.034
## 110541 -37.34041 -8.410139 554.956
## 110542 -37.34013 -8.410139 556.184
## 110543 -37.33986 -8.410139 557.101
## 110544 -37.33958 -8.410139 557.731
## 110545 -37.33930 -8.410139 558.046
## 110546 -37.33902 -8.410139 557.695
## 110547 -37.33875 -8.410139 556.822
## 110548 -37.33847 -8.410139 555.802
## 110549 -37.33819 -8.410139 554.613
## 110550 -37.33791 -8.410139 553.668
## 110551 -37.33763 -8.410139 553.452
## 110552 -37.33736 -8.410139 553.768
## 110553 -37.33708 -8.410139 554.303
## 110554 -37.33680 -8.410139 555.224
## 110555 -37.33652 -8.410139 555.593
## 110556 -37.33625 -8.410139 555.849
## 110557 -37.33597 -8.410139 555.987
## 110558 -37.33569 -8.410139 556.519
## 110559 -37.33541 -8.410139 557.016
## 110560 -37.33513 -8.410139 557.043
## 110561 -37.33486 -8.410139 556.841
## 110562 -37.33458 -8.410139 556.358
## 110563 -37.33430 -8.410139 556.514
## 110564 -37.33402 -8.410139 556.448
## 110565 -37.33375 -8.410139 556.538
## 110566 -37.33347 -8.410139 556.754
## 110567 -37.33319 -8.410139 557.051
## 110568 -37.33291 -8.410139 557.443
## 110569 -37.33263 -8.410139 557.503
## 110570 -37.33236 -8.410139 557.531
## 110571 -37.33208 -8.410139 557.553
## 110572 -37.33180 -8.410139 557.290
## 110573 -37.33152 -8.410139 556.859
## 110574 -37.33125 -8.410139 556.111
## 110575 -37.33097 -8.410139 555.200
## 110576 -37.33069 -8.410139 554.411
## 110577 -37.33041 -8.410139 553.657
## 110578 -37.33013 -8.410139 553.242
## 110579 -37.32986 -8.410139 553.055
## 110580 -37.32958 -8.410139 553.076
## 110581 -37.32930 -8.410139 553.420
## 110582 -37.32902 -8.410139 553.677
## 110583 -37.32875 -8.410139 553.971
## 110584 -37.32847 -8.410139 554.121
## 110585 -37.32819 -8.410139 554.495
## 110586 -37.32791 -8.410139 555.096
## 110587 -37.32763 -8.410139 555.767
## 110588 -37.32736 -8.410139 556.990
## 110589 -37.32708 -8.410139 558.139
## 110590 -37.32680 -8.410139 559.580
## 110591 -37.32652 -8.410139 560.266
## 110592 -37.32625 -8.410139 560.545
## 110593 -37.32597 -8.410139 560.868
## 110594 -37.32569 -8.410139 561.480
## 110595 -37.32541 -8.410139 562.026
## 110596 -37.32513 -8.410139 561.988
## 110597 -37.32486 -8.410139 561.756
## 110598 -37.32458 -8.410139 561.617
## 110599 -37.32430 -8.410139 561.587
## 110600 -37.32402 -8.410139 562.029
## 110601 -37.32375 -8.410139 562.420
## 110602 -37.32347 -8.410139 563.001
## 110603 -37.32319 -8.410139 563.411
## 110604 -37.32291 -8.410139 563.653
## 110605 -37.32263 -8.410139 563.290
## 110606 -37.32236 -8.410139 562.734
## 110607 -37.32208 -8.410139 562.249
## 110608 -37.32180 -8.410139 562.321
## 110609 -37.32152 -8.410139 562.896
## 110610 -37.32125 -8.410139 563.500
## 110611 -37.32097 -8.410139 563.844
## 110612 -37.32069 -8.410139 563.755
## 110613 -37.32041 -8.410139 563.675
## 110614 -37.32013 -8.410139 563.501
## 110615 -37.31986 -8.410139 563.902
## 110616 -37.31958 -8.410139 564.423
## 110617 -37.31930 -8.410139 565.528
## 110618 -37.31902 -8.410139 566.478
## 110619 -37.31875 -8.410139 566.934
## 110620 -37.31847 -8.410139 567.292
## 110621 -37.31819 -8.410139 566.981
## 110622 -37.31791 -8.410139 566.449
## 110623 -37.31763 -8.410139 565.954
## 110624 -37.31736 -8.410139 565.419
## 110625 -37.31708 -8.410139 565.205
## 110626 -37.31680 -8.410139 564.955
## 110627 -37.31652 -8.410139 565.359
## 110628 -37.31625 -8.410139 566.339
## 110629 -37.31597 -8.410139 567.082
## 110630 -37.31569 -8.410139 567.314
## 110631 -37.31541 -8.410139 567.144
## 110632 -37.31513 -8.410139 567.507
## 110633 -37.31486 -8.410139 567.612
## 110634 -37.31458 -8.410139 567.487
## 110635 -37.31430 -8.410139 567.266
## 110636 -37.31402 -8.410139 566.946
## 110637 -37.31375 -8.410139 566.523
## 110638 -37.31347 -8.410139 565.937
## 110639 -37.31319 -8.410139 565.772
## 110640 -37.31291 -8.410139 565.617
## 110641 -37.31263 -8.410139 565.569
## 110642 -37.31236 -8.410139 565.256
## 110643 -37.31208 -8.410139 564.462
## 110644 -37.31180 -8.410139 563.503
## 110645 -37.31152 -8.410139 561.345
## 110646 -37.31125 -8.410139 558.558
## 110647 -37.31097 -8.410139 555.429
## 110648 -37.31069 -8.410139 553.057
## 110649 -37.31041 -8.410139 551.679
## 110650 -37.31013 -8.410139 551.220
## 110651 -37.30986 -8.410139 552.059
## 110652 -37.30958 -8.410139 553.647
## 110653 -37.30930 -8.410139 555.615
## 110654 -37.30902 -8.410139 557.237
## 110655 -37.30875 -8.410139 558.740
## 110656 -37.30847 -8.410139 559.953
## 110657 -37.30819 -8.410139 560.935
## 110658 -37.30791 -8.410139 562.012
## 110659 -37.30763 -8.410139 563.196
## 110660 -37.30736 -8.410139 565.046
## 110661 -37.30708 -8.410139 566.698
## 110662 -37.30680 -8.410139 567.853
## 110663 -37.30652 -8.410139 567.810
## 110664 -37.30625 -8.410139 567.764
## 110665 -37.30597 -8.410139 567.826
## 110666 -37.30569 -8.410139 568.599
## 110667 -37.30541 -8.410139 569.195
## 110668 -37.30513 -8.410139 569.323
## 110669 -37.30486 -8.410139 568.527
## 110670 -37.30458 -8.410139 567.398
## 110671 -37.30430 -8.410139 565.404
## 110672 -37.30402 -8.410139 563.032
## 110673 -37.30375 -8.410139 561.252
## 110674 -37.30347 -8.410139 560.410
## 110675 -37.30319 -8.410139 561.502
## 110676 -37.30291 -8.410139 563.532
## 110677 -37.30263 -8.410139 565.276
## 110678 -37.30236 -8.410139 566.509
## 110679 -37.30208 -8.410139 567.294
## 110680 -37.30180 -8.410139 567.577
## 110681 -37.30152 -8.410139 567.574
## 110682 -37.30125 -8.410139 567.403
## 110683 -37.30097 -8.410139 567.323
## 110684 -37.30069 -8.410139 567.000
## 110685 -37.30041 -8.410139 566.515
## 110686 -37.30013 -8.410139 565.672
## 110687 -37.29986 -8.410139 564.632
## 110688 -37.29958 -8.410139 563.646
## 110689 -37.29930 -8.410139 562.424
## 110690 -37.29902 -8.410139 561.293
## 110691 -37.29875 -8.410139 560.693
## 110692 -37.29847 -8.410139 560.414
## 110693 -37.29819 -8.410139 560.686
## 110694 -37.29791 -8.410139 561.069
## 110695 -37.29763 -8.410139 561.763
## 110696 -37.29736 -8.410139 561.983
## 110697 -37.29708 -8.410139 562.142
## 110698 -37.29680 -8.410139 562.134
## 110699 -37.29652 -8.410139 562.045
## 110700 -37.29625 -8.410139 561.824
## 110701 -37.29597 -8.410139 561.342
## 110702 -37.29569 -8.410139 560.747
## 110703 -37.29541 -8.410139 559.938
## 110704 -37.29513 -8.410139 559.508
## 110705 -37.29486 -8.410139 559.017
## 110706 -37.29458 -8.410139 558.489
## 110707 -37.29430 -8.410139 558.239
## 110708 -37.29402 -8.410139 558.210
## 110709 -37.29375 -8.410139 558.237
## 110710 -37.29347 -8.410139 558.160
## 110711 -37.29319 -8.410139 557.834
## 110712 -37.29291 -8.410139 557.683
## 110713 -37.29263 -8.410139 557.988
## 110714 -37.29236 -8.410139 558.966
## 110715 -37.29208 -8.410139 560.278
## 110716 -37.29180 -8.410139 561.290
## 110717 -37.29152 -8.410139 561.939
## 110718 -37.29125 -8.410139 562.379
## 110719 -37.29097 -8.410139 562.042
## 110720 -37.29069 -8.410139 561.647
## 110721 -37.29041 -8.410139 560.989
## 110722 -37.29013 -8.410139 560.367
## 110723 -37.28986 -8.410139 559.801
## 110724 -37.28958 -8.410139 559.130
## 110725 -37.28930 -8.410139 558.865
## 110726 -37.28902 -8.410139 558.661
## 110727 -37.28875 -8.410139 558.140
## 110728 -37.28847 -8.410139 557.507
## 110729 -37.28819 -8.410139 557.149
## 110730 -37.28791 -8.410139 557.091
## 110731 -37.28763 -8.410139 557.436
## 110732 -37.28736 -8.410139 558.159
## 110733 -37.28708 -8.410139 558.975
## 110734 -37.28680 -8.410139 559.976
## 110735 -37.28652 -8.410139 560.337
## 110736 -37.28625 -8.410139 560.729
## 110737 -37.28597 -8.410139 561.205
## 110738 -37.28569 -8.410139 562.300
## 110739 -37.28541 -8.410139 563.373
## 110740 -37.28513 -8.410139 564.207
## 110741 -37.28486 -8.410139 564.145
## 110742 -37.28458 -8.410139 563.756
## 110743 -37.28430 -8.410139 563.243
## 110744 -37.28402 -8.410139 562.944
## 110745 -37.28375 -8.410139 562.754
## 110746 -37.28347 -8.410139 562.571
## 110747 -37.28319 -8.410139 562.722
## 110748 -37.28291 -8.410139 562.801
## 110749 -37.28263 -8.410139 562.983
## 110750 -37.28236 -8.410139 562.381
## 110751 -37.28208 -8.410139 561.529
## 110752 -37.28180 -8.410139 560.481
## 110753 -37.28152 -8.410139 559.735
## 110754 -37.28125 -8.410139 559.360
## 110755 -37.28097 -8.410139 559.318
## 110756 -37.28069 -8.410139 560.160
## 110757 -37.28041 -8.410139 561.298
## 110758 -37.28013 -8.410139 562.714
## 110759 -37.27986 -8.410139 563.726
## 110760 -37.27958 -8.410139 564.550
## 110761 -37.27930 -8.410139 565.597
## 110762 -37.27902 -8.410139 566.778
## 110763 -37.27875 -8.410139 568.007
## 110764 -37.27847 -8.410139 569.188
## 110765 -37.27819 -8.410139 569.899
## 110766 -37.27791 -8.410139 570.527
## 110767 -37.27763 -8.410139 571.037
## 110768 -37.27736 -8.410139 572.040
## 110769 -37.27708 -8.410139 573.151
## 110770 -37.27680 -8.410139 574.598
## 110771 -37.27652 -8.410139 575.922
## 110772 -37.27625 -8.410139 577.090
## 110773 -37.27597 -8.410139 577.900
## 110774 -37.27569 -8.410139 577.956
## 110775 -37.27541 -8.410139 577.637
## 110776 -37.27513 -8.410139 576.767
## 110777 -37.27486 -8.410139 576.120
## 110778 -37.27458 -8.410139 575.406
## 110779 -37.27430 -8.410139 574.946
## 110780 -37.27402 -8.410139 574.638
## 110781 -37.27375 -8.410139 574.331
## 110782 -37.27347 -8.410139 573.964
## 110783 -37.27319 -8.410139 573.258
## 110784 -37.27291 -8.410139 572.512
## 110785 -37.27263 -8.410139 571.913
## 110786 -37.27236 -8.410139 571.588
## 110787 -37.27208 -8.410139 571.402
## 110788 -37.27180 -8.410139 570.801
## 110789 -37.27152 -8.410139 570.133
## 110790 -37.27125 -8.410139 569.683
## 110791 -37.27097 -8.410139 569.453
## 110792 -37.27069 -8.410139 569.669
## 110793 -37.27041 -8.410139 569.742
## 110794 -37.27013 -8.410139 569.689
## 110795 -37.26986 -8.410139 568.734
## 110796 -37.26958 -8.410139 567.497
## 110797 -37.26930 -8.410139 566.218
## 110798 -37.26902 -8.410139 565.169
## 110799 -37.26875 -8.410139 564.872
## 110800 -37.26847 -8.410139 565.190
## 110801 -37.26819 -8.410139 566.440
## 110802 -37.26791 -8.410139 568.024
## 110803 -37.26763 -8.410139 569.286
## 110804 -37.26736 -8.410139 569.797
## 110805 -37.26708 -8.410139 569.953
## 110806 -37.26680 -8.410139 569.974
## 110807 -37.26652 -8.410139 570.229
## 110808 -37.26625 -8.410139 570.465
## 110809 -37.26597 -8.410139 570.404
## 110810 -37.26569 -8.410139 570.120
## 110811 -37.26541 -8.410139 569.662
## 110812 -37.26513 -8.410139 569.224
## 110813 -37.26486 -8.410139 568.430
## 110814 -37.26458 -8.410139 567.457
## 110815 -37.26430 -8.410139 566.532
## 110816 -37.26402 -8.410139 565.881
## 110817 -37.26375 -8.410139 564.930
## 110818 -37.26347 -8.410139 564.109
## 110819 -37.26319 -8.410139 563.011
## 110820 -37.26291 -8.410139 562.218
## 110821 -37.26263 -8.410139 561.747
## 110822 -37.26236 -8.410139 562.208
## 110823 -37.26208 -8.410139 563.059
## 110824 -37.26180 -8.410139 564.315
## 110825 -37.26152 -8.410139 565.371
## 110826 -37.26125 -8.410139 566.014
## 110827 -37.26097 -8.410139 566.713
## 110828 -37.26069 -8.410139 567.162
## 110829 -37.26041 -8.410139 567.465
## 110830 -37.26013 -8.410139 567.558
## 110831 -37.25986 -8.410139 567.720
## 110832 -37.25958 -8.410139 567.976
## 110833 -37.25930 -8.410139 568.550
## 110834 -37.25902 -8.410139 568.820
## 110835 -37.25875 -8.410139 568.659
## 110836 -37.25847 -8.410139 567.870
## 110837 -37.25819 -8.410139 566.309
## 110838 -37.25791 -8.410139 564.726
## 110839 -37.25763 -8.410139 563.159
## 110840 -37.25736 -8.410139 562.706
## 110841 -37.25708 -8.410139 562.398
## 110842 -37.25680 -8.410139 561.732
## 110843 -37.25652 -8.410139 560.398
## 110844 -37.25625 -8.410139 559.074
## 110845 -37.25597 -8.410139 558.359
## 110846 -37.25569 -8.410139 558.670
## 110847 -37.25541 -8.410139 559.175
## 110848 -37.25513 -8.410139 559.817
## 110849 -37.25486 -8.410139 559.580
## 110850 -37.25458 -8.410139 559.389
## 110851 -37.25430 -8.410139 559.137
## 110852 -37.25402 -8.410139 559.434
## 110853 -37.25375 -8.410139 560.737
## 110854 -37.25347 -8.410139 562.567
## 110855 -37.25319 -8.410139 564.846
## 110856 -37.25291 -8.410139 567.322
## 110857 -37.25263 -8.410139 569.393
## 110858 -37.25236 -8.410139 571.160
## 110859 -37.25208 -8.410139 572.572
## 110860 -37.25180 -8.410139 573.609
## 110861 -37.25152 -8.410139 574.181
## 110862 -37.25125 -8.410139 574.247
## 110863 -37.25097 -8.410139 574.232
## 110864 -37.25069 -8.410139 574.124
## 110865 -37.25041 -8.410139 574.077
## 110866 -37.25013 -8.410139 573.896
## 110867 -37.24986 -8.410139 573.785
## 110868 -37.24958 -8.410139 574.051
## 110869 -37.24930 -8.410139 574.347
## 110870 -37.24902 -8.410139 575.294
## 110871 -37.24875 -8.410139 576.297
## 110872 -37.24847 -8.410139 576.914
## 110873 -37.24819 -8.410139 577.097
## 110874 -37.24791 -8.410139 577.351
## 110875 -37.24763 -8.410139 578.054
## 110876 -37.24736 -8.410139 579.392
## 110877 -37.24708 -8.410139 580.868
## 110878 -37.24680 -8.410139 582.211
## 110879 -37.24652 -8.410139 583.409
## 110880 -37.24625 -8.410139 584.615
## 110881 -37.24597 -8.410139 585.483
## 110882 -37.24569 -8.410139 585.907
## 110883 -37.24541 -8.410139 586.200
## 110884 -37.24513 -8.410139 586.672
## 110885 -37.24486 -8.410139 587.611
## 110886 -37.24458 -8.410139 588.552
## 110887 -37.24430 -8.410139 589.399
## 110888 -37.24402 -8.410139 590.108
## 110889 -37.24375 -8.410139 590.906
## 110890 -37.24347 -8.410139 591.918
## 110891 -37.24319 -8.410139 593.222
## 110892 -37.24291 -8.410139 594.953
## 110893 -37.24263 -8.410139 597.327
## 110894 -37.24236 -8.410139 600.978
## 110895 -37.24208 -8.410139 604.628
## 110896 -37.24180 -8.410139 608.232
## 110897 -37.24152 -8.410139 610.233
## 110898 -37.24125 -8.410139 611.697
## 110899 -37.24097 -8.410139 613.428
## 110900 -37.24069 -8.410139 616.154
## 110901 -37.24041 -8.410139 618.557
## 110902 -37.24013 -8.410139 620.049
## 110903 -37.23986 -8.410139 619.783
## 110904 -37.23958 -8.410139 618.919
## 110905 -37.23930 -8.410139 618.077
## 110906 -37.23902 -8.410139 617.494
## 110907 -37.23875 -8.410139 616.291
## 110908 -37.23847 -8.410139 614.028
## 110909 -37.23819 -8.410139 610.317
## 110910 -37.23791 -8.410139 606.348
## 110911 -37.23763 -8.410139 602.174
## 110912 -37.23736 -8.410139 598.894
## 110913 -37.23708 -8.410139 596.138
## 110914 -37.23680 -8.410139 594.408
## 110915 -37.23652 -8.410139 592.760
## 110916 -37.23625 -8.410139 591.274
## 110917 -37.23597 -8.410139 589.542
## 110918 -37.23569 -8.410139 587.250
## 110919 -37.23541 -8.410139 585.049
## 110920 -37.23513 -8.410139 582.703
## 110921 -37.23486 -8.410139 581.190
## 110922 -37.23458 -8.410139 579.979
## 110923 -37.23430 -8.410139 578.877
## 110924 -37.23402 -8.410139 578.097
## 110925 -37.23375 -8.410139 576.957
## 110926 -37.23347 -8.410139 575.656
## 110927 -37.23319 -8.410139 574.139
## 110928 -37.23291 -8.410139 572.876
## 110929 -37.23263 -8.410139 572.142
## 110930 -37.23236 -8.410139 572.265
## 110931 -37.23208 -8.410139 573.116
## 110932 -37.23180 -8.410139 574.541
## 110933 -37.23152 -8.410139 576.133
## 110934 -37.23125 -8.410139 577.752
## 110935 -37.23097 -8.410139 579.098
## 110936 -37.23069 -8.410139 580.408
## 110937 -37.23041 -8.410139 581.632
## 110938 -37.23013 -8.410139 582.852
## 110939 -37.22986 -8.410139 583.822
## 110940 -37.22958 -8.410139 584.401
## 110941 -37.22930 -8.410139 584.773
## 110942 -37.22902 -8.410139 584.973
## 110943 -37.22875 -8.410139 584.772
## 110944 -37.22847 -8.410139 584.421
## 110945 -37.22819 -8.410139 584.436
## 110946 -37.22791 -8.410139 584.495
## 110947 -37.22763 -8.410139 585.008
## 110948 -37.22736 -8.410139 585.242
## 110949 -37.22708 -8.410139 585.234
## 110950 -37.22680 -8.410139 585.232
## 110951 -37.22652 -8.410139 584.678
## 110952 -37.22625 -8.410139 584.059
## 110953 -37.22597 -8.410139 583.321
## 110954 -37.22569 -8.410139 582.238
## 110955 -37.22541 -8.410139 580.915
## 110956 -37.22513 -8.410139 579.861
## 110957 -37.22486 -8.410139 578.513
## 110958 -37.22458 -8.410139 577.112
## 110959 -37.22430 -8.410139 575.689
## 110960 -37.22402 -8.410139 574.520
## 110961 -37.22375 -8.410139 573.578
## 111807 -37.36513 -8.410417 519.456
## 111808 -37.36486 -8.410417 519.803
## 111809 -37.36458 -8.410417 520.525
## 111810 -37.36430 -8.410417 521.200
## 111811 -37.36402 -8.410417 522.023
## 111812 -37.36375 -8.410417 522.643
## 111813 -37.36347 -8.410417 523.216
## 111814 -37.36319 -8.410417 523.637
## 111815 -37.36291 -8.410417 524.185
## 111816 -37.36263 -8.410417 525.158
## 111817 -37.36236 -8.410417 526.303
## 111818 -37.36208 -8.410417 527.915
## 111819 -37.36180 -8.410417 529.723
## 111820 -37.36152 -8.410417 531.726
## 111821 -37.36125 -8.410417 533.668
## 111822 -37.36097 -8.410417 535.510
## 111823 -37.36069 -8.410417 536.863
## 111824 -37.36041 -8.410417 538.077
## 111825 -37.36013 -8.410417 539.126
## 111826 -37.35986 -8.410417 540.359
## 111827 -37.35958 -8.410417 541.422
## 111828 -37.35930 -8.410417 542.375
## 111829 -37.35902 -8.410417 542.847
## 111830 -37.35875 -8.410417 543.240
## 111831 -37.35847 -8.410417 543.686
## 111832 -37.35819 -8.410417 544.248
## 111833 -37.35791 -8.410417 545.032
## 111834 -37.35763 -8.410417 546.033
## 111835 -37.35736 -8.410417 547.148
## 111836 -37.35708 -8.410417 548.277
## 111837 -37.35680 -8.410417 549.272
## 111838 -37.35652 -8.410417 549.693
## 111839 -37.35625 -8.410417 549.824
## 111840 -37.35597 -8.410417 549.564
## 111841 -37.35569 -8.410417 548.970
## 111842 -37.35541 -8.410417 548.148
## 111843 -37.35513 -8.410417 547.123
## 111844 -37.35486 -8.410417 546.455
## 111845 -37.35458 -8.410417 545.753
## 111846 -37.35430 -8.410417 545.320
## 111847 -37.35402 -8.410417 544.816
## 111848 -37.35375 -8.410417 544.687
## 111849 -37.35347 -8.410417 544.680
## 111850 -37.35319 -8.410417 545.466
## 111851 -37.35291 -8.410417 546.007
## 111852 -37.35263 -8.410417 546.040
## 111853 -37.35236 -8.410417 545.018
## 111854 -37.35208 -8.410417 543.800
## 111855 -37.35180 -8.410417 542.919
## 111856 -37.35152 -8.410417 543.189
## 111857 -37.35125 -8.410417 544.134
## 111858 -37.35097 -8.410417 545.404
## 111859 -37.35069 -8.410417 546.515
## 111860 -37.35041 -8.410417 547.572
## 111861 -37.35013 -8.410417 548.554
## 111862 -37.34986 -8.410417 549.393
## 111863 -37.34958 -8.410417 550.099
## 111864 -37.34930 -8.410417 550.675
## 111865 -37.34902 -8.410417 550.894
## 111866 -37.34875 -8.410417 551.089
## 111867 -37.34847 -8.410417 551.352
## 111868 -37.34819 -8.410417 551.572
## 111869 -37.34791 -8.410417 551.919
## 111870 -37.34763 -8.410417 552.383
## 111871 -37.34736 -8.410417 552.754
## 111872 -37.34708 -8.410417 553.141
## 111873 -37.34680 -8.410417 553.461
## 111874 -37.34652 -8.410417 553.318
## 111875 -37.34625 -8.410417 553.251
## 111876 -37.34597 -8.410417 553.301
## 111877 -37.34569 -8.410417 553.713
## 111878 -37.34541 -8.410417 554.134
## 111879 -37.34513 -8.410417 554.195
## 111880 -37.34486 -8.410417 553.976
## 111881 -37.34458 -8.410417 553.550
## 111882 -37.34430 -8.410417 553.303
## 111883 -37.34402 -8.410417 553.738
## 111884 -37.34375 -8.410417 554.279
## 111885 -37.34347 -8.410417 554.802
## 111886 -37.34319 -8.410417 554.896
## 111887 -37.34291 -8.410417 554.866
## 111888 -37.34263 -8.410417 554.752
## 111889 -37.34236 -8.410417 554.908
## 111890 -37.34208 -8.410417 554.970
## 111891 -37.34180 -8.410417 554.992
## 111892 -37.34152 -8.410417 554.491
## 111893 -37.34125 -8.410417 554.185
## 111894 -37.34097 -8.410417 554.117
## 111895 -37.34069 -8.410417 554.656
## 111896 -37.34041 -8.410417 555.441
## 111897 -37.34013 -8.410417 556.341
## 111898 -37.33986 -8.410417 557.159
## 111899 -37.33958 -8.410417 557.738
## 111900 -37.33930 -8.410417 557.896
## 111901 -37.33902 -8.410417 557.487
## 111902 -37.33875 -8.410417 556.693
## 111903 -37.33847 -8.410417 555.818
## 111904 -37.33819 -8.410417 554.983
## 111905 -37.33791 -8.410417 554.426
## 111906 -37.33763 -8.410417 554.266
## 111907 -37.33736 -8.410417 554.507
## 111908 -37.33708 -8.410417 555.004
## 111909 -37.33680 -8.410417 555.406
## 111910 -37.33652 -8.410417 555.688
## 111911 -37.33625 -8.410417 555.870
## 111912 -37.33597 -8.410417 556.208
## 111913 -37.33569 -8.410417 556.666
## 111914 -37.33541 -8.410417 557.190
## 111915 -37.33513 -8.410417 557.421
## 111916 -37.33486 -8.410417 557.441
## 111917 -37.33458 -8.410417 557.192
## 111918 -37.33430 -8.410417 556.821
## 111919 -37.33402 -8.410417 556.791
## 111920 -37.33375 -8.410417 556.792
## 111921 -37.33347 -8.410417 557.039
## 111922 -37.33319 -8.410417 557.337
## 111923 -37.33291 -8.410417 557.788
## 111924 -37.33263 -8.410417 558.299
## 111925 -37.33236 -8.410417 558.426
## 111926 -37.33208 -8.410417 558.457
## 111927 -37.33180 -8.410417 558.259
## 111928 -37.33152 -8.410417 557.680
## 111929 -37.33125 -8.410417 556.907
## 111930 -37.33097 -8.410417 555.984
## 111931 -37.33069 -8.410417 555.132
## 111932 -37.33041 -8.410417 554.360
## 111933 -37.33013 -8.410417 553.910
## 111934 -37.32986 -8.410417 553.705
## 111935 -37.32958 -8.410417 553.835
## 111936 -37.32930 -8.410417 554.205
## 111937 -37.32902 -8.410417 554.488
## 111938 -37.32875 -8.410417 554.938
## 111939 -37.32847 -8.410417 555.551
## 111940 -37.32819 -8.410417 555.971
## 111941 -37.32791 -8.410417 556.583
## 111942 -37.32763 -8.410417 557.215
## 111943 -37.32736 -8.410417 558.381
## 111944 -37.32708 -8.410417 559.389
## 111945 -37.32680 -8.410417 560.025
## 111946 -37.32652 -8.410417 560.418
## 111947 -37.32625 -8.410417 560.563
## 111948 -37.32597 -8.410417 560.763
## 111949 -37.32569 -8.410417 561.433
## 111950 -37.32541 -8.410417 562.129
## 111951 -37.32513 -8.410417 562.878
## 111952 -37.32486 -8.410417 562.671
## 111953 -37.32458 -8.410417 562.584
## 111954 -37.32430 -8.410417 562.522
## 111955 -37.32402 -8.410417 562.788
## 111956 -37.32375 -8.410417 563.194
## 111957 -37.32347 -8.410417 563.647
## 111958 -37.32319 -8.410417 564.063
## 111959 -37.32291 -8.410417 564.299
## 111960 -37.32263 -8.410417 564.251
## 111961 -37.32236 -8.410417 563.685
## 111962 -37.32208 -8.410417 563.095
## 111963 -37.32180 -8.410417 562.759
## 111964 -37.32152 -8.410417 563.337
## 111965 -37.32125 -8.410417 563.992
## 111966 -37.32097 -8.410417 564.715
## 111967 -37.32069 -8.410417 564.561
## 111968 -37.32041 -8.410417 564.469
## 111969 -37.32013 -8.410417 564.407
## 111970 -37.31986 -8.410417 564.990
## 111971 -37.31958 -8.410417 565.659
## 111972 -37.31930 -8.410417 566.319
## 111973 -37.31902 -8.410417 567.127
## 111974 -37.31875 -8.410417 567.628
## 111975 -37.31847 -8.410417 567.889
## 111976 -37.31819 -8.410417 567.304
## 111977 -37.31791 -8.410417 566.598
## 111978 -37.31763 -8.410417 566.033
## 111979 -37.31736 -8.410417 565.515
## 111980 -37.31708 -8.410417 565.483
## 111981 -37.31680 -8.410417 565.862
## 111982 -37.31652 -8.410417 566.977
## 111983 -37.31625 -8.410417 568.226
## 111984 -37.31597 -8.410417 569.064
## 111985 -37.31569 -8.410417 569.491
## 111986 -37.31541 -8.410417 569.342
## 111987 -37.31513 -8.410417 568.780
## 111988 -37.31486 -8.410417 568.737
## 111989 -37.31458 -8.410417 568.449
## 111990 -37.31430 -8.410417 568.237
## 111991 -37.31402 -8.410417 567.651
## 111992 -37.31375 -8.410417 567.211
## 111993 -37.31347 -8.410417 566.795
## 111994 -37.31319 -8.410417 566.590
## 111995 -37.31291 -8.410417 566.324
## 111996 -37.31263 -8.410417 565.929
## 111997 -37.31236 -8.410417 565.340
## 111998 -37.31208 -8.410417 564.334
## 111999 -37.31180 -8.410417 562.779
## 112000 -37.31152 -8.410417 560.401
## 112001 -37.31125 -8.410417 557.871
## 112002 -37.31097 -8.410417 555.686
## 112003 -37.31069 -8.410417 553.798
## 112004 -37.31041 -8.410417 552.845
## 112005 -37.31013 -8.410417 552.740
## 112006 -37.30986 -8.410417 553.862
## 112007 -37.30958 -8.410417 555.485
## 112008 -37.30930 -8.410417 557.313
## 112009 -37.30902 -8.410417 558.844
## 112010 -37.30875 -8.410417 560.243
## 112011 -37.30847 -8.410417 561.535
## 112012 -37.30819 -8.410417 562.409
## 112013 -37.30791 -8.410417 563.403
## 112014 -37.30763 -8.410417 564.634
## 112015 -37.30736 -8.410417 566.383
## 112016 -37.30708 -8.410417 568.006
## 112017 -37.30680 -8.410417 568.859
## 112018 -37.30652 -8.410417 568.887
## 112019 -37.30625 -8.410417 568.472
## 112020 -37.30597 -8.410417 567.940
## 112021 -37.30569 -8.410417 568.872
## 112022 -37.30541 -8.410417 569.575
## 112023 -37.30513 -8.410417 569.815
## 112024 -37.30486 -8.410417 569.021
## 112025 -37.30458 -8.410417 567.604
## 112026 -37.30430 -8.410417 565.722
## 112027 -37.30402 -8.410417 563.688
## 112028 -37.30375 -8.410417 562.030
## 112029 -37.30347 -8.410417 561.452
## 112030 -37.30319 -8.410417 562.370
## 112031 -37.30291 -8.410417 564.173
## 112032 -37.30263 -8.410417 566.117
## 112033 -37.30236 -8.410417 567.418
## 112034 -37.30208 -8.410417 568.275
## 112035 -37.30180 -8.410417 568.544
## 112036 -37.30152 -8.410417 568.582
## 112037 -37.30125 -8.410417 568.225
## 112038 -37.30097 -8.410417 567.603
## 112039 -37.30069 -8.410417 567.306
## 112040 -37.30041 -8.410417 566.805
## 112041 -37.30013 -8.410417 566.169
## 112042 -37.29986 -8.410417 565.378
## 112043 -37.29958 -8.410417 564.546
## 112044 -37.29930 -8.410417 563.847
## 112045 -37.29902 -8.410417 563.023
## 112046 -37.29875 -8.410417 562.512
## 112047 -37.29847 -8.410417 562.191
## 112048 -37.29819 -8.410417 562.354
## 112049 -37.29791 -8.410417 562.597
## 112050 -37.29763 -8.410417 562.859
## 112051 -37.29736 -8.410417 562.990
## 112052 -37.29708 -8.410417 563.052
## 112053 -37.29680 -8.410417 563.014
## 112054 -37.29652 -8.410417 562.983
## 112055 -37.29625 -8.410417 562.854
## 112056 -37.29597 -8.410417 562.641
## 112057 -37.29569 -8.410417 562.428
## 112058 -37.29541 -8.410417 562.087
## 112059 -37.29513 -8.410417 561.496
## 112060 -37.29486 -8.410417 560.849
## 112061 -37.29458 -8.410417 560.068
## 112062 -37.29430 -8.410417 559.212
## 112063 -37.29402 -8.410417 558.996
## 112064 -37.29375 -8.410417 558.671
## 112065 -37.29347 -8.410417 558.279
## 112066 -37.29319 -8.410417 557.851
## 112067 -37.29291 -8.410417 557.566
## 112068 -37.29263 -8.410417 557.755
## 112069 -37.29236 -8.410417 558.716
## 112070 -37.29208 -8.410417 559.993
## 112071 -37.29180 -8.410417 561.499
## 112072 -37.29152 -8.410417 562.274
## 112073 -37.29125 -8.410417 562.921
## 112074 -37.29097 -8.410417 563.160
## 112075 -37.29069 -8.410417 562.764
## 112076 -37.29041 -8.410417 562.064
## 112077 -37.29013 -8.410417 561.198
## 112078 -37.28986 -8.410417 560.379
## 112079 -37.28958 -8.410417 559.599
## 112080 -37.28930 -8.410417 558.885
## 112081 -37.28902 -8.410417 558.219
## 112082 -37.28875 -8.410417 557.656
## 112083 -37.28847 -8.410417 557.369
## 112084 -37.28819 -8.410417 557.020
## 112085 -37.28791 -8.410417 557.046
## 112086 -37.28763 -8.410417 557.357
## 112087 -37.28736 -8.410417 558.092
## 112088 -37.28708 -8.410417 558.947
## 112089 -37.28680 -8.410417 559.750
## 112090 -37.28652 -8.410417 560.211
## 112091 -37.28625 -8.410417 560.732
## 112092 -37.28597 -8.410417 561.508
## 112093 -37.28569 -8.410417 562.610
## 112094 -37.28541 -8.410417 563.766
## 112095 -37.28513 -8.410417 564.591
## 112096 -37.28486 -8.410417 564.727
## 112097 -37.28458 -8.410417 564.594
## 112098 -37.28430 -8.410417 564.520
## 112099 -37.28402 -8.410417 564.548
## 112100 -37.28375 -8.410417 564.715
## 112101 -37.28347 -8.410417 564.883
## 112102 -37.28319 -8.410417 565.011
## 112103 -37.28291 -8.410417 564.920
## 112104 -37.28263 -8.410417 564.480
## 112105 -37.28236 -8.410417 563.520
## 112106 -37.28208 -8.410417 562.340
## 112107 -37.28180 -8.410417 561.174
## 112108 -37.28152 -8.410417 560.069
## 112109 -37.28125 -8.410417 559.394
## 112110 -37.28097 -8.410417 559.279
## 112111 -37.28069 -8.410417 559.954
## 112112 -37.28041 -8.410417 561.072
## 112113 -37.28013 -8.410417 562.386
## 112114 -37.27986 -8.410417 563.626
## 112115 -37.27958 -8.410417 564.871
## 112116 -37.27930 -8.410417 566.236
## 112117 -37.27902 -8.410417 567.489
## 112118 -37.27875 -8.410417 568.735
## 112119 -37.27847 -8.410417 569.807
## 112120 -37.27819 -8.410417 570.462
## 112121 -37.27791 -8.410417 571.025
## 112122 -37.27763 -8.410417 571.634
## 112123 -37.27736 -8.410417 572.493
## 112124 -37.27708 -8.410417 573.492
## 112125 -37.27680 -8.410417 574.603
## 112126 -37.27652 -8.410417 575.899
## 112127 -37.27625 -8.410417 576.999
## 112128 -37.27597 -8.410417 577.784
## 112129 -37.27569 -8.410417 577.784
## 112130 -37.27541 -8.410417 577.454
## 112131 -37.27513 -8.410417 576.894
## 112132 -37.27486 -8.410417 576.281
## 112133 -37.27458 -8.410417 575.649
## 112134 -37.27430 -8.410417 574.936
## 112135 -37.27402 -8.410417 574.730
## 112136 -37.27375 -8.410417 574.347
## 112137 -37.27347 -8.410417 573.817
## 112138 -37.27319 -8.410417 573.104
## 112139 -37.27291 -8.410417 572.349
## 112140 -37.27263 -8.410417 571.781
## 112141 -37.27236 -8.410417 571.606
## 112142 -37.27208 -8.410417 571.525
## 112143 -37.27180 -8.410417 571.453
## 112144 -37.27152 -8.410417 570.797
## 112145 -37.27125 -8.410417 570.260
## 112146 -37.27097 -8.410417 569.774
## 112147 -37.27069 -8.410417 569.889
## 112148 -37.27041 -8.410417 569.869
## 112149 -37.27013 -8.410417 569.498
## 112150 -37.26986 -8.410417 568.400
## 112151 -37.26958 -8.410417 567.128
## 112152 -37.26930 -8.410417 566.020
## 112153 -37.26902 -8.410417 565.381
## 112154 -37.26875 -8.410417 565.317
## 112155 -37.26847 -8.410417 565.854
## 112156 -37.26819 -8.410417 566.968
## 112157 -37.26791 -8.410417 568.294
## 112158 -37.26763 -8.410417 569.406
## 112159 -37.26736 -8.410417 569.895
## 112160 -37.26708 -8.410417 570.121
## 112161 -37.26680 -8.410417 570.392
## 112162 -37.26652 -8.410417 570.886
## 112163 -37.26625 -8.410417 571.313
## 112164 -37.26597 -8.410417 571.561
## 112165 -37.26569 -8.410417 571.130
## 112166 -37.26541 -8.410417 570.466
## 112167 -37.26513 -8.410417 569.559
## 112168 -37.26486 -8.410417 568.453
## 112169 -37.26458 -8.410417 567.309
## 112170 -37.26430 -8.410417 566.198
## 112171 -37.26402 -8.410417 565.457
## 112172 -37.26375 -8.410417 564.693
## 112173 -37.26347 -8.410417 564.038
## 112174 -37.26319 -8.410417 562.908
## 112175 -37.26291 -8.410417 562.166
## 112176 -37.26263 -8.410417 561.972
## 112177 -37.26236 -8.410417 562.637
## 112178 -37.26208 -8.410417 563.713
## 112179 -37.26180 -8.410417 565.023
## 112180 -37.26152 -8.410417 565.829
## 112181 -37.26125 -8.410417 566.556
## 112182 -37.26097 -8.410417 567.177
## 112183 -37.26069 -8.410417 567.727
## 112184 -37.26041 -8.410417 568.223
## 112185 -37.26013 -8.410417 568.686
## 112186 -37.25986 -8.410417 568.851
## 112187 -37.25958 -8.410417 569.003
## 112188 -37.25930 -8.410417 568.920
## 112189 -37.25902 -8.410417 569.176
## 112190 -37.25875 -8.410417 568.925
## 112191 -37.25847 -8.410417 568.335
## 112192 -37.25819 -8.410417 566.709
## 112193 -37.25791 -8.410417 565.093
## 112194 -37.25763 -8.410417 563.795
## 112195 -37.25736 -8.410417 563.343
## 112196 -37.25708 -8.410417 563.015
## 112197 -37.25680 -8.410417 562.317
## 112198 -37.25652 -8.410417 560.854
## 112199 -37.25625 -8.410417 559.407
## 112200 -37.25597 -8.410417 558.201
## 112201 -37.25569 -8.410417 558.624
## 112202 -37.25541 -8.410417 559.176
## 112203 -37.25513 -8.410417 559.581
## 112204 -37.25486 -8.410417 559.219
## 112205 -37.25458 -8.410417 558.866
## 112206 -37.25430 -8.410417 558.926
## 112207 -37.25402 -8.410417 559.879
## 112208 -37.25375 -8.410417 561.503
## 112209 -37.25347 -8.410417 563.612
## 112210 -37.25319 -8.410417 565.801
## 112211 -37.25291 -8.410417 568.051
## 112212 -37.25263 -8.410417 570.030
## 112213 -37.25236 -8.410417 571.700
## 112214 -37.25208 -8.410417 572.840
## 112215 -37.25180 -8.410417 573.291
## 112216 -37.25152 -8.410417 573.459
## 112217 -37.25125 -8.410417 573.189
## 112218 -37.25097 -8.410417 572.794
## 112219 -37.25069 -8.410417 572.678
## 112220 -37.25041 -8.410417 572.595
## 112221 -37.25013 -8.410417 572.538
## 112222 -37.24986 -8.410417 572.415
## 112223 -37.24958 -8.410417 572.500
## 112224 -37.24930 -8.410417 573.125
## 112225 -37.24902 -8.410417 574.118
## 112226 -37.24875 -8.410417 575.338
## 112227 -37.24847 -8.410417 576.406
## 112228 -37.24819 -8.410417 576.870
## 112229 -37.24791 -8.410417 577.278
## 112230 -37.24763 -8.410417 577.925
## 112231 -37.24736 -8.410417 579.138
## 112232 -37.24708 -8.410417 580.572
## 112233 -37.24680 -8.410417 582.067
## 112234 -37.24652 -8.410417 583.447
## 112235 -37.24625 -8.410417 584.616
## 112236 -37.24597 -8.410417 585.447
## 112237 -37.24569 -8.410417 585.759
## 112238 -37.24541 -8.410417 585.970
## 112239 -37.24513 -8.410417 586.382
## 112240 -37.24486 -8.410417 587.304
## 112241 -37.24458 -8.410417 588.369
## 112242 -37.24430 -8.410417 589.332
## 112243 -37.24402 -8.410417 590.097
## 112244 -37.24375 -8.410417 590.823
## 112245 -37.24347 -8.410417 591.635
## 112246 -37.24319 -8.410417 592.737
## 112247 -37.24291 -8.410417 594.389
## 112248 -37.24263 -8.410417 596.934
## 112249 -37.24236 -8.410417 600.701
## 112250 -37.24208 -8.410417 604.600
## 112251 -37.24180 -8.410417 607.633
## 112252 -37.24152 -8.410417 609.280
## 112253 -37.24125 -8.410417 610.413
## 112254 -37.24097 -8.410417 611.535
## 112255 -37.24069 -8.410417 614.042
## 112256 -37.24041 -8.410417 616.240
## 112257 -37.24013 -8.410417 617.534
## 112258 -37.23986 -8.410417 617.128
## 112259 -37.23958 -8.410417 616.012
## 112260 -37.23930 -8.410417 614.803
## 112261 -37.23902 -8.410417 614.203
## 112262 -37.23875 -8.410417 613.182
## 112263 -37.23847 -8.410417 611.643
## 112264 -37.23819 -8.410417 608.138
## 112265 -37.23791 -8.410417 604.430
## 112266 -37.23763 -8.410417 600.826
## 112267 -37.23736 -8.410417 597.943
## 112268 -37.23708 -8.410417 595.543
## 112269 -37.23680 -8.410417 593.616
## 112270 -37.23652 -8.410417 592.032
## 112271 -37.23625 -8.410417 590.572
## 112272 -37.23597 -8.410417 589.112
## 112273 -37.23569 -8.410417 586.981
## 112274 -37.23541 -8.410417 584.889
## 112275 -37.23513 -8.410417 582.944
## 112276 -37.23486 -8.410417 581.418
## 112277 -37.23458 -8.410417 580.088
## 112278 -37.23430 -8.410417 578.858
## 112279 -37.23402 -8.410417 577.755
## 112280 -37.23375 -8.410417 576.608
## 112281 -37.23347 -8.410417 575.416
## 112282 -37.23319 -8.410417 574.018
## 112283 -37.23291 -8.410417 572.888
## 112284 -37.23263 -8.410417 572.330
## 112285 -37.23236 -8.410417 572.611
## 112286 -37.23208 -8.410417 573.512
## 112287 -37.23180 -8.410417 574.942
## 112288 -37.23152 -8.410417 576.476
## 112289 -37.23125 -8.410417 578.187
## 112290 -37.23097 -8.410417 579.898
## 112291 -37.23069 -8.410417 581.163
## 112292 -37.23041 -8.410417 582.313
## 112293 -37.23013 -8.410417 583.301
## 112294 -37.22986 -8.410417 584.167
## 112295 -37.22958 -8.410417 584.802
## 112296 -37.22930 -8.410417 585.186
## 112297 -37.22902 -8.410417 585.171
## 112298 -37.22875 -8.410417 585.037
## 112299 -37.22847 -8.410417 584.857
## 112300 -37.22819 -8.410417 584.739
## 112301 -37.22791 -8.410417 584.726
## 112302 -37.22763 -8.410417 584.866
## 112303 -37.22736 -8.410417 585.225
## 112304 -37.22708 -8.410417 585.522
## 112305 -37.22680 -8.410417 585.506
## 112306 -37.22652 -8.410417 585.177
## 112307 -37.22625 -8.410417 584.466
## 112308 -37.22597 -8.410417 583.496
## 112309 -37.22569 -8.410417 582.605
## 112310 -37.22541 -8.410417 581.514
## 112311 -37.22513 -8.410417 580.367
## 112312 -37.22486 -8.410417 578.823
## 112313 -37.22458 -8.410417 577.383
## 112314 -37.22430 -8.410417 576.297
## 112315 -37.22402 -8.410417 575.331
## 112316 -37.22375 -8.410417 574.540
## 113162 -37.36513 -8.410694 519.776
## 113163 -37.36486 -8.410694 520.052
## 113164 -37.36458 -8.410694 520.675
## 113165 -37.36430 -8.410694 521.211
## 113166 -37.36402 -8.410694 521.518
## 113167 -37.36375 -8.410694 522.031
## 113168 -37.36347 -8.410694 522.484
## 113169 -37.36319 -8.410694 523.063
## 113170 -37.36291 -8.410694 523.824
## 113171 -37.36263 -8.410694 525.002
## 113172 -37.36236 -8.410694 526.581
## 113173 -37.36208 -8.410694 528.218
## 113174 -37.36180 -8.410694 530.107
## 113175 -37.36152 -8.410694 532.177
## 113176 -37.36125 -8.410694 534.134
## 113177 -37.36097 -8.410694 535.816
## 113178 -37.36069 -8.410694 536.968
## 113179 -37.36041 -8.410694 538.122
## 113180 -37.36013 -8.410694 539.316
## 113181 -37.35986 -8.410694 540.635
## 113182 -37.35958 -8.410694 541.978
## 113183 -37.35930 -8.410694 543.276
## 113184 -37.35902 -8.410694 544.085
## 113185 -37.35875 -8.410694 544.646
## 113186 -37.35847 -8.410694 545.071
## 113187 -37.35819 -8.410694 545.725
## 113188 -37.35791 -8.410694 546.467
## 113189 -37.35763 -8.410694 547.361
## 113190 -37.35736 -8.410694 548.433
## 113191 -37.35708 -8.410694 549.609
## 113192 -37.35680 -8.410694 550.539
## 113193 -37.35652 -8.410694 551.135
## 113194 -37.35625 -8.410694 551.295
## 113195 -37.35597 -8.410694 551.256
## 113196 -37.35569 -8.410694 550.766
## 113197 -37.35541 -8.410694 549.905
## 113198 -37.35513 -8.410694 548.679
## 113199 -37.35486 -8.410694 547.861
## 113200 -37.35458 -8.410694 547.067
## 113201 -37.35430 -8.410694 546.543
## 113202 -37.35402 -8.410694 546.370
## 113203 -37.35375 -8.410694 546.283
## 113204 -37.35347 -8.410694 546.527
## 113205 -37.35319 -8.410694 547.288
## 113206 -37.35291 -8.410694 547.700
## 113207 -37.35263 -8.410694 547.578
## 113208 -37.35236 -8.410694 546.322
## 113209 -37.35208 -8.410694 545.090
## 113210 -37.35180 -8.410694 544.211
## 113211 -37.35152 -8.410694 544.446
## 113212 -37.35125 -8.410694 545.334
## 113213 -37.35097 -8.410694 546.497
## 113214 -37.35069 -8.410694 547.500
## 113215 -37.35041 -8.410694 548.542
## 113216 -37.35013 -8.410694 549.486
## 113217 -37.34986 -8.410694 550.396
## 113218 -37.34958 -8.410694 551.069
## 113219 -37.34930 -8.410694 551.638
## 113220 -37.34902 -8.410694 551.921
## 113221 -37.34875 -8.410694 552.133
## 113222 -37.34847 -8.410694 552.290
## 113223 -37.34819 -8.410694 552.607
## 113224 -37.34791 -8.410694 553.018
## 113225 -37.34763 -8.410694 553.506
## 113226 -37.34736 -8.410694 554.129
## 113227 -37.34708 -8.410694 554.620
## 113228 -37.34680 -8.410694 555.030
## 113229 -37.34652 -8.410694 555.119
## 113230 -37.34625 -8.410694 555.096
## 113231 -37.34597 -8.410694 555.176
## 113232 -37.34569 -8.410694 555.583
## 113233 -37.34541 -8.410694 555.889
## 113234 -37.34513 -8.410694 555.900
## 113235 -37.34486 -8.410694 555.339
## 113236 -37.34458 -8.410694 554.889
## 113237 -37.34430 -8.410694 554.674
## 113238 -37.34402 -8.410694 554.965
## 113239 -37.34375 -8.410694 555.477
## 113240 -37.34347 -8.410694 555.938
## 113241 -37.34319 -8.410694 556.049
## 113242 -37.34291 -8.410694 555.881
## 113243 -37.34263 -8.410694 555.497
## 113244 -37.34236 -8.410694 555.487
## 113245 -37.34208 -8.410694 555.539
## 113246 -37.34180 -8.410694 555.684
## 113247 -37.34152 -8.410694 555.380
## 113248 -37.34125 -8.410694 555.174
## 113249 -37.34097 -8.410694 555.038
## 113250 -37.34069 -8.410694 555.551
## 113251 -37.34041 -8.410694 556.180
## 113252 -37.34013 -8.410694 556.762
## 113253 -37.33986 -8.410694 557.381
## 113254 -37.33958 -8.410694 557.798
## 113255 -37.33930 -8.410694 557.915
## 113256 -37.33902 -8.410694 557.390
## 113257 -37.33875 -8.410694 556.647
## 113258 -37.33847 -8.410694 556.023
## 113259 -37.33819 -8.410694 555.586
## 113260 -37.33791 -8.410694 555.212
## 113261 -37.33763 -8.410694 555.133
## 113262 -37.33736 -8.410694 555.399
## 113263 -37.33708 -8.410694 555.797
## 113264 -37.33680 -8.410694 555.852
## 113265 -37.33652 -8.410694 555.752
## 113266 -37.33625 -8.410694 555.809
## 113267 -37.33597 -8.410694 556.139
## 113268 -37.33569 -8.410694 556.706
## 113269 -37.33541 -8.410694 557.292
## 113270 -37.33513 -8.410694 557.941
## 113271 -37.33486 -8.410694 558.000
## 113272 -37.33458 -8.410694 557.834
## 113273 -37.33430 -8.410694 557.299
## 113274 -37.33402 -8.410694 557.163
## 113275 -37.33375 -8.410694 557.057
## 113276 -37.33347 -8.410694 557.145
## 113277 -37.33319 -8.410694 557.568
## 113278 -37.33291 -8.410694 557.994
## 113279 -37.33263 -8.410694 558.641
## 113280 -37.33236 -8.410694 559.071
## 113281 -37.33208 -8.410694 559.148
## 113282 -37.33180 -8.410694 559.020
## 113283 -37.33152 -8.410694 558.290
## 113284 -37.33125 -8.410694 557.539
## 113285 -37.33097 -8.410694 556.705
## 113286 -37.33069 -8.410694 555.833
## 113287 -37.33041 -8.410694 555.071
## 113288 -37.33013 -8.410694 554.459
## 113289 -37.32986 -8.410694 554.350
## 113290 -37.32958 -8.410694 554.512
## 113291 -37.32930 -8.410694 554.779
## 113292 -37.32902 -8.410694 555.180
## 113293 -37.32875 -8.410694 555.756
## 113294 -37.32847 -8.410694 556.677
## 113295 -37.32819 -8.410694 557.475
## 113296 -37.32791 -8.410694 558.170
## 113297 -37.32763 -8.410694 558.918
## 113298 -37.32736 -8.410694 559.817
## 113299 -37.32708 -8.410694 560.563
## 113300 -37.32680 -8.410694 560.682
## 113301 -37.32652 -8.410694 560.658
## 113302 -37.32625 -8.410694 560.727
## 113303 -37.32597 -8.410694 560.751
## 113304 -37.32569 -8.410694 561.495
## 113305 -37.32541 -8.410694 562.192
## 113306 -37.32513 -8.410694 563.155
## 113307 -37.32486 -8.410694 563.419
## 113308 -37.32458 -8.410694 563.362
## 113309 -37.32430 -8.410694 563.357
## 113310 -37.32402 -8.410694 563.401
## 113311 -37.32375 -8.410694 563.861
## 113312 -37.32347 -8.410694 564.209
## 113313 -37.32319 -8.410694 564.591
## 113314 -37.32291 -8.410694 564.941
## 113315 -37.32263 -8.410694 565.276
## 113316 -37.32236 -8.410694 564.932
## 113317 -37.32208 -8.410694 564.432
## 113318 -37.32180 -8.410694 563.880
## 113319 -37.32152 -8.410694 564.301
## 113320 -37.32125 -8.410694 564.933
## 113321 -37.32097 -8.410694 565.692
## 113322 -37.32069 -8.410694 565.725
## 113323 -37.32041 -8.410694 565.654
## 113324 -37.32013 -8.410694 565.839
## 113325 -37.31986 -8.410694 566.395
## 113326 -37.31958 -8.410694 567.057
## 113327 -37.31930 -8.410694 567.538
## 113328 -37.31902 -8.410694 568.046
## 113329 -37.31875 -8.410694 568.431
## 113330 -37.31847 -8.410694 568.416
## 113331 -37.31819 -8.410694 567.869
## 113332 -37.31791 -8.410694 567.112
## 113333 -37.31763 -8.410694 566.282
## 113334 -37.31736 -8.410694 566.102
## 113335 -37.31708 -8.410694 566.291
## 113336 -37.31680 -8.410694 567.151
## 113337 -37.31652 -8.410694 568.923
## 113338 -37.31625 -8.410694 570.287
## 113339 -37.31597 -8.410694 571.581
## 113340 -37.31569 -8.410694 571.646
## 113341 -37.31541 -8.410694 571.391
## 113342 -37.31513 -8.410694 570.433
## 113343 -37.31486 -8.410694 569.622
## 113344 -37.31458 -8.410694 569.123
## 113345 -37.31430 -8.410694 568.735
## 113346 -37.31402 -8.410694 568.209
## 113347 -37.31375 -8.410694 567.758
## 113348 -37.31347 -8.410694 567.709
## 113349 -37.31319 -8.410694 567.484
## 113350 -37.31291 -8.410694 567.051
## 113351 -37.31263 -8.410694 566.294
## 113352 -37.31236 -8.410694 565.304
## 113353 -37.31208 -8.410694 564.059
## 113354 -37.31180 -8.410694 561.844
## 113355 -37.31152 -8.410694 559.298
## 113356 -37.31125 -8.410694 556.946
## 113357 -37.31097 -8.410694 555.533
## 113358 -37.31069 -8.410694 554.558
## 113359 -37.31041 -8.410694 554.083
## 113360 -37.31013 -8.410694 554.409
## 113361 -37.30986 -8.410694 555.734
## 113362 -37.30958 -8.410694 557.483
## 113363 -37.30930 -8.410694 559.038
## 113364 -37.30902 -8.410694 560.408
## 113365 -37.30875 -8.410694 561.666
## 113366 -37.30847 -8.410694 562.898
## 113367 -37.30819 -8.410694 563.823
## 113368 -37.30791 -8.410694 564.760
## 113369 -37.30763 -8.410694 565.981
## 113370 -37.30736 -8.410694 567.698
## 113371 -37.30708 -8.410694 569.175
## 113372 -37.30680 -8.410694 570.173
## 113373 -37.30652 -8.410694 569.837
## 113374 -37.30625 -8.410694 569.389
## 113375 -37.30597 -8.410694 568.850
## 113376 -37.30569 -8.410694 569.368
## 113377 -37.30541 -8.410694 570.086
## 113378 -37.30513 -8.410694 570.279
## 113379 -37.30486 -8.410694 569.464
## 113380 -37.30458 -8.410694 567.964
## 113381 -37.30430 -8.410694 566.136
## 113382 -37.30402 -8.410694 564.251
## 113383 -37.30375 -8.410694 562.748
## 113384 -37.30347 -8.410694 562.194
## 113385 -37.30319 -8.410694 563.331
## 113386 -37.30291 -8.410694 565.072
## 113387 -37.30263 -8.410694 566.938
## 113388 -37.30236 -8.410694 568.273
## 113389 -37.30208 -8.410694 569.114
## 113390 -37.30180 -8.410694 569.712
## 113391 -37.30152 -8.410694 569.532
## 113392 -37.30125 -8.410694 569.201
## 113393 -37.30097 -8.410694 568.201
## 113394 -37.30069 -8.410694 567.763
## 113395 -37.30041 -8.410694 567.284
## 113396 -37.30013 -8.410694 566.765
## 113397 -37.29986 -8.410694 566.189
## 113398 -37.29958 -8.410694 565.438
## 113399 -37.29930 -8.410694 565.094
## 113400 -37.29902 -8.410694 564.675
## 113401 -37.29875 -8.410694 564.362
## 113402 -37.29847 -8.410694 564.094
## 113403 -37.29819 -8.410694 564.102
## 113404 -37.29791 -8.410694 564.189
## 113405 -37.29763 -8.410694 564.031
## 113406 -37.29736 -8.410694 564.043
## 113407 -37.29708 -8.410694 563.921
## 113408 -37.29680 -8.410694 563.936
## 113409 -37.29652 -8.410694 563.902
## 113410 -37.29625 -8.410694 563.865
## 113411 -37.29597 -8.410694 564.152
## 113412 -37.29569 -8.410694 564.323
## 113413 -37.29541 -8.410694 564.217
## 113414 -37.29513 -8.410694 563.860
## 113415 -37.29486 -8.410694 562.904
## 113416 -37.29458 -8.410694 561.945
## 113417 -37.29430 -8.410694 560.829
## 113418 -37.29402 -8.410694 560.013
## 113419 -37.29375 -8.410694 559.376
## 113420 -37.29347 -8.410694 558.678
## 113421 -37.29319 -8.410694 558.024
## 113422 -37.29291 -8.410694 557.704
## 113423 -37.29263 -8.410694 557.660
## 113424 -37.29236 -8.410694 558.665
## 113425 -37.29208 -8.410694 559.887
## 113426 -37.29180 -8.410694 561.336
## 113427 -37.29152 -8.410694 562.742
## 113428 -37.29125 -8.410694 563.671
## 113429 -37.29097 -8.410694 564.239
## 113430 -37.29069 -8.410694 564.113
## 113431 -37.29041 -8.410694 563.296
## 113432 -37.29013 -8.410694 562.242
## 113433 -37.28986 -8.410694 561.059
## 113434 -37.28958 -8.410694 560.124
## 113435 -37.28930 -8.410694 559.090
## 113436 -37.28902 -8.410694 557.965
## 113437 -37.28875 -8.410694 557.368
## 113438 -37.28847 -8.410694 557.191
## 113439 -37.28819 -8.410694 557.125
## 113440 -37.28791 -8.410694 557.134
## 113441 -37.28763 -8.410694 557.391
## 113442 -37.28736 -8.410694 558.105
## 113443 -37.28708 -8.410694 558.910
## 113444 -37.28680 -8.410694 559.623
## 113445 -37.28652 -8.410694 560.081
## 113446 -37.28625 -8.410694 560.717
## 113447 -37.28597 -8.410694 561.665
## 113448 -37.28569 -8.410694 562.959
## 113449 -37.28541 -8.410694 564.138
## 113450 -37.28513 -8.410694 564.968
## 113451 -37.28486 -8.410694 565.238
## 113452 -37.28458 -8.410694 565.372
## 113453 -37.28430 -8.410694 565.635
## 113454 -37.28402 -8.410694 566.086
## 113455 -37.28375 -8.410694 566.545
## 113456 -37.28347 -8.410694 567.177
## 113457 -37.28319 -8.410694 567.141
## 113458 -37.28291 -8.410694 566.837
## 113459 -37.28263 -8.410694 565.893
## 113460 -37.28236 -8.410694 564.494
## 113461 -37.28208 -8.410694 563.152
## 113462 -37.28180 -8.410694 561.765
## 113463 -37.28152 -8.410694 560.491
## 113464 -37.28125 -8.410694 559.577
## 113465 -37.28097 -8.410694 559.399
## 113466 -37.28069 -8.410694 560.019
## 113467 -37.28041 -8.410694 561.147
## 113468 -37.28013 -8.410694 562.457
## 113469 -37.27986 -8.410694 563.792
## 113470 -37.27958 -8.410694 565.240
## 113471 -37.27930 -8.410694 566.814
## 113472 -37.27902 -8.410694 568.355
## 113473 -37.27875 -8.410694 569.644
## 113474 -37.27847 -8.410694 570.548
## 113475 -37.27819 -8.410694 571.301
## 113476 -37.27791 -8.410694 571.889
## 113477 -37.27763 -8.410694 572.509
## 113478 -37.27736 -8.410694 573.304
## 113479 -37.27708 -8.410694 574.066
## 113480 -37.27680 -8.410694 574.851
## 113481 -37.27652 -8.410694 575.893
## 113482 -37.27625 -8.410694 576.845
## 113483 -37.27597 -8.410694 577.478
## 113484 -37.27569 -8.410694 577.430
## 113485 -37.27541 -8.410694 577.210
## 113486 -37.27513 -8.410694 576.983
## 113487 -37.27486 -8.410694 576.569
## 113488 -37.27458 -8.410694 576.047
## 113489 -37.27430 -8.410694 575.462
## 113490 -37.27402 -8.410694 575.016
## 113491 -37.27375 -8.410694 574.604
## 113492 -37.27347 -8.410694 573.914
## 113493 -37.27319 -8.410694 573.056
## 113494 -37.27291 -8.410694 572.323
## 113495 -37.27263 -8.410694 571.741
## 113496 -37.27236 -8.410694 571.727
## 113497 -37.27208 -8.410694 571.738
## 113498 -37.27180 -8.410694 571.882
## 113499 -37.27152 -8.410694 571.503
## 113500 -37.27125 -8.410694 570.924
## 113501 -37.27097 -8.410694 570.214
## 113502 -37.27069 -8.410694 570.130
## 113503 -37.27041 -8.410694 569.929
## 113504 -37.27013 -8.410694 569.301
## 113505 -37.26986 -8.410694 567.997
## 113506 -37.26958 -8.410694 566.766
## 113507 -37.26930 -8.410694 565.825
## 113508 -37.26902 -8.410694 565.707
## 113509 -37.26875 -8.410694 565.902
## 113510 -37.26847 -8.410694 566.567
## 113511 -37.26819 -8.410694 567.657
## 113512 -37.26791 -8.410694 568.861
## 113513 -37.26763 -8.410694 569.778
## 113514 -37.26736 -8.410694 570.202
## 113515 -37.26708 -8.410694 570.518
## 113516 -37.26680 -8.410694 570.964
## 113517 -37.26652 -8.410694 571.669
## 113518 -37.26625 -8.410694 572.154
## 113519 -37.26597 -8.410694 572.571
## 113520 -37.26569 -8.410694 571.979
## 113521 -37.26541 -8.410694 571.048
## 113522 -37.26513 -8.410694 569.756
## 113523 -37.26486 -8.410694 568.314
## 113524 -37.26458 -8.410694 567.107
## 113525 -37.26430 -8.410694 565.915
## 113526 -37.26402 -8.410694 565.204
## 113527 -37.26375 -8.410694 564.481
## 113528 -37.26347 -8.410694 563.707
## 113529 -37.26319 -8.410694 562.838
## 113530 -37.26291 -8.410694 562.164
## 113531 -37.26263 -8.410694 562.336
## 113532 -37.26236 -8.410694 563.267
## 113533 -37.26208 -8.410694 564.536
## 113534 -37.26180 -8.410694 565.961
## 113535 -37.26152 -8.410694 566.713
## 113536 -37.26125 -8.410694 567.479
## 113537 -37.26097 -8.410694 567.930
## 113538 -37.26069 -8.410694 568.450
## 113539 -37.26041 -8.410694 568.879
## 113540 -37.26013 -8.410694 569.555
## 113541 -37.25986 -8.410694 569.829
## 113542 -37.25958 -8.410694 569.902
## 113543 -37.25930 -8.410694 569.541
## 113544 -37.25902 -8.410694 569.331
## 113545 -37.25875 -8.410694 569.006
## 113546 -37.25847 -8.410694 568.263
## 113547 -37.25819 -8.410694 566.929
## 113548 -37.25791 -8.410694 565.410
## 113549 -37.25763 -8.410694 564.221
## 113550 -37.25736 -8.410694 563.922
## 113551 -37.25708 -8.410694 563.505
## 113552 -37.25680 -8.410694 562.820
## 113553 -37.25652 -8.410694 561.231
## 113554 -37.25625 -8.410694 559.735
## 113555 -37.25597 -8.410694 558.463
## 113556 -37.25569 -8.410694 558.593
## 113557 -37.25541 -8.410694 559.116
## 113558 -37.25513 -8.410694 559.326
## 113559 -37.25486 -8.410694 558.818
## 113560 -37.25458 -8.410694 558.486
## 113561 -37.25430 -8.410694 558.708
## 113562 -37.25402 -8.410694 560.406
## 113563 -37.25375 -8.410694 562.273
## 113564 -37.25347 -8.410694 564.496
## 113565 -37.25319 -8.410694 566.638
## 113566 -37.25291 -8.410694 568.705
## 113567 -37.25263 -8.410694 570.619
## 113568 -37.25236 -8.410694 571.923
## 113569 -37.25208 -8.410694 572.792
## 113570 -37.25180 -8.410694 572.874
## 113571 -37.25152 -8.410694 572.460
## 113572 -37.25125 -8.410694 571.924
## 113573 -37.25097 -8.410694 571.272
## 113574 -37.25069 -8.410694 571.107
## 113575 -37.25041 -8.410694 571.073
## 113576 -37.25013 -8.410694 571.181
## 113577 -37.24986 -8.410694 571.225
## 113578 -37.24958 -8.410694 571.419
## 113579 -37.24930 -8.410694 571.912
## 113580 -37.24902 -8.410694 573.238
## 113581 -37.24875 -8.410694 574.587
## 113582 -37.24847 -8.410694 576.128
## 113583 -37.24819 -8.410694 576.856
## 113584 -37.24791 -8.410694 577.458
## 113585 -37.24763 -8.410694 577.905
## 113586 -37.24736 -8.410694 579.029
## 113587 -37.24708 -8.410694 580.365
## 113588 -37.24680 -8.410694 581.909
## 113589 -37.24652 -8.410694 583.231
## 113590 -37.24625 -8.410694 584.330
## 113591 -37.24597 -8.410694 585.084
## 113592 -37.24569 -8.410694 585.262
## 113593 -37.24541 -8.410694 585.476
## 113594 -37.24513 -8.410694 585.889
## 113595 -37.24486 -8.410694 586.858
## 113596 -37.24458 -8.410694 587.983
## 113597 -37.24430 -8.410694 589.187
## 113598 -37.24402 -8.410694 590.056
## 113599 -37.24375 -8.410694 590.719
## 113600 -37.24347 -8.410694 591.294
## 113601 -37.24319 -8.410694 592.140
## 113602 -37.24291 -8.410694 593.654
## 113603 -37.24263 -8.410694 596.209
## 113604 -37.24236 -8.410694 599.863
## 113605 -37.24208 -8.410694 603.541
## 113606 -37.24180 -8.410694 606.364
## 113607 -37.24152 -8.410694 607.384
## 113608 -37.24125 -8.410694 608.195
## 113609 -37.24097 -8.410694 608.984
## 113610 -37.24069 -8.410694 610.944
## 113611 -37.24041 -8.410694 612.776
## 113612 -37.24013 -8.410694 614.029
## 113613 -37.23986 -8.410694 613.400
## 113614 -37.23958 -8.410694 612.280
## 113615 -37.23930 -8.410694 610.703
## 113616 -37.23902 -8.410694 610.116
## 113617 -37.23875 -8.410694 609.253
## 113618 -37.23847 -8.410694 608.051
## 113619 -37.23819 -8.410694 605.313
## 113620 -37.23791 -8.410694 602.069
## 113621 -37.23763 -8.410694 599.074
## 113622 -37.23736 -8.410694 596.815
## 113623 -37.23708 -8.410694 594.744
## 113624 -37.23680 -8.410694 592.728
## 113625 -37.23652 -8.410694 591.138
## 113626 -37.23625 -8.410694 589.761
## 113627 -37.23597 -8.410694 588.504
## 113628 -37.23569 -8.410694 586.718
## 113629 -37.23541 -8.410694 584.856
## 113630 -37.23513 -8.410694 583.187
## 113631 -37.23486 -8.410694 581.862
## 113632 -37.23458 -8.410694 580.434
## 113633 -37.23430 -8.410694 579.008
## 113634 -37.23402 -8.410694 577.527
## 113635 -37.23375 -8.410694 576.365
## 113636 -37.23347 -8.410694 575.248
## 113637 -37.23319 -8.410694 573.948
## 113638 -37.23291 -8.410694 572.955
## 113639 -37.23263 -8.410694 572.548
## 113640 -37.23236 -8.410694 573.035
## 113641 -37.23208 -8.410694 573.991
## 113642 -37.23180 -8.410694 575.153
## 113643 -37.23152 -8.410694 576.743
## 113644 -37.23125 -8.410694 578.394
## 113645 -37.23097 -8.410694 580.392
## 113646 -37.23069 -8.410694 581.631
## 113647 -37.23041 -8.410694 582.805
## 113648 -37.23013 -8.410694 583.587
## 113649 -37.22986 -8.410694 584.370
## 113650 -37.22958 -8.410694 585.114
## 113651 -37.22930 -8.410694 585.484
## 113652 -37.22902 -8.410694 585.493
## 113653 -37.22875 -8.410694 585.327
## 113654 -37.22847 -8.410694 585.228
## 113655 -37.22819 -8.410694 585.177
## 113656 -37.22791 -8.410694 585.123
## 113657 -37.22763 -8.410694 584.986
## 113658 -37.22736 -8.410694 585.275
## 113659 -37.22708 -8.410694 585.615
## 113660 -37.22680 -8.410694 585.802
## 113661 -37.22652 -8.410694 585.513
## 113662 -37.22625 -8.410694 584.693
## 113663 -37.22597 -8.410694 583.646
## 113664 -37.22569 -8.410694 582.845
## 113665 -37.22541 -8.410694 581.891
## 113666 -37.22513 -8.410694 580.557
## 113667 -37.22486 -8.410694 579.105
## 113668 -37.22458 -8.410694 577.651
## 113669 -37.22430 -8.410694 576.541
## 113670 -37.22402 -8.410694 575.998
## 113671 -37.22375 -8.410694 575.269
## 114516 -37.36541 -8.410972 520.285
## 114517 -37.36513 -8.410972 519.946
## 114518 -37.36486 -8.410972 520.073
## 114519 -37.36458 -8.410972 520.471
## 114520 -37.36430 -8.410972 520.939
## 114521 -37.36402 -8.410972 521.095
## 114522 -37.36375 -8.410972 521.433
## 114523 -37.36347 -8.410972 521.791
## 114524 -37.36319 -8.410972 522.746
## 114525 -37.36291 -8.410972 524.006
## 114526 -37.36263 -8.410972 525.645
## 114527 -37.36236 -8.410972 527.101
## 114528 -37.36208 -8.410972 528.613
## 114529 -37.36180 -8.410972 530.452
## 114530 -37.36152 -8.410972 532.564
## 114531 -37.36125 -8.410972 534.536
## 114532 -37.36097 -8.410972 536.368
## 114533 -37.36069 -8.410972 537.211
## 114534 -37.36041 -8.410972 538.026
## 114535 -37.36013 -8.410972 539.024
## 114536 -37.35986 -8.410972 540.811
## 114537 -37.35958 -8.410972 542.725
## 114538 -37.35930 -8.410972 544.384
## 114539 -37.35902 -8.410972 545.433
## 114540 -37.35875 -8.410972 546.324
## 114541 -37.35847 -8.410972 546.982
## 114542 -37.35819 -8.410972 547.496
## 114543 -37.35791 -8.410972 547.930
## 114544 -37.35763 -8.410972 548.553
## 114545 -37.35736 -8.410972 549.785
## 114546 -37.35708 -8.410972 551.019
## 114547 -37.35680 -8.410972 552.030
## 114548 -37.35652 -8.410972 552.505
## 114549 -37.35625 -8.410972 552.566
## 114550 -37.35597 -8.410972 552.412
## 114551 -37.35569 -8.410972 552.152
## 114552 -37.35541 -8.410972 551.514
## 114553 -37.35513 -8.410972 550.459
## 114554 -37.35486 -8.410972 549.346
## 114555 -37.35458 -8.410972 548.568
## 114556 -37.35430 -8.410972 548.002
## 114557 -37.35402 -8.410972 548.018
## 114558 -37.35375 -8.410972 548.185
## 114559 -37.35347 -8.410972 548.545
## 114560 -37.35319 -8.410972 548.931
## 114561 -37.35291 -8.410972 548.718
## 114562 -37.35263 -8.410972 548.082
## 114563 -37.35236 -8.410972 547.218
## 114564 -37.35208 -8.410972 546.398
## 114565 -37.35180 -8.410972 545.758
## 114566 -37.35152 -8.410972 545.863
## 114567 -37.35125 -8.410972 546.549
## 114568 -37.35097 -8.410972 547.531
## 114569 -37.35069 -8.410972 548.645
## 114570 -37.35041 -8.410972 549.775
## 114571 -37.35013 -8.410972 550.853
## 114572 -37.34986 -8.410972 551.544
## 114573 -37.34958 -8.410972 552.098
## 114574 -37.34930 -8.410972 552.496
## 114575 -37.34902 -8.410972 552.941
## 114576 -37.34875 -8.410972 553.316
## 114577 -37.34847 -8.410972 553.615
## 114578 -37.34819 -8.410972 553.881
## 114579 -37.34791 -8.410972 554.441
## 114580 -37.34763 -8.410972 555.066
## 114581 -37.34736 -8.410972 555.696
## 114582 -37.34708 -8.410972 556.186
## 114583 -37.34680 -8.410972 556.595
## 114584 -37.34652 -8.410972 556.783
## 114585 -37.34625 -8.410972 556.816
## 114586 -37.34597 -8.410972 556.905
## 114587 -37.34569 -8.410972 557.209
## 114588 -37.34541 -8.410972 557.420
## 114589 -37.34513 -8.410972 557.390
## 114590 -37.34486 -8.410972 556.764
## 114591 -37.34458 -8.410972 556.108
## 114592 -37.34430 -8.410972 555.898
## 114593 -37.34402 -8.410972 556.416
## 114594 -37.34375 -8.410972 557.109
## 114595 -37.34347 -8.410972 557.674
## 114596 -37.34319 -8.410972 557.572
## 114597 -37.34291 -8.410972 557.171
## 114598 -37.34263 -8.410972 556.704
## 114599 -37.34236 -8.410972 556.543
## 114600 -37.34208 -8.410972 556.465
## 114601 -37.34180 -8.410972 556.591
## 114602 -37.34152 -8.410972 556.557
## 114603 -37.34125 -8.410972 556.662
## 114604 -37.34097 -8.410972 556.701
## 114605 -37.34069 -8.410972 556.958
## 114606 -37.34041 -8.410972 557.294
## 114607 -37.34013 -8.410972 557.697
## 114608 -37.33986 -8.410972 558.062
## 114609 -37.33958 -8.410972 558.199
## 114610 -37.33930 -8.410972 558.106
## 114611 -37.33902 -8.410972 557.595
## 114612 -37.33875 -8.410972 556.904
## 114613 -37.33847 -8.410972 556.269
## 114614 -37.33819 -8.410972 556.143
## 114615 -37.33791 -8.410972 556.187
## 114616 -37.33763 -8.410972 556.391
## 114617 -37.33736 -8.410972 556.386
## 114618 -37.33708 -8.410972 556.410
## 114619 -37.33680 -8.410972 556.247
## 114620 -37.33652 -8.410972 556.002
## 114621 -37.33625 -8.410972 555.816
## 114622 -37.33597 -8.410972 556.047
## 114623 -37.33569 -8.410972 556.678
## 114624 -37.33541 -8.410972 557.417
## 114625 -37.33513 -8.410972 558.093
## 114626 -37.33486 -8.410972 558.386
## 114627 -37.33458 -8.410972 558.496
## 114628 -37.33430 -8.410972 558.104
## 114629 -37.33402 -8.410972 557.783
## 114630 -37.33375 -8.410972 557.634
## 114631 -37.33347 -8.410972 557.664
## 114632 -37.33319 -8.410972 558.065
## 114633 -37.33291 -8.410972 558.402
## 114634 -37.33263 -8.410972 559.006
## 114635 -37.33236 -8.410972 559.374
## 114636 -37.33208 -8.410972 559.461
## 114637 -37.33180 -8.410972 559.340
## 114638 -37.33152 -8.410972 558.628
## 114639 -37.33125 -8.410972 557.956
## 114640 -37.33097 -8.410972 557.089
## 114641 -37.33069 -8.410972 556.415
## 114642 -37.33041 -8.410972 555.853
## 114643 -37.33013 -8.410972 555.482
## 114644 -37.32986 -8.410972 555.136
## 114645 -37.32958 -8.410972 555.025
## 114646 -37.32930 -8.410972 555.217
## 114647 -37.32902 -8.410972 555.789
## 114648 -37.32875 -8.410972 556.485
## 114649 -37.32847 -8.410972 557.437
## 114650 -37.32819 -8.410972 558.563
## 114651 -37.32791 -8.410972 559.755
## 114652 -37.32763 -8.410972 560.949
## 114653 -37.32736 -8.410972 561.117
## 114654 -37.32708 -8.410972 561.132
## 114655 -37.32680 -8.410972 560.869
## 114656 -37.32652 -8.410972 561.089
## 114657 -37.32625 -8.410972 561.503
## 114658 -37.32597 -8.410972 561.679
## 114659 -37.32569 -8.410972 562.147
## 114660 -37.32541 -8.410972 562.504
## 114661 -37.32513 -8.410972 563.197
## 114662 -37.32486 -8.410972 563.701
## 114663 -37.32458 -8.410972 563.832
## 114664 -37.32430 -8.410972 564.013
## 114665 -37.32402 -8.410972 563.883
## 114666 -37.32375 -8.410972 564.069
## 114667 -37.32347 -8.410972 564.394
## 114668 -37.32319 -8.410972 565.087
## 114669 -37.32291 -8.410972 565.875
## 114670 -37.32263 -8.410972 566.398
## 114671 -37.32236 -8.410972 566.457
## 114672 -37.32208 -8.410972 566.455
## 114673 -37.32180 -8.410972 566.329
## 114674 -37.32152 -8.410972 566.253
## 114675 -37.32125 -8.410972 566.427
## 114676 -37.32097 -8.410972 566.927
## 114677 -37.32069 -8.410972 567.239
## 114678 -37.32041 -8.410972 567.467
## 114679 -37.32013 -8.410972 567.842
## 114680 -37.31986 -8.410972 568.149
## 114681 -37.31958 -8.410972 568.546
## 114682 -37.31930 -8.410972 568.892
## 114683 -37.31902 -8.410972 569.385
## 114684 -37.31875 -8.410972 569.712
## 114685 -37.31847 -8.410972 569.643
## 114686 -37.31819 -8.410972 569.094
## 114687 -37.31791 -8.410972 568.372
## 114688 -37.31763 -8.410972 567.587
## 114689 -37.31736 -8.410972 567.507
## 114690 -37.31708 -8.410972 567.870
## 114691 -37.31680 -8.410972 568.812
## 114692 -37.31652 -8.410972 570.655
## 114693 -37.31625 -8.410972 572.057
## 114694 -37.31597 -8.410972 573.301
## 114695 -37.31569 -8.410972 573.238
## 114696 -37.31541 -8.410972 572.667
## 114697 -37.31513 -8.410972 571.550
## 114698 -37.31486 -8.410972 570.500
## 114699 -37.31458 -8.410972 569.700
## 114700 -37.31430 -8.410972 569.048
## 114701 -37.31402 -8.410972 568.817
## 114702 -37.31375 -8.410972 568.691
## 114703 -37.31347 -8.410972 568.721
## 114704 -37.31319 -8.410972 568.374
## 114705 -37.31291 -8.410972 567.797
## 114706 -37.31263 -8.410972 566.974
## 114707 -37.31236 -8.410972 565.528
## 114708 -37.31208 -8.410972 563.782
## 114709 -37.31180 -8.410972 561.393
## 114710 -37.31152 -8.410972 558.844
## 114711 -37.31125 -8.410972 556.630
## 114712 -37.31097 -8.410972 555.399
## 114713 -37.31069 -8.410972 555.163
## 114714 -37.31041 -8.410972 555.660
## 114715 -37.31013 -8.410972 556.685
## 114716 -37.30986 -8.410972 557.732
## 114717 -37.30958 -8.410972 558.948
## 114718 -37.30930 -8.410972 560.455
## 114719 -37.30902 -8.410972 561.948
## 114720 -37.30875 -8.410972 563.170
## 114721 -37.30847 -8.410972 564.366
## 114722 -37.30819 -8.410972 565.101
## 114723 -37.30791 -8.410972 565.846
## 114724 -37.30763 -8.410972 566.913
## 114725 -37.30736 -8.410972 568.614
## 114726 -37.30708 -8.410972 570.153
## 114727 -37.30680 -8.410972 571.166
## 114728 -37.30652 -8.410972 570.796
## 114729 -37.30625 -8.410972 570.368
## 114730 -37.30597 -8.410972 569.624
## 114731 -37.30569 -8.410972 570.469
## 114732 -37.30541 -8.410972 571.281
## 114733 -37.30513 -8.410972 571.758
## 114734 -37.30486 -8.410972 570.432
## 114735 -37.30458 -8.410972 568.414
## 114736 -37.30430 -8.410972 566.286
## 114737 -37.30402 -8.410972 564.770
## 114738 -37.30375 -8.410972 563.861
## 114739 -37.30347 -8.410972 563.582
## 114740 -37.30319 -8.410972 564.471
## 114741 -37.30291 -8.410972 565.933
## 114742 -37.30263 -8.410972 567.721
## 114743 -37.30236 -8.410972 568.869
## 114744 -37.30208 -8.410972 569.590
## 114745 -37.30180 -8.410972 570.012
## 114746 -37.30152 -8.410972 570.252
## 114747 -37.30125 -8.410972 570.320
## 114748 -37.30097 -8.410972 569.501
## 114749 -37.30069 -8.410972 568.978
## 114750 -37.30041 -8.410972 568.307
## 114751 -37.30013 -8.410972 567.815
## 114752 -37.29986 -8.410972 567.206
## 114753 -37.29958 -8.410972 566.655
## 114754 -37.29930 -8.410972 566.187
## 114755 -37.29902 -8.410972 565.957
## 114756 -37.29875 -8.410972 565.949
## 114757 -37.29847 -8.410972 565.765
## 114758 -37.29819 -8.410972 565.720
## 114759 -37.29791 -8.410972 565.690
## 114760 -37.29763 -8.410972 565.584
## 114761 -37.29736 -8.410972 565.053
## 114762 -37.29708 -8.410972 564.593
## 114763 -37.29680 -8.410972 564.256
## 114764 -37.29652 -8.410972 564.556
## 114765 -37.29625 -8.410972 564.971
## 114766 -37.29597 -8.410972 565.651
## 114767 -37.29569 -8.410972 565.857
## 114768 -37.29541 -8.410972 565.843
## 114769 -37.29513 -8.410972 565.395
## 114770 -37.29486 -8.410972 564.691
## 114771 -37.29458 -8.410972 563.846
## 114772 -37.29430 -8.410972 562.895
## 114773 -37.29402 -8.410972 561.359
## 114774 -37.29375 -8.410972 560.018
## 114775 -37.29347 -8.410972 558.838
## 114776 -37.29319 -8.410972 558.601
## 114777 -37.29291 -8.410972 558.768
## 114778 -37.29263 -8.410972 559.218
## 114779 -37.29236 -8.410972 559.417
## 114780 -37.29208 -8.410972 560.000
## 114781 -37.29180 -8.410972 561.240
## 114782 -37.29152 -8.410972 563.180
## 114783 -37.29125 -8.410972 564.898
## 114784 -37.29097 -8.410972 566.078
## 114785 -37.29069 -8.410972 565.425
## 114786 -37.29041 -8.410972 564.150
## 114787 -37.29013 -8.410972 562.811
## 114788 -37.28986 -8.410972 561.687
## 114789 -37.28958 -8.410972 560.663
## 114790 -37.28930 -8.410972 559.595
## 114791 -37.28902 -8.410972 558.409
## 114792 -37.28875 -8.410972 557.878
## 114793 -37.28847 -8.410972 557.715
## 114794 -37.28819 -8.410972 557.698
## 114795 -37.28791 -8.410972 557.818
## 114796 -37.28763 -8.410972 558.246
## 114797 -37.28736 -8.410972 558.489
## 114798 -37.28708 -8.410972 558.794
## 114799 -37.28680 -8.410972 559.098
## 114800 -37.28652 -8.410972 560.093
## 114801 -37.28625 -8.410972 561.234
## 114802 -37.28597 -8.410972 562.475
## 114803 -37.28569 -8.410972 563.487
## 114804 -37.28541 -8.410972 564.259
## 114805 -37.28513 -8.410972 564.912
## 114806 -37.28486 -8.410972 565.574
## 114807 -37.28458 -8.410972 566.090
## 114808 -37.28430 -8.410972 566.566
## 114809 -37.28402 -8.410972 567.375
## 114810 -37.28375 -8.410972 568.144
## 114811 -37.28347 -8.410972 568.977
## 114812 -37.28319 -8.410972 568.715
## 114813 -37.28291 -8.410972 567.915
## 114814 -37.28263 -8.410972 566.656
## 114815 -37.28236 -8.410972 565.240
## 114816 -37.28208 -8.410972 563.870
## 114817 -37.28180 -8.410972 562.363
## 114818 -37.28152 -8.410972 561.013
## 114819 -37.28125 -8.410972 560.150
## 114820 -37.28097 -8.410972 559.997
## 114821 -37.28069 -8.410972 560.399
## 114822 -37.28041 -8.410972 561.366
## 114823 -37.28013 -8.410972 562.527
## 114824 -37.27986 -8.410972 564.254
## 114825 -37.27958 -8.410972 565.984
## 114826 -37.27930 -8.410972 567.973
## 114827 -37.27902 -8.410972 569.316
## 114828 -37.27875 -8.410972 570.465
## 114829 -37.27847 -8.410972 571.233
## 114830 -37.27819 -8.410972 572.250
## 114831 -37.27791 -8.410972 573.205
## 114832 -37.27763 -8.410972 573.906
## 114833 -37.27736 -8.410972 574.322
## 114834 -37.27708 -8.410972 574.746
## 114835 -37.27680 -8.410972 575.294
## 114836 -37.27652 -8.410972 575.858
## 114837 -37.27625 -8.410972 576.271
## 114838 -37.27597 -8.410972 576.645
## 114839 -37.27569 -8.410972 576.858
## 114840 -37.27541 -8.410972 576.921
## 114841 -37.27513 -8.410972 576.822
## 114842 -37.27486 -8.410972 576.698
## 114843 -37.27458 -8.410972 576.539
## 114844 -37.27430 -8.410972 576.279
## 114845 -37.27402 -8.410972 575.579
## 114846 -37.27375 -8.410972 574.888
## 114847 -37.27347 -8.410972 574.059
## 114848 -37.27319 -8.410972 573.419
## 114849 -37.27291 -8.410972 572.890
## 114850 -37.27263 -8.410972 572.493
## 114851 -37.27236 -8.410972 572.318
## 114852 -37.27208 -8.410972 572.230
## 114853 -37.27180 -8.410972 572.306
## 114854 -37.27152 -8.410972 572.113
## 114855 -37.27125 -8.410972 571.761
## 114856 -37.27097 -8.410972 571.242
## 114857 -37.27069 -8.410972 570.557
## 114858 -37.27041 -8.410972 569.708
## 114859 -37.27013 -8.410972 568.696
## 114860 -37.26986 -8.410972 567.643
## 114861 -37.26958 -8.410972 566.620
## 114862 -37.26930 -8.410972 566.010
## 114863 -37.26902 -8.410972 566.122
## 114864 -37.26875 -8.410972 566.751
## 114865 -37.26847 -8.410972 567.656
## 114866 -37.26819 -8.410972 568.605
## 114867 -37.26791 -8.410972 569.559
## 114868 -37.26763 -8.410972 570.294
## 114869 -37.26736 -8.410972 570.837
## 114870 -37.26708 -8.410972 571.276
## 114871 -37.26680 -8.410972 571.643
## 114872 -37.26652 -8.410972 572.536
## 114873 -37.26625 -8.410972 573.082
## 114874 -37.26597 -8.410972 573.549
## 114875 -37.26569 -8.410972 572.486
## 114876 -37.26541 -8.410972 570.906
## 114877 -37.26513 -8.410972 569.179
## 114878 -37.26486 -8.410972 567.969
## 114879 -37.26458 -8.410972 566.923
## 114880 -37.26430 -8.410972 565.835
## 114881 -37.26402 -8.410972 565.176
## 114882 -37.26375 -8.410972 564.679
## 114883 -37.26347 -8.410972 564.243
## 114884 -37.26319 -8.410972 563.060
## 114885 -37.26291 -8.410972 562.128
## 114886 -37.26263 -8.410972 562.090
## 114887 -37.26236 -8.410972 563.715
## 114888 -37.26208 -8.410972 565.685
## 114889 -37.26180 -8.410972 567.519
## 114890 -37.26152 -8.410972 568.100
## 114891 -37.26125 -8.410972 568.483
## 114892 -37.26097 -8.410972 568.964
## 114893 -37.26069 -8.410972 569.336
## 114894 -37.26041 -8.410972 569.484
## 114895 -37.26013 -8.410972 569.879
## 114896 -37.25986 -8.410972 570.271
## 114897 -37.25958 -8.410972 570.421
## 114898 -37.25930 -8.410972 570.144
## 114899 -37.25902 -8.410972 569.483
## 114900 -37.25875 -8.410972 568.738
## 114901 -37.25847 -8.410972 567.807
## 114902 -37.25819 -8.410972 566.937
## 114903 -37.25791 -8.410972 566.066
## 114904 -37.25763 -8.410972 565.348
## 114905 -37.25736 -8.410972 564.403
## 114906 -37.25708 -8.410972 563.604
## 114907 -37.25680 -8.410972 562.513
## 114908 -37.25652 -8.410972 561.189
## 114909 -37.25625 -8.410972 560.075
## 114910 -37.25597 -8.410972 559.036
## 114911 -37.25569 -8.410972 558.898
## 114912 -37.25541 -8.410972 559.005
## 114913 -37.25513 -8.410972 559.017
## 114914 -37.25486 -8.410972 558.675
## 114915 -37.25458 -8.410972 558.482
## 114916 -37.25430 -8.410972 558.871
## 114917 -37.25402 -8.410972 560.750
## 114918 -37.25375 -8.410972 563.044
## 114919 -37.25347 -8.410972 565.452
## 114920 -37.25319 -8.410972 567.164
## 114921 -37.25291 -8.410972 568.600
## 114922 -37.25263 -8.410972 569.947
## 114923 -37.25236 -8.410972 571.396
## 114924 -37.25208 -8.410972 572.307
## 114925 -37.25180 -8.410972 572.410
## 114926 -37.25152 -8.410972 571.393
## 114927 -37.25125 -8.410972 570.269
## 114928 -37.25097 -8.410972 569.389
## 114929 -37.25069 -8.410972 569.555
## 114930 -37.25041 -8.410972 570.012
## 114931 -37.25013 -8.410972 570.408
## 114932 -37.24986 -8.410972 570.441
## 114933 -37.24958 -8.410972 570.676
## 114934 -37.24930 -8.410972 571.492
## 114935 -37.24902 -8.410972 572.670
## 114936 -37.24875 -8.410972 573.982
## 114937 -37.24847 -8.410972 575.524
## 114938 -37.24819 -8.410972 576.681
## 114939 -37.24791 -8.410972 577.782
## 114940 -37.24763 -8.410972 578.508
## 114941 -37.24736 -8.410972 579.156
## 114942 -37.24708 -8.410972 580.046
## 114943 -37.24680 -8.410972 581.261
## 114944 -37.24652 -8.410972 582.599
## 114945 -37.24625 -8.410972 583.617
## 114946 -37.24597 -8.410972 584.319
## 114947 -37.24569 -8.410972 584.474
## 114948 -37.24541 -8.410972 584.691
## 114949 -37.24513 -8.410972 585.056
## 114950 -37.24486 -8.410972 586.289
## 114951 -37.24458 -8.410972 587.763
## 114952 -37.24430 -8.410972 589.141
## 114953 -37.24402 -8.410972 589.885
## 114954 -37.24375 -8.410972 590.517
## 114955 -37.24347 -8.410972 590.914
## 114956 -37.24319 -8.410972 591.728
## 114957 -37.24291 -8.410972 593.026
## 114958 -37.24263 -8.410972 595.436
## 114959 -37.24236 -8.410972 598.720
## 114960 -37.24208 -8.410972 602.085
## 114961 -37.24180 -8.410972 604.188
## 114962 -37.24152 -8.410972 605.221
## 114963 -37.24125 -8.410972 605.903
## 114964 -37.24097 -8.410972 606.486
## 114965 -37.24069 -8.410972 607.875
## 114966 -37.24041 -8.410972 609.047
## 114967 -37.24013 -8.410972 609.820
## 114968 -37.23986 -8.410972 609.622
## 114969 -37.23958 -8.410972 608.719
## 114970 -37.23930 -8.410972 607.805
## 114971 -37.23902 -8.410972 606.802
## 114972 -37.23875 -8.410972 605.751
## 114973 -37.23847 -8.410972 604.673
## 114974 -37.23819 -8.410972 602.664
## 114975 -37.23791 -8.410972 600.396
## 114976 -37.23763 -8.410972 598.069
## 114977 -37.23736 -8.410972 596.041
## 114978 -37.23708 -8.410972 594.298
## 114979 -37.23680 -8.410972 592.525
## 114980 -37.23652 -8.410972 590.857
## 114981 -37.23625 -8.410972 589.214
## 114982 -37.23597 -8.410972 587.701
## 114983 -37.23569 -8.410972 586.614
## 114984 -37.23541 -8.410972 585.546
## 114985 -37.23513 -8.410972 584.387
## 114986 -37.23486 -8.410972 582.617
## 114987 -37.23458 -8.410972 580.849
## 114988 -37.23430 -8.410972 579.053
## 114989 -37.23402 -8.410972 577.580
## 114990 -37.23375 -8.410972 576.260
## 114991 -37.23347 -8.410972 575.078
## 114992 -37.23319 -8.410972 574.049
## 114993 -37.23291 -8.410972 573.480
## 114994 -37.23263 -8.410972 573.267
## 114995 -37.23236 -8.410972 573.738
## 114996 -37.23208 -8.410972 574.613
## 114997 -37.23180 -8.410972 575.798
## 114998 -37.23152 -8.410972 577.059
## 114999 -37.23125 -8.410972 578.356
## 115000 -37.23097 -8.410972 580.210
## 115001 -37.23069 -8.410972 581.605
## 115002 -37.23041 -8.410972 582.899
## 115003 -37.23013 -8.410972 583.818
## 115004 -37.22986 -8.410972 584.564
## 115005 -37.22958 -8.410972 585.370
## 115006 -37.22930 -8.410972 585.789
## 115007 -37.22902 -8.410972 585.991
## 115008 -37.22875 -8.410972 586.073
## 115009 -37.22847 -8.410972 586.121
## 115010 -37.22819 -8.410972 585.942
## 115011 -37.22791 -8.410972 585.747
## 115012 -37.22763 -8.410972 585.500
## 115013 -37.22736 -8.410972 585.810
## 115014 -37.22708 -8.410972 585.987
## 115015 -37.22680 -8.410972 586.224
## 115016 -37.22652 -8.410972 585.833
## 115017 -37.22625 -8.410972 584.809
## 115018 -37.22597 -8.410972 583.668
## 115019 -37.22569 -8.410972 583.016
## 115020 -37.22541 -8.410972 582.337
## 115021 -37.22513 -8.410972 581.137
## 115022 -37.22486 -8.410972 579.585
## 115023 -37.22458 -8.410972 578.008
## 115024 -37.22430 -8.410972 576.983
## 115025 -37.22402 -8.410972 576.220
## 115026 -37.22375 -8.410972 575.314
## 115871 -37.36541 -8.411250 520.200
## 115872 -37.36513 -8.411250 519.548
## 115873 -37.36486 -8.411250 519.688
## 115874 -37.36458 -8.411250 520.060
## 115875 -37.36430 -8.411250 520.357
## 115876 -37.36402 -8.411250 520.768
## 115877 -37.36375 -8.411250 521.146
## 115878 -37.36347 -8.411250 521.803
## 115879 -37.36319 -8.411250 523.041
## 115880 -37.36291 -8.411250 524.579
## 115881 -37.36263 -8.411250 526.227
## 115882 -37.36236 -8.411250 527.692
## 115883 -37.36208 -8.411250 529.217
## 115884 -37.36180 -8.411250 530.957
## 115885 -37.36152 -8.411250 532.888
## 115886 -37.36125 -8.411250 534.794
## 115887 -37.36097 -8.411250 536.426
## 115888 -37.36069 -8.411250 537.386
## 115889 -37.36041 -8.411250 538.227
## 115890 -37.36013 -8.411250 539.315
## 115891 -37.35986 -8.411250 541.260
## 115892 -37.35958 -8.411250 543.400
## 115893 -37.35930 -8.411250 545.306
## 115894 -37.35902 -8.411250 546.928
## 115895 -37.35875 -8.411250 548.015
## 115896 -37.35847 -8.411250 548.770
## 115897 -37.35819 -8.411250 549.226
## 115898 -37.35791 -8.411250 549.635
## 115899 -37.35763 -8.411250 550.209
## 115900 -37.35736 -8.411250 551.285
## 115901 -37.35708 -8.411250 552.420
## 115902 -37.35680 -8.411250 553.478
## 115903 -37.35652 -8.411250 553.755
## 115904 -37.35625 -8.411250 553.820
## 115905 -37.35597 -8.411250 553.627
## 115906 -37.35569 -8.411250 553.265
## 115907 -37.35541 -8.411250 552.740
## 115908 -37.35513 -8.411250 552.041
## 115909 -37.35486 -8.411250 551.188
## 115910 -37.35458 -8.411250 550.426
## 115911 -37.35430 -8.411250 550.068
## 115912 -37.35402 -8.411250 549.946
## 115913 -37.35375 -8.411250 550.094
## 115914 -37.35347 -8.411250 550.063
## 115915 -37.35319 -8.411250 550.000
## 115916 -37.35291 -8.411250 549.544
## 115917 -37.35263 -8.411250 548.892
## 115918 -37.35236 -8.411250 548.098
## 115919 -37.35208 -8.411250 547.413
## 115920 -37.35180 -8.411250 547.017
## 115921 -37.35152 -8.411250 547.287
## 115922 -37.35125 -8.411250 547.979
## 115923 -37.35097 -8.411250 548.996
## 115924 -37.35069 -8.411250 550.082
## 115925 -37.35041 -8.411250 551.185
## 115926 -37.35013 -8.411250 552.130
## 115927 -37.34986 -8.411250 552.751
## 115928 -37.34958 -8.411250 553.199
## 115929 -37.34930 -8.411250 553.583
## 115930 -37.34902 -8.411250 554.032
## 115931 -37.34875 -8.411250 554.498
## 115932 -37.34847 -8.411250 554.978
## 115933 -37.34819 -8.411250 555.525
## 115934 -37.34791 -8.411250 556.106
## 115935 -37.34763 -8.411250 556.719
## 115936 -37.34736 -8.411250 557.343
## 115937 -37.34708 -8.411250 557.878
## 115938 -37.34680 -8.411250 558.296
## 115939 -37.34652 -8.411250 558.290
## 115940 -37.34625 -8.411250 558.252
## 115941 -37.34597 -8.411250 558.209
## 115942 -37.34569 -8.411250 558.473
## 115943 -37.34541 -8.411250 558.672
## 115944 -37.34513 -8.411250 558.669
## 115945 -37.34486 -8.411250 558.155
## 115946 -37.34458 -8.411250 557.667
## 115947 -37.34430 -8.411250 557.488
## 115948 -37.34402 -8.411250 558.210
## 115949 -37.34375 -8.411250 558.992
## 115950 -37.34347 -8.411250 559.567
## 115951 -37.34319 -8.411250 559.380
## 115952 -37.34291 -8.411250 558.888
## 115953 -37.34263 -8.411250 558.342
## 115954 -37.34236 -8.411250 558.066
## 115955 -37.34208 -8.411250 557.934
## 115956 -37.34180 -8.411250 557.996
## 115957 -37.34152 -8.411250 558.085
## 115958 -37.34125 -8.411250 558.301
## 115959 -37.34097 -8.411250 558.490
## 115960 -37.34069 -8.411250 558.708
## 115961 -37.34041 -8.411250 558.854
## 115962 -37.34013 -8.411250 558.981
## 115963 -37.33986 -8.411250 559.109
## 115964 -37.33958 -8.411250 559.084
## 115965 -37.33930 -8.411250 558.870
## 115966 -37.33902 -8.411250 558.183
## 115967 -37.33875 -8.411250 557.440
## 115968 -37.33847 -8.411250 556.794
## 115969 -37.33819 -8.411250 556.790
## 115970 -37.33791 -8.411250 556.959
## 115971 -37.33763 -8.411250 557.110
## 115972 -37.33736 -8.411250 557.177
## 115973 -37.33708 -8.411250 557.072
## 115974 -37.33680 -8.411250 556.871
## 115975 -37.33652 -8.411250 556.443
## 115976 -37.33625 -8.411250 556.164
## 115977 -37.33597 -8.411250 556.204
## 115978 -37.33569 -8.411250 556.784
## 115979 -37.33541 -8.411250 557.577
## 115980 -37.33513 -8.411250 558.318
## 115981 -37.33486 -8.411250 558.763
## 115982 -37.33458 -8.411250 559.005
## 115983 -37.33430 -8.411250 559.022
## 115984 -37.33402 -8.411250 558.916
## 115985 -37.33375 -8.411250 558.788
## 115986 -37.33347 -8.411250 558.847
## 115987 -37.33319 -8.411250 558.938
## 115988 -37.33291 -8.411250 559.177
## 115989 -37.33263 -8.411250 559.402
## 115990 -37.33236 -8.411250 559.469
## 115991 -37.33208 -8.411250 559.395
## 115992 -37.33180 -8.411250 559.091
## 115993 -37.33152 -8.411250 558.723
## 115994 -37.33125 -8.411250 558.170
## 115995 -37.33097 -8.411250 557.483
## 115996 -37.33069 -8.411250 556.985
## 115997 -37.33041 -8.411250 556.485
## 115998 -37.33013 -8.411250 556.005
## 115999 -37.32986 -8.411250 555.825
## 116000 -37.32958 -8.411250 555.759
## 116001 -37.32930 -8.411250 555.960
## 116002 -37.32902 -8.411250 556.427
## 116003 -37.32875 -8.411250 557.150
## 116004 -37.32847 -8.411250 558.087
## 116005 -37.32819 -8.411250 559.406
## 116006 -37.32791 -8.411250 560.646
## 116007 -37.32763 -8.411250 561.557
## 116008 -37.32736 -8.411250 561.716
## 116009 -37.32708 -8.411250 561.646
## 116010 -37.32680 -8.411250 561.486
## 116011 -37.32652 -8.411250 562.007
## 116012 -37.32625 -8.411250 562.482
## 116013 -37.32597 -8.411250 562.966
## 116014 -37.32569 -8.411250 563.207
## 116015 -37.32541 -8.411250 563.389
## 116016 -37.32513 -8.411250 563.554
## 116017 -37.32486 -8.411250 563.691
## 116018 -37.32458 -8.411250 563.825
## 116019 -37.32430 -8.411250 563.970
## 116020 -37.32402 -8.411250 564.035
## 116021 -37.32375 -8.411250 564.253
## 116022 -37.32347 -8.411250 564.646
## 116023 -37.32319 -8.411250 565.825
## 116024 -37.32291 -8.411250 566.994
## 116025 -37.32263 -8.411250 568.050
## 116026 -37.32236 -8.411250 568.428
## 116027 -37.32208 -8.411250 568.622
## 116028 -37.32180 -8.411250 568.656
## 116029 -37.32152 -8.411250 568.753
## 116030 -37.32125 -8.411250 568.848
## 116031 -37.32097 -8.411250 569.126
## 116032 -37.32069 -8.411250 569.182
## 116033 -37.32041 -8.411250 569.413
## 116034 -37.32013 -8.411250 569.688
## 116035 -37.31986 -8.411250 569.960
## 116036 -37.31958 -8.411250 570.282
## 116037 -37.31930 -8.411250 570.568
## 116038 -37.31902 -8.411250 571.138
## 116039 -37.31875 -8.411250 571.459
## 116040 -37.31847 -8.411250 571.492
## 116041 -37.31819 -8.411250 571.013
## 116042 -37.31791 -8.411250 570.382
## 116043 -37.31763 -8.411250 569.841
## 116044 -37.31736 -8.411250 569.707
## 116045 -37.31708 -8.411250 569.967
## 116046 -37.31680 -8.411250 570.554
## 116047 -37.31652 -8.411250 571.939
## 116048 -37.31625 -8.411250 573.221
## 116049 -37.31597 -8.411250 574.101
## 116050 -37.31569 -8.411250 573.923
## 116051 -37.31541 -8.411250 573.197
## 116052 -37.31513 -8.411250 572.115
## 116053 -37.31486 -8.411250 571.276
## 116054 -37.31458 -8.411250 570.482
## 116055 -37.31430 -8.411250 569.972
## 116056 -37.31402 -8.411250 569.752
## 116057 -37.31375 -8.411250 569.676
## 116058 -37.31347 -8.411250 569.548
## 116059 -37.31319 -8.411250 569.198
## 116060 -37.31291 -8.411250 568.519
## 116061 -37.31263 -8.411250 567.437
## 116062 -37.31236 -8.411250 565.873
## 116063 -37.31208 -8.411250 563.933
## 116064 -37.31180 -8.411250 561.659
## 116065 -37.31152 -8.411250 559.224
## 116066 -37.31125 -8.411250 557.133
## 116067 -37.31097 -8.411250 555.890
## 116068 -37.31069 -8.411250 555.922
## 116069 -37.31041 -8.411250 556.825
## 116070 -37.31013 -8.411250 558.161
## 116071 -37.30986 -8.411250 559.413
## 116072 -37.30958 -8.411250 560.750
## 116073 -37.30930 -8.411250 562.206
## 116074 -37.30902 -8.411250 563.479
## 116075 -37.30875 -8.411250 564.673
## 116076 -37.30847 -8.411250 565.728
## 116077 -37.30819 -8.411250 566.198
## 116078 -37.30791 -8.411250 566.767
## 116079 -37.30763 -8.411250 567.638
## 116080 -37.30736 -8.411250 569.198
## 116081 -37.30708 -8.411250 570.741
## 116082 -37.30680 -8.411250 571.621
## 116083 -37.30652 -8.411250 571.684
## 116084 -37.30625 -8.411250 571.416
## 116085 -37.30597 -8.411250 571.175
## 116086 -37.30569 -8.411250 572.277
## 116087 -37.30541 -8.411250 573.136
## 116088 -37.30513 -8.411250 573.248
## 116089 -37.30486 -8.411250 571.711
## 116090 -37.30458 -8.411250 569.547
## 116091 -37.30430 -8.411250 567.336
## 116092 -37.30402 -8.411250 565.788
## 116093 -37.30375 -8.411250 564.974
## 116094 -37.30347 -8.411250 564.908
## 116095 -37.30319 -8.411250 565.680
## 116096 -37.30291 -8.411250 566.894
## 116097 -37.30263 -8.411250 568.198
## 116098 -37.30236 -8.411250 569.096
## 116099 -37.30208 -8.411250 569.793
## 116100 -37.30180 -8.411250 570.192
## 116101 -37.30152 -8.411250 570.862
## 116102 -37.30125 -8.411250 571.171
## 116103 -37.30097 -8.411250 571.167
## 116104 -37.30069 -8.411250 570.783
## 116105 -37.30041 -8.411250 570.128
## 116106 -37.30013 -8.411250 569.309
## 116107 -37.29986 -8.411250 568.397
## 116108 -37.29958 -8.411250 567.573
## 116109 -37.29930 -8.411250 567.155
## 116110 -37.29902 -8.411250 566.922
## 116111 -37.29875 -8.411250 567.012
## 116112 -37.29847 -8.411250 567.006
## 116113 -37.29819 -8.411250 567.137
## 116114 -37.29791 -8.411250 566.987
## 116115 -37.29763 -8.411250 566.638
## 116116 -37.29736 -8.411250 565.991
## 116117 -37.29708 -8.411250 565.384
## 116118 -37.29680 -8.411250 565.050
## 116119 -37.29652 -8.411250 565.210
## 116120 -37.29625 -8.411250 565.700
## 116121 -37.29597 -8.411250 566.359
## 116122 -37.29569 -8.411250 566.718
## 116123 -37.29541 -8.411250 566.913
## 116124 -37.29513 -8.411250 566.799
## 116125 -37.29486 -8.411250 566.176
## 116126 -37.29458 -8.411250 565.253
## 116127 -37.29430 -8.411250 564.047
## 116128 -37.29402 -8.411250 562.564
## 116129 -37.29375 -8.411250 561.218
## 116130 -37.29347 -8.411250 560.081
## 116131 -37.29319 -8.411250 559.984
## 116132 -37.29291 -8.411250 560.113
## 116133 -37.29263 -8.411250 560.428
## 116134 -37.29236 -8.411250 560.609
## 116135 -37.29208 -8.411250 561.088
## 116136 -37.29180 -8.411250 562.194
## 116137 -37.29152 -8.411250 564.024
## 116138 -37.29125 -8.411250 565.756
## 116139 -37.29097 -8.411250 566.925
## 116140 -37.29069 -8.411250 566.216
## 116141 -37.29041 -8.411250 564.914
## 116142 -37.29013 -8.411250 563.385
## 116143 -37.28986 -8.411250 562.215
## 116144 -37.28958 -8.411250 561.212
## 116145 -37.28930 -8.411250 560.460
## 116146 -37.28902 -8.411250 559.662
## 116147 -37.28875 -8.411250 559.155
## 116148 -37.28847 -8.411250 558.964
## 116149 -37.28819 -8.411250 558.822
## 116150 -37.28791 -8.411250 558.907
## 116151 -37.28763 -8.411250 558.940
## 116152 -37.28736 -8.411250 558.974
## 116153 -37.28708 -8.411250 559.078
## 116154 -37.28680 -8.411250 559.546
## 116155 -37.28652 -8.411250 560.576
## 116156 -37.28625 -8.411250 561.813
## 116157 -37.28597 -8.411250 563.235
## 116158 -37.28569 -8.411250 563.962
## 116159 -37.28541 -8.411250 564.704
## 116160 -37.28513 -8.411250 565.343
## 116161 -37.28486 -8.411250 565.941
## 116162 -37.28458 -8.411250 566.567
## 116163 -37.28430 -8.411250 567.432
## 116164 -37.28402 -8.411250 568.377
## 116165 -37.28375 -8.411250 569.270
## 116166 -37.28347 -8.411250 569.834
## 116167 -37.28319 -8.411250 569.420
## 116168 -37.28291 -8.411250 568.544
## 116169 -37.28263 -8.411250 567.290
## 116170 -37.28236 -8.411250 565.910
## 116171 -37.28208 -8.411250 564.436
## 116172 -37.28180 -8.411250 562.888
## 116173 -37.28152 -8.411250 561.741
## 116174 -37.28125 -8.411250 560.880
## 116175 -37.28097 -8.411250 560.544
## 116176 -37.28069 -8.411250 560.906
## 116177 -37.28041 -8.411250 561.819
## 116178 -37.28013 -8.411250 563.220
## 116179 -37.27986 -8.411250 565.032
## 116180 -37.27958 -8.411250 566.952
## 116181 -37.27930 -8.411250 568.810
## 116182 -37.27902 -8.411250 570.077
## 116183 -37.27875 -8.411250 571.225
## 116184 -37.27847 -8.411250 572.142
## 116185 -37.27819 -8.411250 573.352
## 116186 -37.27791 -8.411250 574.302
## 116187 -37.27763 -8.411250 574.964
## 116188 -37.27736 -8.411250 575.210
## 116189 -37.27708 -8.411250 575.292
## 116190 -37.27680 -8.411250 575.513
## 116191 -37.27652 -8.411250 575.507
## 116192 -37.27625 -8.411250 575.696
## 116193 -37.27597 -8.411250 575.894
## 116194 -37.27569 -8.411250 576.154
## 116195 -37.27541 -8.411250 576.371
## 116196 -37.27513 -8.411250 576.548
## 116197 -37.27486 -8.411250 576.709
## 116198 -37.27458 -8.411250 576.755
## 116199 -37.27430 -8.411250 576.523
## 116200 -37.27402 -8.411250 576.134
## 116201 -37.27375 -8.411250 575.542
## 116202 -37.27347 -8.411250 574.811
## 116203 -37.27319 -8.411250 574.320
## 116204 -37.27291 -8.411250 573.828
## 116205 -37.27263 -8.411250 573.464
## 116206 -37.27236 -8.411250 573.284
## 116207 -37.27208 -8.411250 573.161
## 116208 -37.27180 -8.411250 573.102
## 116209 -37.27152 -8.411250 572.753
## 116210 -37.27125 -8.411250 572.326
## 116211 -37.27097 -8.411250 571.713
## 116212 -37.27069 -8.411250 570.798
## 116213 -37.27041 -8.411250 569.752
## 116214 -37.27013 -8.411250 568.645
## 116215 -37.26986 -8.411250 567.567
## 116216 -37.26958 -8.411250 566.747
## 116217 -37.26930 -8.411250 566.346
## 116218 -37.26902 -8.411250 566.766
## 116219 -37.26875 -8.411250 567.605
## 116220 -37.26847 -8.411250 568.582
## 116221 -37.26819 -8.411250 569.603
## 116222 -37.26791 -8.411250 570.487
## 116223 -37.26763 -8.411250 571.277
## 116224 -37.26736 -8.411250 571.771
## 116225 -37.26708 -8.411250 572.235
## 116226 -37.26680 -8.411250 572.864
## 116227 -37.26652 -8.411250 573.484
## 116228 -37.26625 -8.411250 573.884
## 116229 -37.26597 -8.411250 573.919
## 116230 -37.26569 -8.411250 572.394
## 116231 -37.26541 -8.411250 570.680
## 116232 -37.26513 -8.411250 568.958
## 116233 -37.26486 -8.411250 567.729
## 116234 -37.26458 -8.411250 566.755
## 116235 -37.26430 -8.411250 565.831
## 116236 -37.26402 -8.411250 565.559
## 116237 -37.26375 -8.411250 565.107
## 116238 -37.26347 -8.411250 564.673
## 116239 -37.26319 -8.411250 563.319
## 116240 -37.26291 -8.411250 562.469
## 116241 -37.26263 -8.411250 562.547
## 116242 -37.26236 -8.411250 564.268
## 116243 -37.26208 -8.411250 566.500
## 116244 -37.26180 -8.411250 568.521
## 116245 -37.26152 -8.411250 569.633
## 116246 -37.26125 -8.411250 570.059
## 116247 -37.26097 -8.411250 570.292
## 116248 -37.26069 -8.411250 570.189
## 116249 -37.26041 -8.411250 570.170
## 116250 -37.26013 -8.411250 570.221
## 116251 -37.25986 -8.411250 570.269
## 116252 -37.25958 -8.411250 570.284
## 116253 -37.25930 -8.411250 569.994
## 116254 -37.25902 -8.411250 569.462
## 116255 -37.25875 -8.411250 568.693
## 116256 -37.25847 -8.411250 567.845
## 116257 -37.25819 -8.411250 567.129
## 116258 -37.25791 -8.411250 566.367
## 116259 -37.25763 -8.411250 565.508
## 116260 -37.25736 -8.411250 564.445
## 116261 -37.25708 -8.411250 563.309
## 116262 -37.25680 -8.411250 562.111
## 116263 -37.25652 -8.411250 560.980
## 116264 -37.25625 -8.411250 560.023
## 116265 -37.25597 -8.411250 559.334
## 116266 -37.25569 -8.411250 559.338
## 116267 -37.25541 -8.411250 559.458
## 116268 -37.25513 -8.411250 559.479
## 116269 -37.25486 -8.411250 559.098
## 116270 -37.25458 -8.411250 558.931
## 116271 -37.25430 -8.411250 559.201
## 116272 -37.25402 -8.411250 561.092
## 116273 -37.25375 -8.411250 563.338
## 116274 -37.25347 -8.411250 565.640
## 116275 -37.25319 -8.411250 566.974
## 116276 -37.25291 -8.411250 568.073
## 116277 -37.25263 -8.411250 569.051
## 116278 -37.25236 -8.411250 570.244
## 116279 -37.25208 -8.411250 571.060
## 116280 -37.25180 -8.411250 571.098
## 116281 -37.25152 -8.411250 570.097
## 116282 -37.25125 -8.411250 568.910
## 116283 -37.25097 -8.411250 567.963
## 116284 -37.25069 -8.411250 568.394
## 116285 -37.25041 -8.411250 569.109
## 116286 -37.25013 -8.411250 569.837
## 116287 -37.24986 -8.411250 570.111
## 116288 -37.24958 -8.411250 570.440
## 116289 -37.24930 -8.411250 571.151
## 116290 -37.24902 -8.411250 572.260
## 116291 -37.24875 -8.411250 573.647
## 116292 -37.24847 -8.411250 575.046
## 116293 -37.24819 -8.411250 576.406
## 116294 -37.24791 -8.411250 577.567
## 116295 -37.24763 -8.411250 578.497
## 116296 -37.24736 -8.411250 579.154
## 116297 -37.24708 -8.411250 579.760
## 116298 -37.24680 -8.411250 580.618
## 116299 -37.24652 -8.411250 581.536
## 116300 -37.24625 -8.411250 582.495
## 116301 -37.24597 -8.411250 583.181
## 116302 -37.24569 -8.411250 583.446
## 116303 -37.24541 -8.411250 583.681
## 116304 -37.24513 -8.411250 584.298
## 116305 -37.24486 -8.411250 585.721
## 116306 -37.24458 -8.411250 587.334
## 116307 -37.24430 -8.411250 588.716
## 116308 -37.24402 -8.411250 589.572
## 116309 -37.24375 -8.411250 590.215
## 116310 -37.24347 -8.411250 590.932
## 116311 -37.24319 -8.411250 591.492
## 116312 -37.24291 -8.411250 592.612
## 116313 -37.24263 -8.411250 594.475
## 116314 -37.24236 -8.411250 597.316
## 116315 -37.24208 -8.411250 600.220
## 116316 -37.24180 -8.411250 602.386
## 116317 -37.24152 -8.411250 603.309
## 116318 -37.24125 -8.411250 603.734
## 116319 -37.24097 -8.411250 604.082
## 116320 -37.24069 -8.411250 605.175
## 116321 -37.24041 -8.411250 606.190
## 116322 -37.24013 -8.411250 606.820
## 116323 -37.23986 -8.411250 606.690
## 116324 -37.23958 -8.411250 606.147
## 116325 -37.23930 -8.411250 605.290
## 116326 -37.23902 -8.411250 604.704
## 116327 -37.23875 -8.411250 603.784
## 116328 -37.23847 -8.411250 602.667
## 116329 -37.23819 -8.411250 600.936
## 116330 -37.23791 -8.411250 599.137
## 116331 -37.23763 -8.411250 597.364
## 116332 -37.23736 -8.411250 595.785
## 116333 -37.23708 -8.411250 594.300
## 116334 -37.23680 -8.411250 592.788
## 116335 -37.23652 -8.411250 591.134
## 116336 -37.23625 -8.411250 589.542
## 116337 -37.23597 -8.411250 588.068
## 116338 -37.23569 -8.411250 587.149
## 116339 -37.23541 -8.411250 586.195
## 116340 -37.23513 -8.411250 585.018
## 116341 -37.23486 -8.411250 583.279
## 116342 -37.23458 -8.411250 581.381
## 116343 -37.23430 -8.411250 579.602
## 116344 -37.23402 -8.411250 577.855
## 116345 -37.23375 -8.411250 576.448
## 116346 -37.23347 -8.411250 575.249
## 116347 -37.23319 -8.411250 574.518
## 116348 -37.23291 -8.411250 574.125
## 116349 -37.23263 -8.411250 574.236
## 116350 -37.23236 -8.411250 574.628
## 116351 -37.23208 -8.411250 575.413
## 116352 -37.23180 -8.411250 576.484
## 116353 -37.23152 -8.411250 577.324
## 116354 -37.23125 -8.411250 578.391
## 116355 -37.23097 -8.411250 579.682
## 116356 -37.23069 -8.411250 581.029
## 116357 -37.23041 -8.411250 582.443
## 116358 -37.23013 -8.411250 583.711
## 116359 -37.22986 -8.411250 584.768
## 116360 -37.22958 -8.411250 585.617
## 116361 -37.22930 -8.411250 586.273
## 116362 -37.22902 -8.411250 586.769
## 116363 -37.22875 -8.411250 587.065
## 116364 -37.22847 -8.411250 587.144
## 116365 -37.22819 -8.411250 586.911
## 116366 -37.22791 -8.411250 586.647
## 116367 -37.22763 -8.411250 586.543
## 116368 -37.22736 -8.411250 586.836
## 116369 -37.22708 -8.411250 587.063
## 116370 -37.22680 -8.411250 587.026
## 116371 -37.22652 -8.411250 586.137
## 116372 -37.22625 -8.411250 585.004
## 116373 -37.22597 -8.411250 583.860
## 116374 -37.22569 -8.411250 583.295
## 116375 -37.22541 -8.411250 582.686
## 116376 -37.22513 -8.411250 581.867
## 116377 -37.22486 -8.411250 580.259
## 116378 -37.22458 -8.411250 578.569
## 116379 -37.22430 -8.411250 577.210
## 116380 -37.22402 -8.411250 575.916
## 116381 -37.22375 -8.411250 574.921
## 117225 -37.36569 -8.411528 520.929
## 117226 -37.36541 -8.411528 519.945
## 117227 -37.36513 -8.411528 519.112
## 117228 -37.36486 -8.411528 519.210
## 117229 -37.36458 -8.411528 519.631
## 117230 -37.36430 -8.411528 520.159
## 117231 -37.36402 -8.411528 520.561
## 117232 -37.36375 -8.411528 521.079
## 117233 -37.36347 -8.411528 521.860
## 117234 -37.36319 -8.411528 523.459
## 117235 -37.36291 -8.411528 525.102
## 117236 -37.36263 -8.411528 526.843
## 117237 -37.36236 -8.411528 528.238
## 117238 -37.36208 -8.411528 529.824
## 117239 -37.36180 -8.411528 531.360
## 117240 -37.36152 -8.411528 533.224
## 117241 -37.36125 -8.411528 535.071
## 117242 -37.36097 -8.411528 536.710
## 117243 -37.36069 -8.411528 537.737
## 117244 -37.36041 -8.411528 538.671
## 117245 -37.36013 -8.411528 539.840
## 117246 -37.35986 -8.411528 541.919
## 117247 -37.35958 -8.411528 543.939
## 117248 -37.35930 -8.411528 546.352
## 117249 -37.35902 -8.411528 548.208
## 117250 -37.35875 -8.411528 549.460
## 117251 -37.35847 -8.411528 550.411
## 117252 -37.35819 -8.411528 550.762
## 117253 -37.35791 -8.411528 551.199
## 117254 -37.35763 -8.411528 551.730
## 117255 -37.35736 -8.411528 552.672
## 117256 -37.35708 -8.411528 553.681
## 117257 -37.35680 -8.411528 554.558
## 117258 -37.35652 -8.411528 554.874
## 117259 -37.35625 -8.411528 554.893
## 117260 -37.35597 -8.411528 554.690
## 117261 -37.35569 -8.411528 554.283
## 117262 -37.35541 -8.411528 553.854
## 117263 -37.35513 -8.411528 553.622
## 117264 -37.35486 -8.411528 553.000
## 117265 -37.35458 -8.411528 552.389
## 117266 -37.35430 -8.411528 551.900
## 117267 -37.35402 -8.411528 551.843
## 117268 -37.35375 -8.411528 551.888
## 117269 -37.35347 -8.411528 551.730
## 117270 -37.35319 -8.411528 550.932
## 117271 -37.35291 -8.411528 550.289
## 117272 -37.35263 -8.411528 549.608
## 117273 -37.35236 -8.411528 549.013
## 117274 -37.35208 -8.411528 548.530
## 117275 -37.35180 -8.411528 548.324
## 117276 -37.35152 -8.411528 548.734
## 117277 -37.35125 -8.411528 549.471
## 117278 -37.35097 -8.411528 550.453
## 117279 -37.35069 -8.411528 551.549
## 117280 -37.35041 -8.411528 552.597
## 117281 -37.35013 -8.411528 553.443
## 117282 -37.34986 -8.411528 553.960
## 117283 -37.34958 -8.411528 554.330
## 117284 -37.34930 -8.411528 554.703
## 117285 -37.34902 -8.411528 555.167
## 117286 -37.34875 -8.411528 555.761
## 117287 -37.34847 -8.411528 556.391
## 117288 -37.34819 -8.411528 557.168
## 117289 -37.34791 -8.411528 557.717
## 117290 -37.34763 -8.411528 558.272
## 117291 -37.34736 -8.411528 558.862
## 117292 -37.34708 -8.411528 559.463
## 117293 -37.34680 -8.411528 559.704
## 117294 -37.34652 -8.411528 559.622
## 117295 -37.34625 -8.411528 559.459
## 117296 -37.34597 -8.411528 559.329
## 117297 -37.34569 -8.411528 559.538
## 117298 -37.34541 -8.411528 559.728
## 117299 -37.34513 -8.411528 559.768
## 117300 -37.34486 -8.411528 559.457
## 117301 -37.34458 -8.411528 559.197
## 117302 -37.34430 -8.411528 559.183
## 117303 -37.34402 -8.411528 560.037
## 117304 -37.34375 -8.411528 560.920
## 117305 -37.34347 -8.411528 561.498
## 117306 -37.34319 -8.411528 561.201
## 117307 -37.34291 -8.411528 560.735
## 117308 -37.34263 -8.411528 560.090
## 117309 -37.34236 -8.411528 559.735
## 117310 -37.34208 -8.411528 559.446
## 117311 -37.34180 -8.411528 559.444
## 117312 -37.34152 -8.411528 559.661
## 117313 -37.34125 -8.411528 559.954
## 117314 -37.34097 -8.411528 560.399
## 117315 -37.34069 -8.411528 560.474
## 117316 -37.34041 -8.411528 560.457
## 117317 -37.34013 -8.411528 560.324
## 117318 -37.33986 -8.411528 560.282
## 117319 -37.33958 -8.411528 560.169
## 117320 -37.33930 -8.411528 559.786
## 117321 -37.33902 -8.411528 558.996
## 117322 -37.33875 -8.411528 558.127
## 117323 -37.33847 -8.411528 557.459
## 117324 -37.33819 -8.411528 557.488
## 117325 -37.33791 -8.411528 557.660
## 117326 -37.33763 -8.411528 557.967
## 117327 -37.33736 -8.411528 557.884
## 117328 -37.33708 -8.411528 557.747
## 117329 -37.33680 -8.411528 557.490
## 117330 -37.33652 -8.411528 557.092
## 117331 -37.33625 -8.411528 556.742
## 117332 -37.33597 -8.411528 556.579
## 117333 -37.33569 -8.411528 557.218
## 117334 -37.33541 -8.411528 558.033
## 117335 -37.33513 -8.411528 558.808
## 117336 -37.33486 -8.411528 559.258
## 117337 -37.33458 -8.411528 559.396
## 117338 -37.33430 -8.411528 559.992
## 117339 -37.33402 -8.411528 560.128
## 117340 -37.33375 -8.411528 560.139
## 117341 -37.33347 -8.411528 559.986
## 117342 -37.33319 -8.411528 560.071
## 117343 -37.33291 -8.411528 560.155
## 117344 -37.33263 -8.411528 559.908
## 117345 -37.33236 -8.411528 559.587
## 117346 -37.33208 -8.411528 559.197
## 117347 -37.33180 -8.411528 558.936
## 117348 -37.33152 -8.411528 558.715
## 117349 -37.33125 -8.411528 558.309
## 117350 -37.33097 -8.411528 557.970
## 117351 -37.33069 -8.411528 557.474
## 117352 -37.33041 -8.411528 557.003
## 117353 -37.33013 -8.411528 556.655
## 117354 -37.32986 -8.411528 556.492
## 117355 -37.32958 -8.411528 556.575
## 117356 -37.32930 -8.411528 556.730
## 117357 -37.32902 -8.411528 557.155
## 117358 -37.32875 -8.411528 557.785
## 117359 -37.32847 -8.411528 558.781
## 117360 -37.32819 -8.411528 560.016
## 117361 -37.32791 -8.411528 561.156
## 117362 -37.32763 -8.411528 561.885
## 117363 -37.32736 -8.411528 561.964
## 117364 -37.32708 -8.411528 561.873
## 117365 -37.32680 -8.411528 562.192
## 117366 -37.32652 -8.411528 562.953
## 117367 -37.32625 -8.411528 563.533
## 117368 -37.32597 -8.411528 564.275
## 117369 -37.32569 -8.411528 564.338
## 117370 -37.32541 -8.411528 564.307
## 117371 -37.32513 -8.411528 563.791
## 117372 -37.32486 -8.411528 563.651
## 117373 -37.32458 -8.411528 563.894
## 117374 -37.32430 -8.411528 564.025
## 117375 -37.32402 -8.411528 564.285
## 117376 -37.32375 -8.411528 564.638
## 117377 -37.32347 -8.411528 565.297
## 117378 -37.32319 -8.411528 566.810
## 117379 -37.32291 -8.411528 568.308
## 117380 -37.32263 -8.411528 569.694
## 117381 -37.32236 -8.411528 570.434
## 117382 -37.32208 -8.411528 570.733
## 117383 -37.32180 -8.411528 571.038
## 117384 -37.32152 -8.411528 571.213
## 117385 -37.32125 -8.411528 571.213
## 117386 -37.32097 -8.411528 571.094
## 117387 -37.32069 -8.411528 571.122
## 117388 -37.32041 -8.411528 571.293
## 117389 -37.32013 -8.411528 571.465
## 117390 -37.31986 -8.411528 571.684
## 117391 -37.31958 -8.411528 571.959
## 117392 -37.31930 -8.411528 572.378
## 117393 -37.31902 -8.411528 572.895
## 117394 -37.31875 -8.411528 573.219
## 117395 -37.31847 -8.411528 573.380
## 117396 -37.31819 -8.411528 573.009
## 117397 -37.31791 -8.411528 572.512
## 117398 -37.31763 -8.411528 572.220
## 117399 -37.31736 -8.411528 571.965
## 117400 -37.31708 -8.411528 572.094
## 117401 -37.31680 -8.411528 572.192
## 117402 -37.31652 -8.411528 572.864
## 117403 -37.31625 -8.411528 573.860
## 117404 -37.31597 -8.411528 574.411
## 117405 -37.31569 -8.411528 574.085
## 117406 -37.31541 -8.411528 573.319
## 117407 -37.31513 -8.411528 572.571
## 117408 -37.31486 -8.411528 571.885
## 117409 -37.31458 -8.411528 571.192
## 117410 -37.31430 -8.411528 570.786
## 117411 -37.31402 -8.411528 570.686
## 117412 -37.31375 -8.411528 570.599
## 117413 -37.31347 -8.411528 570.418
## 117414 -37.31319 -8.411528 569.945
## 117415 -37.31291 -8.411528 569.137
## 117416 -37.31263 -8.411528 567.896
## 117417 -37.31236 -8.411528 566.222
## 117418 -37.31208 -8.411528 564.201
## 117419 -37.31180 -8.411528 562.137
## 117420 -37.31152 -8.411528 559.867
## 117421 -37.31125 -8.411528 557.766
## 117422 -37.31097 -8.411528 556.479
## 117423 -37.31069 -8.411528 556.636
## 117424 -37.31041 -8.411528 557.697
## 117425 -37.31013 -8.411528 559.409
## 117426 -37.30986 -8.411528 560.700
## 117427 -37.30958 -8.411528 562.199
## 117428 -37.30930 -8.411528 563.457
## 117429 -37.30902 -8.411528 564.853
## 117430 -37.30875 -8.411528 566.020
## 117431 -37.30847 -8.411528 566.818
## 117432 -37.30819 -8.411528 567.266
## 117433 -37.30791 -8.411528 567.732
## 117434 -37.30763 -8.411528 568.381
## 117435 -37.30736 -8.411528 569.775
## 117436 -37.30708 -8.411528 571.022
## 117437 -37.30680 -8.411528 572.288
## 117438 -37.30652 -8.411528 572.576
## 117439 -37.30625 -8.411528 572.599
## 117440 -37.30597 -8.411528 573.082
## 117441 -37.30569 -8.411528 574.323
## 117442 -37.30541 -8.411528 575.183
## 117443 -37.30513 -8.411528 575.023
## 117444 -37.30486 -8.411528 573.236
## 117445 -37.30458 -8.411528 570.968
## 117446 -37.30430 -8.411528 568.615
## 117447 -37.30402 -8.411528 567.153
## 117448 -37.30375 -8.411528 566.362
## 117449 -37.30347 -8.411528 566.418
## 117450 -37.30319 -8.411528 566.969
## 117451 -37.30291 -8.411528 567.890
## 117452 -37.30263 -8.411528 568.575
## 117453 -37.30236 -8.411528 569.230
## 117454 -37.30208 -8.411528 569.843
## 117455 -37.30180 -8.411528 570.511
## 117456 -37.30152 -8.411528 571.269
## 117457 -37.30125 -8.411528 571.978
## 117458 -37.30097 -8.411528 572.599
## 117459 -37.30069 -8.411528 572.547
## 117460 -37.30041 -8.411528 572.007
## 117461 -37.30013 -8.411528 570.864
## 117462 -37.29986 -8.411528 569.626
## 117463 -37.29958 -8.411528 568.504
## 117464 -37.29930 -8.411528 567.827
## 117465 -37.29902 -8.411528 567.768
## 117466 -37.29875 -8.411528 567.957
## 117467 -37.29847 -8.411528 568.424
## 117468 -37.29819 -8.411528 568.412
## 117469 -37.29791 -8.411528 568.107
## 117470 -37.29763 -8.411528 567.569
## 117471 -37.29736 -8.411528 566.819
## 117472 -37.29708 -8.411528 566.225
## 117473 -37.29680 -8.411528 565.720
## 117474 -37.29652 -8.411528 565.819
## 117475 -37.29625 -8.411528 566.238
## 117476 -37.29597 -8.411528 566.695
## 117477 -37.29569 -8.411528 567.302
## 117478 -37.29541 -8.411528 567.703
## 117479 -37.29513 -8.411528 567.871
## 117480 -37.29486 -8.411528 567.326
## 117481 -37.29458 -8.411528 566.287
## 117482 -37.29430 -8.411528 565.021
## 117483 -37.29402 -8.411528 563.649
## 117484 -37.29375 -8.411528 562.490
## 117485 -37.29347 -8.411528 561.750
## 117486 -37.29319 -8.411528 561.602
## 117487 -37.29291 -8.411528 561.874
## 117488 -37.29263 -8.411528 561.960
## 117489 -37.29236 -8.411528 562.004
## 117490 -37.29208 -8.411528 562.372
## 117491 -37.29180 -8.411528 563.245
## 117492 -37.29152 -8.411528 564.936
## 117493 -37.29125 -8.411528 566.487
## 117494 -37.29097 -8.411528 567.463
## 117495 -37.29069 -8.411528 566.766
## 117496 -37.29041 -8.411528 565.524
## 117497 -37.29013 -8.411528 563.777
## 117498 -37.28986 -8.411528 562.781
## 117499 -37.28958 -8.411528 561.861
## 117500 -37.28930 -8.411528 561.374
## 117501 -37.28902 -8.411528 561.137
## 117502 -37.28875 -8.411528 560.635
## 117503 -37.28847 -8.411528 560.231
## 117504 -37.28819 -8.411528 560.040
## 117505 -37.28791 -8.411528 560.025
## 117506 -37.28763 -8.411528 559.858
## 117507 -37.28736 -8.411528 559.511
## 117508 -37.28708 -8.411528 559.491
## 117509 -37.28680 -8.411528 560.032
## 117510 -37.28652 -8.411528 561.170
## 117511 -37.28625 -8.411528 562.452
## 117512 -37.28597 -8.411528 563.644
## 117513 -37.28569 -8.411528 564.531
## 117514 -37.28541 -8.411528 565.351
## 117515 -37.28513 -8.411528 565.864
## 117516 -37.28486 -8.411528 566.457
## 117517 -37.28458 -8.411528 566.944
## 117518 -37.28430 -8.411528 568.091
## 117519 -37.28402 -8.411528 569.229
## 117520 -37.28375 -8.411528 570.125
## 117521 -37.28347 -8.411528 570.377
## 117522 -37.28319 -8.411528 569.955
## 117523 -37.28291 -8.411528 569.094
## 117524 -37.28263 -8.411528 567.877
## 117525 -37.28236 -8.411528 566.658
## 117526 -37.28208 -8.411528 565.176
## 117527 -37.28180 -8.411528 563.701
## 117528 -37.28152 -8.411528 562.543
## 117529 -37.28125 -8.411528 561.686
## 117530 -37.28097 -8.411528 561.118
## 117531 -37.28069 -8.411528 561.387
## 117532 -37.28041 -8.411528 562.421
## 117533 -37.28013 -8.411528 563.836
## 117534 -37.27986 -8.411528 565.740
## 117535 -37.27958 -8.411528 567.695
## 117536 -37.27930 -8.411528 569.354
## 117537 -37.27902 -8.411528 570.597
## 117538 -37.27875 -8.411528 571.801
## 117539 -37.27847 -8.411528 573.021
## 117540 -37.27819 -8.411528 574.219
## 117541 -37.27791 -8.411528 575.084
## 117542 -37.27763 -8.411528 575.695
## 117543 -37.27736 -8.411528 575.728
## 117544 -37.27708 -8.411528 575.540
## 117545 -37.27680 -8.411528 575.200
## 117546 -37.27652 -8.411528 574.994
## 117547 -37.27625 -8.411528 575.010
## 117548 -37.27597 -8.411528 575.202
## 117549 -37.27569 -8.411528 575.511
## 117550 -37.27541 -8.411528 575.838
## 117551 -37.27513 -8.411528 576.261
## 117552 -37.27486 -8.411528 576.626
## 117553 -37.27458 -8.411528 576.829
## 117554 -37.27430 -8.411528 576.848
## 117555 -37.27402 -8.411528 576.615
## 117556 -37.27375 -8.411528 576.233
## 117557 -37.27347 -8.411528 575.761
## 117558 -37.27319 -8.411528 575.294
## 117559 -37.27291 -8.411528 574.810
## 117560 -37.27263 -8.411528 574.496
## 117561 -37.27236 -8.411528 574.243
## 117562 -37.27208 -8.411528 574.084
## 117563 -37.27180 -8.411528 573.701
## 117564 -37.27152 -8.411528 573.243
## 117565 -37.27125 -8.411528 572.684
## 117566 -37.27097 -8.411528 571.971
## 117567 -37.27069 -8.411528 570.940
## 117568 -37.27041 -8.411528 569.844
## 117569 -37.27013 -8.411528 568.667
## 117570 -37.26986 -8.411528 567.675
## 117571 -37.26958 -8.411528 566.958
## 117572 -37.26930 -8.411528 566.777
## 117573 -37.26902 -8.411528 567.477
## 117574 -37.26875 -8.411528 568.488
## 117575 -37.26847 -8.411528 569.650
## 117576 -37.26819 -8.411528 570.490
## 117577 -37.26791 -8.411528 571.295
## 117578 -37.26763 -8.411528 572.012
## 117579 -37.26736 -8.411528 572.633
## 117580 -37.26708 -8.411528 573.154
## 117581 -37.26680 -8.411528 573.729
## 117582 -37.26652 -8.411528 574.304
## 117583 -37.26625 -8.411528 574.449
## 117584 -37.26597 -8.411528 573.739
## 117585 -37.26569 -8.411528 572.247
## 117586 -37.26541 -8.411528 570.591
## 117587 -37.26513 -8.411528 568.840
## 117588 -37.26486 -8.411528 567.830
## 117589 -37.26458 -8.411528 566.825
## 117590 -37.26430 -8.411528 566.551
## 117591 -37.26402 -8.411528 566.102
## 117592 -37.26375 -8.411528 565.562
## 117593 -37.26347 -8.411528 564.775
## 117594 -37.26319 -8.411528 563.588
## 117595 -37.26291 -8.411528 562.910
## 117596 -37.26263 -8.411528 562.953
## 117597 -37.26236 -8.411528 564.841
## 117598 -37.26208 -8.411528 567.083
## 117599 -37.26180 -8.411528 569.589
## 117600 -37.26152 -8.411528 570.971
## 117601 -37.26125 -8.411528 571.291
## 117602 -37.26097 -8.411528 571.142
## 117603 -37.26069 -8.411528 570.932
## 117604 -37.26041 -8.411528 570.723
## 117605 -37.26013 -8.411528 570.292
## 117606 -37.25986 -8.411528 570.081
## 117607 -37.25958 -8.411528 569.954
## 117608 -37.25930 -8.411528 569.881
## 117609 -37.25902 -8.411528 569.396
## 117610 -37.25875 -8.411528 568.670
## 117611 -37.25847 -8.411528 567.968
## 117612 -37.25819 -8.411528 567.348
## 117613 -37.25791 -8.411528 566.589
## 117614 -37.25763 -8.411528 565.632
## 117615 -37.25736 -8.411528 564.376
## 117616 -37.25708 -8.411528 563.070
## 117617 -37.25680 -8.411528 561.814
## 117618 -37.25652 -8.411528 560.803
## 117619 -37.25625 -8.411528 560.027
## 117620 -37.25597 -8.411528 559.768
## 117621 -37.25569 -8.411528 560.026
## 117622 -37.25541 -8.411528 560.320
## 117623 -37.25513 -8.411528 560.361
## 117624 -37.25486 -8.411528 559.904
## 117625 -37.25458 -8.411528 559.469
## 117626 -37.25430 -8.411528 559.719
## 117627 -37.25402 -8.411528 561.340
## 117628 -37.25375 -8.411528 563.366
## 117629 -37.25347 -8.411528 565.312
## 117630 -37.25319 -8.411528 566.323
## 117631 -37.25291 -8.411528 567.133
## 117632 -37.25263 -8.411528 567.724
## 117633 -37.25236 -8.411528 568.725
## 117634 -37.25208 -8.411528 569.458
## 117635 -37.25180 -8.411528 569.701
## 117636 -37.25152 -8.411528 568.798
## 117637 -37.25125 -8.411528 567.695
## 117638 -37.25097 -8.411528 566.993
## 117639 -37.25069 -8.411528 567.607
## 117640 -37.25041 -8.411528 568.491
## 117641 -37.25013 -8.411528 569.570
## 117642 -37.24986 -8.411528 569.977
## 117643 -37.24958 -8.411528 570.420
## 117644 -37.24930 -8.411528 570.834
## 117645 -37.24902 -8.411528 571.962
## 117646 -37.24875 -8.411528 573.318
## 117647 -37.24847 -8.411528 574.684
## 117648 -37.24819 -8.411528 575.956
## 117649 -37.24791 -8.411528 577.060
## 117650 -37.24763 -8.411528 578.284
## 117651 -37.24736 -8.411528 578.835
## 117652 -37.24708 -8.411528 579.297
## 117653 -37.24680 -8.411528 579.486
## 117654 -37.24652 -8.411528 580.221
## 117655 -37.24625 -8.411528 581.152
## 117656 -37.24597 -8.411528 581.895
## 117657 -37.24569 -8.411528 582.223
## 117658 -37.24541 -8.411528 582.539
## 117659 -37.24513 -8.411528 583.373
## 117660 -37.24486 -8.411528 584.931
## 117661 -37.24458 -8.411528 586.485
## 117662 -37.24430 -8.411528 588.009
## 117663 -37.24402 -8.411528 588.867
## 117664 -37.24375 -8.411528 589.612
## 117665 -37.24347 -8.411528 590.368
## 117666 -37.24319 -8.411528 591.092
## 117667 -37.24291 -8.411528 592.133
## 117668 -37.24263 -8.411528 593.414
## 117669 -37.24236 -8.411528 595.880
## 117670 -37.24208 -8.411528 598.265
## 117671 -37.24180 -8.411528 600.730
## 117672 -37.24152 -8.411528 601.531
## 117673 -37.24125 -8.411528 601.792
## 117674 -37.24097 -8.411528 602.079
## 117675 -37.24069 -8.411528 602.974
## 117676 -37.24041 -8.411528 603.905
## 117677 -37.24013 -8.411528 604.356
## 117678 -37.23986 -8.411528 604.483
## 117679 -37.23958 -8.411528 604.360
## 117680 -37.23930 -8.411528 603.861
## 117681 -37.23902 -8.411528 603.468
## 117682 -37.23875 -8.411528 602.616
## 117683 -37.23847 -8.411528 601.288
## 117684 -37.23819 -8.411528 599.809
## 117685 -37.23791 -8.411528 598.314
## 117686 -37.23763 -8.411528 597.023
## 117687 -37.23736 -8.411528 595.785
## 117688 -37.23708 -8.411528 594.616
## 117689 -37.23680 -8.411528 593.209
## 117690 -37.23652 -8.411528 591.689
## 117691 -37.23625 -8.411528 590.178
## 117692 -37.23597 -8.411528 588.836
## 117693 -37.23569 -8.411528 587.763
## 117694 -37.23541 -8.411528 586.702
## 117695 -37.23513 -8.411528 585.513
## 117696 -37.23486 -8.411528 583.765
## 117697 -37.23458 -8.411528 582.102
## 117698 -37.23430 -8.411528 580.072
## 117699 -37.23402 -8.411528 578.272
## 117700 -37.23375 -8.411528 576.803
## 117701 -37.23347 -8.411528 575.741
## 117702 -37.23319 -8.411528 575.036
## 117703 -37.23291 -8.411528 574.741
## 117704 -37.23263 -8.411528 574.982
## 117705 -37.23236 -8.411528 575.424
## 117706 -37.23208 -8.411528 576.141
## 117707 -37.23180 -8.411528 576.876
## 117708 -37.23152 -8.411528 577.553
## 117709 -37.23125 -8.411528 578.295
## 117710 -37.23097 -8.411528 579.015
## 117711 -37.23069 -8.411528 580.437
## 117712 -37.23041 -8.411528 581.971
## 117713 -37.23013 -8.411528 583.593
## 117714 -37.22986 -8.411528 584.950
## 117715 -37.22958 -8.411528 585.801
## 117716 -37.22930 -8.411528 586.721
## 117717 -37.22902 -8.411528 587.445
## 117718 -37.22875 -8.411528 587.766
## 117719 -37.22847 -8.411528 588.062
## 117720 -37.22819 -8.411528 587.787
## 117721 -37.22791 -8.411528 587.630
## 117722 -37.22763 -8.411528 587.552
## 117723 -37.22736 -8.411528 587.899
## 117724 -37.22708 -8.411528 588.167
## 117725 -37.22680 -8.411528 587.796
## 117726 -37.22652 -8.411528 586.473
## 117727 -37.22625 -8.411528 585.219
## 117728 -37.22597 -8.411528 584.137
## 117729 -37.22569 -8.411528 583.599
## 117730 -37.22541 -8.411528 583.128
## 117731 -37.22513 -8.411528 582.464
## 117732 -37.22486 -8.411528 580.969
## 117733 -37.22458 -8.411528 579.193
## 117734 -37.22430 -8.411528 577.120
## 117735 -37.22402 -8.411528 575.616
## 117736 -37.22375 -8.411528 574.451
## 118580 -37.36569 -8.411806 520.953
## 118581 -37.36541 -8.411806 519.541
## 118582 -37.36513 -8.411806 518.424
## 118583 -37.36486 -8.411806 518.772
## 118584 -37.36458 -8.411806 519.476
## 118585 -37.36430 -8.411806 520.097
## 118586 -37.36402 -8.411806 520.517
## 118587 -37.36375 -8.411806 521.024
## 118588 -37.36347 -8.411806 521.979
## 118589 -37.36319 -8.411806 523.554
## 118590 -37.36291 -8.411806 525.135
## 118591 -37.36263 -8.411806 526.894
## 118592 -37.36236 -8.411806 528.429
## 118593 -37.36208 -8.411806 530.115
## 118594 -37.36180 -8.411806 531.854
## 118595 -37.36152 -8.411806 533.404
## 118596 -37.36125 -8.411806 535.454
## 118597 -37.36097 -8.411806 536.968
## 118598 -37.36069 -8.411806 538.390
## 118599 -37.36041 -8.411806 539.855
## 118600 -37.36013 -8.411806 541.250
## 118601 -37.35986 -8.411806 543.053
## 118602 -37.35958 -8.411806 544.833
## 118603 -37.35930 -8.411806 546.628
## 118604 -37.35902 -8.411806 548.714
## 118605 -37.35875 -8.411806 550.277
## 118606 -37.35847 -8.411806 551.521
## 118607 -37.35819 -8.411806 551.854
## 118608 -37.35791 -8.411806 552.229
## 118609 -37.35763 -8.411806 552.848
## 118610 -37.35736 -8.411806 553.701
## 118611 -37.35708 -8.411806 554.573
## 118612 -37.35680 -8.411806 555.333
## 118613 -37.35652 -8.411806 555.782
## 118614 -37.35625 -8.411806 556.058
## 118615 -37.35597 -8.411806 555.926
## 118616 -37.35569 -8.411806 555.383
## 118617 -37.35541 -8.411806 554.965
## 118618 -37.35513 -8.411806 554.690
## 118619 -37.35486 -8.411806 554.375
## 118620 -37.35458 -8.411806 554.020
## 118621 -37.35430 -8.411806 553.854
## 118622 -37.35402 -8.411806 553.447
## 118623 -37.35375 -8.411806 553.202
## 118624 -37.35347 -8.411806 552.787
## 118625 -37.35319 -8.411806 552.046
## 118626 -37.35291 -8.411806 551.361
## 118627 -37.35263 -8.411806 550.674
## 118628 -37.35236 -8.411806 550.133
## 118629 -37.35208 -8.411806 549.640
## 118630 -37.35180 -8.411806 549.630
## 118631 -37.35152 -8.411806 550.116
## 118632 -37.35125 -8.411806 550.852
## 118633 -37.35097 -8.411806 551.842
## 118634 -37.35069 -8.411806 552.814
## 118635 -37.35041 -8.411806 553.805
## 118636 -37.35013 -8.411806 554.552
## 118637 -37.34986 -8.411806 555.079
## 118638 -37.34958 -8.411806 555.419
## 118639 -37.34930 -8.411806 555.645
## 118640 -37.34902 -8.411806 556.322
## 118641 -37.34875 -8.411806 557.033
## 118642 -37.34847 -8.411806 557.778
## 118643 -37.34819 -8.411806 558.444
## 118644 -37.34791 -8.411806 558.880
## 118645 -37.34763 -8.411806 559.370
## 118646 -37.34736 -8.411806 559.973
## 118647 -37.34708 -8.411806 560.582
## 118648 -37.34680 -8.411806 560.839
## 118649 -37.34652 -8.411806 560.778
## 118650 -37.34625 -8.411806 560.636
## 118651 -37.34597 -8.411806 560.467
## 118652 -37.34569 -8.411806 560.464
## 118653 -37.34541 -8.411806 560.553
## 118654 -37.34513 -8.411806 560.517
## 118655 -37.34486 -8.411806 560.534
## 118656 -37.34458 -8.411806 560.561
## 118657 -37.34430 -8.411806 561.066
## 118658 -37.34402 -8.411806 561.706
## 118659 -37.34375 -8.411806 562.295
## 118660 -37.34347 -8.411806 562.769
## 118661 -37.34319 -8.411806 562.823
## 118662 -37.34291 -8.411806 562.393
## 118663 -37.34263 -8.411806 561.880
## 118664 -37.34236 -8.411806 561.313
## 118665 -37.34208 -8.411806 560.943
## 118666 -37.34180 -8.411806 560.647
## 118667 -37.34152 -8.411806 561.062
## 118668 -37.34125 -8.411806 561.429
## 118669 -37.34097 -8.411806 561.945
## 118670 -37.34069 -8.411806 561.830
## 118671 -37.34041 -8.411806 561.655
## 118672 -37.34013 -8.411806 561.363
## 118673 -37.33986 -8.411806 561.273
## 118674 -37.33958 -8.411806 561.121
## 118675 -37.33930 -8.411806 560.747
## 118676 -37.33902 -8.411806 559.910
## 118677 -37.33875 -8.411806 559.079
## 118678 -37.33847 -8.411806 558.417
## 118679 -37.33819 -8.411806 558.181
## 118680 -37.33791 -8.411806 558.184
## 118681 -37.33763 -8.411806 558.263
## 118682 -37.33736 -8.411806 558.359
## 118683 -37.33708 -8.411806 558.443
## 118684 -37.33680 -8.411806 558.312
## 118685 -37.33652 -8.411806 557.944
## 118686 -37.33625 -8.411806 557.792
## 118687 -37.33597 -8.411806 557.575
## 118688 -37.33569 -8.411806 558.269
## 118689 -37.33541 -8.411806 559.093
## 118690 -37.33513 -8.411806 559.938
## 118691 -37.33486 -8.411806 560.079
## 118692 -37.33458 -8.411806 560.016
## 118693 -37.33430 -8.411806 560.211
## 118694 -37.33402 -8.411806 561.120
## 118695 -37.33375 -8.411806 561.571
## 118696 -37.33347 -8.411806 561.783
## 118697 -37.33319 -8.411806 561.538
## 118698 -37.33291 -8.411806 561.168
## 118699 -37.33263 -8.411806 560.615
## 118700 -37.33236 -8.411806 560.049
## 118701 -37.33208 -8.411806 559.384
## 118702 -37.33180 -8.411806 558.740
## 118703 -37.33152 -8.411806 558.639
## 118704 -37.33125 -8.411806 558.538
## 118705 -37.33097 -8.411806 558.478
## 118706 -37.33069 -8.411806 557.725
## 118707 -37.33041 -8.411806 557.404
## 118708 -37.33013 -8.411806 556.869
## 118709 -37.32986 -8.411806 557.023
## 118710 -37.32958 -8.411806 557.603
## 118711 -37.32930 -8.411806 557.895
## 118712 -37.32902 -8.411806 558.251
## 118713 -37.32875 -8.411806 558.729
## 118714 -37.32847 -8.411806 559.610
## 118715 -37.32819 -8.411806 560.446
## 118716 -37.32791 -8.411806 561.259
## 118717 -37.32763 -8.411806 561.769
## 118718 -37.32736 -8.411806 561.991
## 118719 -37.32708 -8.411806 562.059
## 118720 -37.32680 -8.411806 562.485
## 118721 -37.32652 -8.411806 563.572
## 118722 -37.32625 -8.411806 564.590
## 118723 -37.32597 -8.411806 565.689
## 118724 -37.32569 -8.411806 565.259
## 118725 -37.32541 -8.411806 564.606
## 118726 -37.32513 -8.411806 563.804
## 118727 -37.32486 -8.411806 563.818
## 118728 -37.32458 -8.411806 564.039
## 118729 -37.32430 -8.411806 564.479
## 118730 -37.32402 -8.411806 564.911
## 118731 -37.32375 -8.411806 565.640
## 118732 -37.32347 -8.411806 566.537
## 118733 -37.32319 -8.411806 568.190
## 118734 -37.32291 -8.411806 569.767
## 118735 -37.32263 -8.411806 571.316
## 118736 -37.32236 -8.411806 572.097
## 118737 -37.32208 -8.411806 572.351
## 118738 -37.32180 -8.411806 572.722
## 118739 -37.32152 -8.411806 572.835
## 118740 -37.32125 -8.411806 572.941
## 118741 -37.32097 -8.411806 572.777
## 118742 -37.32069 -8.411806 572.567
## 118743 -37.32041 -8.411806 572.697
## 118744 -37.32013 -8.411806 572.800
## 118745 -37.31986 -8.411806 573.058
## 118746 -37.31958 -8.411806 573.345
## 118747 -37.31930 -8.411806 573.805
## 118748 -37.31902 -8.411806 574.157
## 118749 -37.31875 -8.411806 574.510
## 118750 -37.31847 -8.411806 574.559
## 118751 -37.31819 -8.411806 574.429
## 118752 -37.31791 -8.411806 574.170
## 118753 -37.31763 -8.411806 573.982
## 118754 -37.31736 -8.411806 573.567
## 118755 -37.31708 -8.411806 573.362
## 118756 -37.31680 -8.411806 573.271
## 118757 -37.31652 -8.411806 573.447
## 118758 -37.31625 -8.411806 573.821
## 118759 -37.31597 -8.411806 573.930
## 118760 -37.31569 -8.411806 573.825
## 118761 -37.31541 -8.411806 573.425
## 118762 -37.31513 -8.411806 573.097
## 118763 -37.31486 -8.411806 572.310
## 118764 -37.31458 -8.411806 571.657
## 118765 -37.31430 -8.411806 571.266
## 118766 -37.31402 -8.411806 571.394
## 118767 -37.31375 -8.411806 571.551
## 118768 -37.31347 -8.411806 571.417
## 118769 -37.31319 -8.411806 570.556
## 118770 -37.31291 -8.411806 569.407
## 118771 -37.31263 -8.411806 567.854
## 118772 -37.31236 -8.411806 566.315
## 118773 -37.31208 -8.411806 564.430
## 118774 -37.31180 -8.411806 562.461
## 118775 -37.31152 -8.411806 560.290
## 118776 -37.31125 -8.411806 558.499
## 118777 -37.31097 -8.411806 557.306
## 118778 -37.31069 -8.411806 557.077
## 118779 -37.31041 -8.411806 557.792
## 118780 -37.31013 -8.411806 559.283
## 118781 -37.30986 -8.411806 561.091
## 118782 -37.30958 -8.411806 563.010
## 118783 -37.30930 -8.411806 564.803
## 118784 -37.30902 -8.411806 565.975
## 118785 -37.30875 -8.411806 567.068
## 118786 -37.30847 -8.411806 567.772
## 118787 -37.30819 -8.411806 568.537
## 118788 -37.30791 -8.411806 569.173
## 118789 -37.30763 -8.411806 569.926
## 118790 -37.30736 -8.411806 570.831
## 118791 -37.30708 -8.411806 571.777
## 118792 -37.30680 -8.411806 572.461
## 118793 -37.30652 -8.411806 573.641
## 118794 -37.30625 -8.411806 574.204
## 118795 -37.30597 -8.411806 575.236
## 118796 -37.30569 -8.411806 576.226
## 118797 -37.30541 -8.411806 576.828
## 118798 -37.30513 -8.411806 576.528
## 118799 -37.30486 -8.411806 574.857
## 118800 -37.30458 -8.411806 572.610
## 118801 -37.30430 -8.411806 570.474
## 118802 -37.30402 -8.411806 568.957
## 118803 -37.30375 -8.411806 568.015
## 118804 -37.30347 -8.411806 567.901
## 118805 -37.30319 -8.411806 568.273
## 118806 -37.30291 -8.411806 568.891
## 118807 -37.30263 -8.411806 569.255
## 118808 -37.30236 -8.411806 569.519
## 118809 -37.30208 -8.411806 569.785
## 118810 -37.30180 -8.411806 570.342
## 118811 -37.30152 -8.411806 571.292
## 118812 -37.30125 -8.411806 572.211
## 118813 -37.30097 -8.411806 573.176
## 118814 -37.30069 -8.411806 573.619
## 118815 -37.30041 -8.411806 573.488
## 118816 -37.30013 -8.411806 572.716
## 118817 -37.29986 -8.411806 570.964
## 118818 -37.29958 -8.411806 569.437
## 118819 -37.29930 -8.411806 568.168
## 118820 -37.29902 -8.411806 568.691
## 118821 -37.29875 -8.411806 569.353
## 118822 -37.29847 -8.411806 570.096
## 118823 -37.29819 -8.411806 569.600
## 118824 -37.29791 -8.411806 568.880
## 118825 -37.29763 -8.411806 568.036
## 118826 -37.29736 -8.411806 567.401
## 118827 -37.29708 -8.411806 566.764
## 118828 -37.29680 -8.411806 566.635
## 118829 -37.29652 -8.411806 566.479
## 118830 -37.29625 -8.411806 566.631
## 118831 -37.29597 -8.411806 566.863
## 118832 -37.29569 -8.411806 567.887
## 118833 -37.29541 -8.411806 568.446
## 118834 -37.29513 -8.411806 569.096
## 118835 -37.29486 -8.411806 568.168
## 118836 -37.29458 -8.411806 566.695
## 118837 -37.29430 -8.411806 565.278
## 118838 -37.29402 -8.411806 564.372
## 118839 -37.29375 -8.411806 563.861
## 118840 -37.29347 -8.411806 563.406
## 118841 -37.29319 -8.411806 562.867
## 118842 -37.29291 -8.411806 562.982
## 118843 -37.29263 -8.411806 563.179
## 118844 -37.29236 -8.411806 563.234
## 118845 -37.29208 -8.411806 563.481
## 118846 -37.29180 -8.411806 564.326
## 118847 -37.29152 -8.411806 565.484
## 118848 -37.29125 -8.411806 566.929
## 118849 -37.29097 -8.411806 567.734
## 118850 -37.29069 -8.411806 567.079
## 118851 -37.29041 -8.411806 565.879
## 118852 -37.29013 -8.411806 564.186
## 118853 -37.28986 -8.411806 563.433
## 118854 -37.28958 -8.411806 562.836
## 118855 -37.28930 -8.411806 562.511
## 118856 -37.28902 -8.411806 562.235
## 118857 -37.28875 -8.411806 561.767
## 118858 -37.28847 -8.411806 561.405
## 118859 -37.28819 -8.411806 560.979
## 118860 -37.28791 -8.411806 560.592
## 118861 -37.28763 -8.411806 560.071
## 118862 -37.28736 -8.411806 559.881
## 118863 -37.28708 -8.411806 560.028
## 118864 -37.28680 -8.411806 560.789
## 118865 -37.28652 -8.411806 561.649
## 118866 -37.28625 -8.411806 562.788
## 118867 -37.28597 -8.411806 563.899
## 118868 -37.28569 -8.411806 565.293
## 118869 -37.28541 -8.411806 566.485
## 118870 -37.28513 -8.411806 567.283
## 118871 -37.28486 -8.411806 567.518
## 118872 -37.28458 -8.411806 567.810
## 118873 -37.28430 -8.411806 568.719
## 118874 -37.28402 -8.411806 570.023
## 118875 -37.28375 -8.411806 571.133
## 118876 -37.28347 -8.411806 571.398
## 118877 -37.28319 -8.411806 570.941
## 118878 -37.28291 -8.411806 570.154
## 118879 -37.28263 -8.411806 568.847
## 118880 -37.28236 -8.411806 567.760
## 118881 -37.28208 -8.411806 566.311
## 118882 -37.28180 -8.411806 565.037
## 118883 -37.28152 -8.411806 563.389
## 118884 -37.28125 -8.411806 561.855
## 118885 -37.28097 -8.411806 561.021
## 118886 -37.28069 -8.411806 561.632
## 118887 -37.28041 -8.411806 562.698
## 118888 -37.28013 -8.411806 564.392
## 118889 -37.27986 -8.411806 566.008
## 118890 -37.27958 -8.411806 567.938
## 118891 -37.27930 -8.411806 569.268
## 118892 -37.27902 -8.411806 570.747
## 118893 -37.27875 -8.411806 572.212
## 118894 -37.27847 -8.411806 573.462
## 118895 -37.27819 -8.411806 574.546
## 118896 -37.27791 -8.411806 575.217
## 118897 -37.27763 -8.411806 575.813
## 118898 -37.27736 -8.411806 575.480
## 118899 -37.27708 -8.411806 575.021
## 118900 -37.27680 -8.411806 574.251
## 118901 -37.27652 -8.411806 574.292
## 118902 -37.27625 -8.411806 574.705
## 118903 -37.27597 -8.411806 574.975
## 118904 -37.27569 -8.411806 575.168
## 118905 -37.27541 -8.411806 575.493
## 118906 -37.27513 -8.411806 575.971
## 118907 -37.27486 -8.411806 576.437
## 118908 -37.27458 -8.411806 576.766
## 118909 -37.27430 -8.411806 576.821
## 118910 -37.27402 -8.411806 576.818
## 118911 -37.27375 -8.411806 576.737
## 118912 -37.27347 -8.411806 576.474
## 118913 -37.27319 -8.411806 575.918
## 118914 -37.27291 -8.411806 575.397
## 118915 -37.27263 -8.411806 575.018
## 118916 -37.27236 -8.411806 574.756
## 118917 -37.27208 -8.411806 574.514
## 118918 -37.27180 -8.411806 574.119
## 118919 -37.27152 -8.411806 573.334
## 118920 -37.27125 -8.411806 572.654
## 118921 -37.27097 -8.411806 571.794
## 118922 -37.27069 -8.411806 570.885
## 118923 -37.27041 -8.411806 570.004
## 118924 -37.27013 -8.411806 568.912
## 118925 -37.26986 -8.411806 568.028
## 118926 -37.26958 -8.411806 567.431
## 118927 -37.26930 -8.411806 567.316
## 118928 -37.26902 -8.411806 568.137
## 118929 -37.26875 -8.411806 569.183
## 118930 -37.26847 -8.411806 570.431
## 118931 -37.26819 -8.411806 571.040
## 118932 -37.26791 -8.411806 571.534
## 118933 -37.26763 -8.411806 571.974
## 118934 -37.26736 -8.411806 572.902
## 118935 -37.26708 -8.411806 573.864
## 118936 -37.26680 -8.411806 574.749
## 118937 -37.26652 -8.411806 574.794
## 118938 -37.26625 -8.411806 574.508
## 118939 -37.26597 -8.411806 573.594
## 118940 -37.26569 -8.411806 572.571
## 118941 -37.26541 -8.411806 571.253
## 118942 -37.26513 -8.411806 569.642
## 118943 -37.26486 -8.411806 568.743
## 118944 -37.26458 -8.411806 567.843
## 118945 -37.26430 -8.411806 567.619
## 118946 -37.26402 -8.411806 566.644
## 118947 -37.26375 -8.411806 565.498
## 118948 -37.26347 -8.411806 564.305
## 118949 -37.26319 -8.411806 563.608
## 118950 -37.26291 -8.411806 563.523
## 118951 -37.26263 -8.411806 563.834
## 118952 -37.26236 -8.411806 565.598
## 118953 -37.26208 -8.411806 567.809
## 118954 -37.26180 -8.411806 569.937
## 118955 -37.26152 -8.411806 571.531
## 118956 -37.26125 -8.411806 572.145
## 118957 -37.26097 -8.411806 572.036
## 118958 -37.26069 -8.411806 571.447
## 118959 -37.26041 -8.411806 570.987
## 118960 -37.26013 -8.411806 570.226
## 118961 -37.25986 -8.411806 569.886
## 118962 -37.25958 -8.411806 569.739
## 118963 -37.25930 -8.411806 569.596
## 118964 -37.25902 -8.411806 569.303
## 118965 -37.25875 -8.411806 568.949
## 118966 -37.25847 -8.411806 568.444
## 118967 -37.25819 -8.411806 567.602
## 118968 -37.25791 -8.411806 566.705
## 118969 -37.25763 -8.411806 565.635
## 118970 -37.25736 -8.411806 564.396
## 118971 -37.25708 -8.411806 563.145
## 118972 -37.25680 -8.411806 561.926
## 118973 -37.25652 -8.411806 560.938
## 118974 -37.25625 -8.411806 560.366
## 118975 -37.25597 -8.411806 560.173
## 118976 -37.25569 -8.411806 560.925
## 118977 -37.25541 -8.411806 561.728
## 118978 -37.25513 -8.411806 561.975
## 118979 -37.25486 -8.411806 561.216
## 118980 -37.25458 -8.411806 560.369
## 118981 -37.25430 -8.411806 560.142
## 118982 -37.25402 -8.411806 561.437
## 118983 -37.25375 -8.411806 562.940
## 118984 -37.25347 -8.411806 564.496
## 118985 -37.25319 -8.411806 565.373
## 118986 -37.25291 -8.411806 565.887
## 118987 -37.25263 -8.411806 566.553
## 118988 -37.25236 -8.411806 567.190
## 118989 -37.25208 -8.411806 567.666
## 118990 -37.25180 -8.411806 567.830
## 118991 -37.25152 -8.411806 567.570
## 118992 -37.25125 -8.411806 567.411
## 118993 -37.25097 -8.411806 567.109
## 118994 -37.25069 -8.411806 567.319
## 118995 -37.25041 -8.411806 568.198
## 118996 -37.25013 -8.411806 569.193
## 118997 -37.24986 -8.411806 569.843
## 118998 -37.24958 -8.411806 570.374
## 118999 -37.24930 -8.411806 570.925
## 119000 -37.24902 -8.411806 571.853
## 119001 -37.24875 -8.411806 572.885
## 119002 -37.24847 -8.411806 574.030
## 119003 -37.24819 -8.411806 575.249
## 119004 -37.24791 -8.411806 576.287
## 119005 -37.24763 -8.411806 577.361
## 119006 -37.24736 -8.411806 577.853
## 119007 -37.24708 -8.411806 578.317
## 119008 -37.24680 -8.411806 578.394
## 119009 -37.24652 -8.411806 578.927
## 119010 -37.24625 -8.411806 579.576
## 119011 -37.24597 -8.411806 580.151
## 119012 -37.24569 -8.411806 580.948
## 119013 -37.24541 -8.411806 581.588
## 119014 -37.24513 -8.411806 582.576
## 119015 -37.24486 -8.411806 583.813
## 119016 -37.24458 -8.411806 585.142
## 119017 -37.24430 -8.411806 586.430
## 119018 -37.24402 -8.411806 587.354
## 119019 -37.24375 -8.411806 588.214
## 119020 -37.24347 -8.411806 589.063
## 119021 -37.24319 -8.411806 590.153
## 119022 -37.24291 -8.411806 591.540
## 119023 -37.24263 -8.411806 593.046
## 119024 -37.24236 -8.411806 594.800
## 119025 -37.24208 -8.411806 596.739
## 119026 -37.24180 -8.411806 598.521
## 119027 -37.24152 -8.411806 599.744
## 119028 -37.24125 -8.411806 600.628
## 119029 -37.24097 -8.411806 601.154
## 119030 -37.24069 -8.411806 601.393
## 119031 -37.24041 -8.411806 602.035
## 119032 -37.24013 -8.411806 602.343
## 119033 -37.23986 -8.411806 603.027
## 119034 -37.23958 -8.411806 603.328
## 119035 -37.23930 -8.411806 603.664
## 119036 -37.23902 -8.411806 602.971
## 119037 -37.23875 -8.411806 601.880
## 119038 -37.23847 -8.411806 600.490
## 119039 -37.23819 -8.411806 599.166
## 119040 -37.23791 -8.411806 597.797
## 119041 -37.23763 -8.411806 596.661
## 119042 -37.23736 -8.411806 595.751
## 119043 -37.23708 -8.411806 594.855
## 119044 -37.23680 -8.411806 593.580
## 119045 -37.23652 -8.411806 592.377
## 119046 -37.23625 -8.411806 590.882
## 119047 -37.23597 -8.411806 589.703
## 119048 -37.23569 -8.411806 588.134
## 119049 -37.23541 -8.411806 586.429
## 119050 -37.23513 -8.411806 584.993
## 119051 -37.23486 -8.411806 583.641
## 119052 -37.23458 -8.411806 582.278
## 119053 -37.23430 -8.411806 580.898
## 119054 -37.23402 -8.411806 578.920
## 119055 -37.23375 -8.411806 577.280
## 119056 -37.23347 -8.411806 576.292
## 119057 -37.23319 -8.411806 575.586
## 119058 -37.23291 -8.411806 574.804
## 119059 -37.23263 -8.411806 574.884
## 119060 -37.23236 -8.411806 575.694
## 119061 -37.23208 -8.411806 576.701
## 119062 -37.23180 -8.411806 577.571
## 119063 -37.23152 -8.411806 577.828
## 119064 -37.23125 -8.411806 578.347
## 119065 -37.23097 -8.411806 578.759
## 119066 -37.23069 -8.411806 580.350
## 119067 -37.23041 -8.411806 582.079
## 119068 -37.23013 -8.411806 583.828
## 119069 -37.22986 -8.411806 585.093
## 119070 -37.22958 -8.411806 585.989
## 119071 -37.22930 -8.411806 586.913
## 119072 -37.22902 -8.411806 587.753
## 119073 -37.22875 -8.411806 588.125
## 119074 -37.22847 -8.411806 588.261
## 119075 -37.22819 -8.411806 588.149
## 119076 -37.22791 -8.411806 588.134
## 119077 -37.22763 -8.411806 588.266
## 119078 -37.22736 -8.411806 588.562
## 119079 -37.22708 -8.411806 588.787
## 119080 -37.22680 -8.411806 588.472
## 119081 -37.22652 -8.411806 586.965
## 119082 -37.22625 -8.411806 585.385
## 119083 -37.22597 -8.411806 584.138
## 119084 -37.22569 -8.411806 583.760
## 119085 -37.22541 -8.411806 583.500
## 119086 -37.22513 -8.411806 583.041
## 119087 -37.22486 -8.411806 581.507
## 119088 -37.22458 -8.411806 579.833
## 119089 -37.22430 -8.411806 577.715
## 119090 -37.22402 -8.411806 575.962
## 119934 -37.36597 -8.412083 522.150
## 119935 -37.36569 -8.412083 520.785
## 119936 -37.36541 -8.412083 519.390
## 119937 -37.36513 -8.412083 518.447
## 119938 -37.36486 -8.412083 518.725
## 119939 -37.36458 -8.412083 519.440
## 119940 -37.36430 -8.412083 520.239
## 119941 -37.36402 -8.412083 520.690
## 119942 -37.36375 -8.412083 521.222
## 119943 -37.36347 -8.412083 522.045
## 119944 -37.36319 -8.412083 523.372
## 119945 -37.36291 -8.412083 525.013
## 119946 -37.36263 -8.412083 526.780
## 119947 -37.36236 -8.412083 528.507
## 119948 -37.36208 -8.412083 530.275
## 119949 -37.36180 -8.412083 532.109
## 119950 -37.36152 -8.412083 534.074
## 119951 -37.36125 -8.412083 536.026
## 119952 -37.36097 -8.412083 537.899
## 119953 -37.36069 -8.412083 539.551
## 119954 -37.36041 -8.412083 541.123
## 119955 -37.36013 -8.412083 542.651
## 119956 -37.35986 -8.412083 544.136
## 119957 -37.35958 -8.412083 545.630
## 119958 -37.35930 -8.412083 547.137
## 119959 -37.35902 -8.412083 548.815
## 119960 -37.35875 -8.412083 550.368
## 119961 -37.35847 -8.412083 551.574
## 119962 -37.35819 -8.412083 552.396
## 119963 -37.35791 -8.412083 552.952
## 119964 -37.35763 -8.412083 553.527
## 119965 -37.35736 -8.412083 554.391
## 119966 -37.35708 -8.412083 555.288
## 119967 -37.35680 -8.412083 556.081
## 119968 -37.35652 -8.412083 556.640
## 119969 -37.35625 -8.412083 556.954
## 119970 -37.35597 -8.412083 556.996
## 119971 -37.35569 -8.412083 556.725
## 119972 -37.35541 -8.412083 556.302
## 119973 -37.35513 -8.412083 555.861
## 119974 -37.35486 -8.412083 555.579
## 119975 -37.35458 -8.412083 555.337
## 119976 -37.35430 -8.412083 555.093
## 119977 -37.35402 -8.412083 554.762
## 119978 -37.35375 -8.412083 554.381
## 119979 -37.35347 -8.412083 553.918
## 119980 -37.35319 -8.412083 553.316
## 119981 -37.35291 -8.412083 552.670
## 119982 -37.35263 -8.412083 552.052
## 119983 -37.35236 -8.412083 551.557
## 119984 -37.35208 -8.412083 551.247
## 119985 -37.35180 -8.412083 551.198
## 119986 -37.35152 -8.412083 551.533
## 119987 -37.35125 -8.412083 552.149
## 119988 -37.35097 -8.412083 552.879
## 119989 -37.35069 -8.412083 553.860
## 119990 -37.35041 -8.412083 554.754
## 119991 -37.35013 -8.412083 555.526
## 119992 -37.34986 -8.412083 556.013
## 119993 -37.34958 -8.412083 556.413
## 119994 -37.34930 -8.412083 556.869
## 119995 -37.34902 -8.412083 557.573
## 119996 -37.34875 -8.412083 558.292
## 119997 -37.34847 -8.412083 558.873
## 119998 -37.34819 -8.412083 559.370
## 119999 -37.34791 -8.412083 559.742
## 120000 -37.34763 -8.412083 560.156
## 120001 -37.34736 -8.412083 560.751
## 120002 -37.34708 -8.412083 561.321
## 120003 -37.34680 -8.412083 561.708
## 120004 -37.34652 -8.412083 561.771
## 120005 -37.34625 -8.412083 561.684
## 120006 -37.34597 -8.412083 561.583
## 120007 -37.34569 -8.412083 561.445
## 120008 -37.34541 -8.412083 561.415
## 120009 -37.34513 -8.412083 561.464
## 120010 -37.34486 -8.412083 561.647
## 120011 -37.34458 -8.412083 561.952
## 120012 -37.34430 -8.412083 562.396
## 120013 -37.34402 -8.412083 562.958
## 120014 -37.34375 -8.412083 563.492
## 120015 -37.34347 -8.412083 563.854
## 120016 -37.34319 -8.412083 563.891
## 120017 -37.34291 -8.412083 563.658
## 120018 -37.34263 -8.412083 563.202
## 120019 -37.34236 -8.412083 562.560
## 120020 -37.34208 -8.412083 561.992
## 120021 -37.34180 -8.412083 561.744
## 120022 -37.34152 -8.412083 562.034
## 120023 -37.34125 -8.412083 562.488
## 120024 -37.34097 -8.412083 562.891
## 120025 -37.34069 -8.412083 562.773
## 120026 -37.34041 -8.412083 562.498
## 120027 -37.34013 -8.412083 562.184
## 120028 -37.33986 -8.412083 562.073
## 120029 -37.33958 -8.412083 561.902
## 120030 -37.33930 -8.412083 561.573
## 120031 -37.33902 -8.412083 560.865
## 120032 -37.33875 -8.412083 560.053
## 120033 -37.33847 -8.412083 559.363
## 120034 -37.33819 -8.412083 558.895
## 120035 -37.33791 -8.412083 558.690
## 120036 -37.33763 -8.412083 558.678
## 120037 -37.33736 -8.412083 558.853
## 120038 -37.33708 -8.412083 559.059
## 120039 -37.33680 -8.412083 559.160
## 120040 -37.33652 -8.412083 559.057
## 120041 -37.33625 -8.412083 559.021
## 120042 -37.33597 -8.412083 559.187
## 120043 -37.33569 -8.412083 559.906
## 120044 -37.33541 -8.412083 560.662
## 120045 -37.33513 -8.412083 561.169
## 120046 -37.33486 -8.412083 560.985
## 120047 -37.33458 -8.412083 560.699
## 120048 -37.33430 -8.412083 560.742
## 120049 -37.33402 -8.412083 561.522
## 120050 -37.33375 -8.412083 562.421
## 120051 -37.33347 -8.412083 563.117
## 120052 -37.33319 -8.412083 562.984
## 120053 -37.33291 -8.412083 562.460
## 120054 -37.33263 -8.412083 561.659
## 120055 -37.33236 -8.412083 560.730
## 120056 -37.33208 -8.412083 559.822
## 120057 -37.33180 -8.412083 559.086
## 120058 -37.33152 -8.412083 558.851
## 120059 -37.33125 -8.412083 558.766
## 120060 -37.33097 -8.412083 558.630
## 120061 -37.33069 -8.412083 558.050
## 120062 -37.33041 -8.412083 557.506
## 120063 -37.33013 -8.412083 557.270
## 120064 -37.32986 -8.412083 557.727
## 120065 -37.32958 -8.412083 558.435
## 120066 -37.32930 -8.412083 559.135
## 120067 -37.32902 -8.412083 559.535
## 120068 -37.32875 -8.412083 559.872
## 120069 -37.32847 -8.412083 560.230
## 120070 -37.32819 -8.412083 560.767
## 120071 -37.32791 -8.412083 561.315
## 120072 -37.32763 -8.412083 561.757
## 120073 -37.32736 -8.412083 561.939
## 120074 -37.32708 -8.412083 562.193
## 120075 -37.32680 -8.412083 562.786
## 120076 -37.32652 -8.412083 563.995
## 120077 -37.32625 -8.412083 565.163
## 120078 -37.32597 -8.412083 565.958
## 120079 -37.32569 -8.412083 565.546
## 120080 -37.32541 -8.412083 564.839
## 120081 -37.32513 -8.412083 564.232
## 120082 -37.32486 -8.412083 564.338
## 120083 -37.32458 -8.412083 564.782
## 120084 -37.32430 -8.412083 565.472
## 120085 -37.32402 -8.412083 566.186
## 120086 -37.32375 -8.412083 567.094
## 120087 -37.32347 -8.412083 568.254
## 120088 -37.32319 -8.412083 569.879
## 120089 -37.32291 -8.412083 571.479
## 120090 -37.32263 -8.412083 572.750
## 120091 -37.32236 -8.412083 573.301
## 120092 -37.32208 -8.412083 573.484
## 120093 -37.32180 -8.412083 573.527
## 120094 -37.32152 -8.412083 573.634
## 120095 -37.32125 -8.412083 573.729
## 120096 -37.32097 -8.412083 573.781
## 120097 -37.32069 -8.412083 573.736
## 120098 -37.32041 -8.412083 573.719
## 120099 -37.32013 -8.412083 573.812
## 120100 -37.31986 -8.412083 574.116
## 120101 -37.31958 -8.412083 574.501
## 120102 -37.31930 -8.412083 574.882
## 120103 -37.31902 -8.412083 575.163
## 120104 -37.31875 -8.412083 575.341
## 120105 -37.31847 -8.412083 575.396
## 120106 -37.31819 -8.412083 575.335
## 120107 -37.31791 -8.412083 575.151
## 120108 -37.31763 -8.412083 574.846
## 120109 -37.31736 -8.412083 574.345
## 120110 -37.31708 -8.412083 573.891
## 120111 -37.31680 -8.412083 573.574
## 120112 -37.31652 -8.412083 573.559
## 120113 -37.31625 -8.412083 573.654
## 120114 -37.31597 -8.412083 573.699
## 120115 -37.31569 -8.412083 573.676
## 120116 -37.31541 -8.412083 573.484
## 120117 -37.31513 -8.412083 573.117
## 120118 -37.31486 -8.412083 572.500
## 120119 -37.31458 -8.412083 571.952
## 120120 -37.31430 -8.412083 571.691
## 120121 -37.31402 -8.412083 571.899
## 120122 -37.31375 -8.412083 572.087
## 120123 -37.31347 -8.412083 571.967
## 120124 -37.31319 -8.412083 571.016
## 120125 -37.31291 -8.412083 569.629
## 120126 -37.31263 -8.412083 567.961
## 120127 -37.31236 -8.412083 566.265
## 120128 -37.31208 -8.412083 564.446
## 120129 -37.31180 -8.412083 562.519
## 120130 -37.31152 -8.412083 560.520
## 120131 -37.31125 -8.412083 558.845
## 120132 -37.31097 -8.412083 557.758
## 120133 -37.31069 -8.412083 557.509
## 120134 -37.31041 -8.412083 558.026
## 120135 -37.31013 -8.412083 559.270
## 120136 -37.30986 -8.412083 561.221
## 120137 -37.30958 -8.412083 563.382
## 120138 -37.30930 -8.412083 565.362
## 120139 -37.30902 -8.412083 566.828
## 120140 -37.30875 -8.412083 567.996
## 120141 -37.30847 -8.412083 568.942
## 120142 -37.30819 -8.412083 569.885
## 120143 -37.30791 -8.412083 570.721
## 120144 -37.30763 -8.412083 571.451
## 120145 -37.30736 -8.412083 571.997
## 120146 -37.30708 -8.412083 572.570
## 120147 -37.30680 -8.412083 573.312
## 120148 -37.30652 -8.412083 574.358
## 120149 -37.30625 -8.412083 575.498
## 120150 -37.30597 -8.412083 576.632
## 120151 -37.30569 -8.412083 577.690
## 120152 -37.30541 -8.412083 578.274
## 120153 -37.30513 -8.412083 578.036
## 120154 -37.30486 -8.412083 576.541
## 120155 -37.30458 -8.412083 574.540
## 120156 -37.30430 -8.412083 572.375
## 120157 -37.30402 -8.412083 571.040
## 120158 -37.30375 -8.412083 570.100
## 120159 -37.30347 -8.412083 569.646
## 120160 -37.30319 -8.412083 569.649
## 120161 -37.30291 -8.412083 569.867
## 120162 -37.30263 -8.412083 570.067
## 120163 -37.30236 -8.412083 569.982
## 120164 -37.30208 -8.412083 569.961
## 120165 -37.30180 -8.412083 570.284
## 120166 -37.30152 -8.412083 571.187
## 120167 -37.30125 -8.412083 572.236
## 120168 -37.30097 -8.412083 573.195
## 120169 -37.30069 -8.412083 573.840
## 120170 -37.30041 -8.412083 573.979
## 120171 -37.30013 -8.412083 573.434
## 120172 -37.29986 -8.412083 571.857
## 120173 -37.29958 -8.412083 570.245
## 120174 -37.29930 -8.412083 569.333
## 120175 -37.29902 -8.412083 569.797
## 120176 -37.29875 -8.412083 570.602
## 120177 -37.29847 -8.412083 571.237
## 120178 -37.29819 -8.412083 570.694
## 120179 -37.29791 -8.412083 569.777
## 120180 -37.29763 -8.412083 568.748
## 120181 -37.29736 -8.412083 568.030
## 120182 -37.29708 -8.412083 567.503
## 120183 -37.29680 -8.412083 567.288
## 120184 -37.29652 -8.412083 567.075
## 120185 -37.29625 -8.412083 567.218
## 120186 -37.29597 -8.412083 567.642
## 120187 -37.29569 -8.412083 568.603
## 120188 -37.29541 -8.412083 569.382
## 120189 -37.29513 -8.412083 569.543
## 120190 -37.29486 -8.412083 568.514
## 120191 -37.29458 -8.412083 567.071
## 120192 -37.29430 -8.412083 565.751
## 120193 -37.29402 -8.412083 565.075
## 120194 -37.29375 -8.412083 564.701
## 120195 -37.29347 -8.412083 564.516
## 120196 -37.29319 -8.412083 564.322
## 120197 -37.29291 -8.412083 564.230
## 120198 -37.29263 -8.412083 564.239
## 120199 -37.29236 -8.412083 564.271
## 120200 -37.29208 -8.412083 564.550
## 120201 -37.29180 -8.412083 565.227
## 120202 -37.29152 -8.412083 566.390
## 120203 -37.29125 -8.412083 567.427
## 120204 -37.29097 -8.412083 567.966
## 120205 -37.29069 -8.412083 567.290
## 120206 -37.29041 -8.412083 566.160
## 120207 -37.29013 -8.412083 564.984
## 120208 -37.28986 -8.412083 564.413
## 120209 -37.28958 -8.412083 563.991
## 120210 -37.28930 -8.412083 563.636
## 120211 -37.28902 -8.412083 563.043
## 120212 -37.28875 -8.412083 562.429
## 120213 -37.28847 -8.412083 561.847
## 120214 -37.28819 -8.412083 561.275
## 120215 -37.28791 -8.412083 560.797
## 120216 -37.28763 -8.412083 560.427
## 120217 -37.28736 -8.412083 560.244
## 120218 -37.28708 -8.412083 560.338
## 120219 -37.28680 -8.412083 560.850
## 120220 -37.28652 -8.412083 561.833
## 120221 -37.28625 -8.412083 563.135
## 120222 -37.28597 -8.412083 564.588
## 120223 -37.28569 -8.412083 566.121
## 120224 -37.28541 -8.412083 567.455
## 120225 -37.28513 -8.412083 568.392
## 120226 -37.28486 -8.412083 568.694
## 120227 -37.28458 -8.412083 568.919
## 120228 -37.28430 -8.412083 569.503
## 120229 -37.28402 -8.412083 570.747
## 120230 -37.28375 -8.412083 571.966
## 120231 -37.28347 -8.412083 572.748
## 120232 -37.28319 -8.412083 572.474
## 120233 -37.28291 -8.412083 571.621
## 120234 -37.28263 -8.412083 570.422
## 120235 -37.28236 -8.412083 569.224
## 120236 -37.28208 -8.412083 567.816
## 120237 -37.28180 -8.412083 566.106
## 120238 -37.28152 -8.412083 564.000
## 120239 -37.28125 -8.412083 562.218
## 120240 -37.28097 -8.412083 561.173
## 120241 -37.28069 -8.412083 561.566
## 120242 -37.28041 -8.412083 562.695
## 120243 -37.28013 -8.412083 564.227
## 120244 -37.27986 -8.412083 565.766
## 120245 -37.27958 -8.412083 567.374
## 120246 -37.27930 -8.412083 568.983
## 120247 -37.27902 -8.412083 570.562
## 120248 -37.27875 -8.412083 572.018
## 120249 -37.27847 -8.412083 573.276
## 120250 -37.27819 -8.412083 574.255
## 120251 -37.27791 -8.412083 574.849
## 120252 -37.27763 -8.412083 574.965
## 120253 -37.27736 -8.412083 574.446
## 120254 -37.27708 -8.412083 573.798
## 120255 -37.27680 -8.412083 573.418
## 120256 -37.27652 -8.412083 573.690
## 120257 -37.27625 -8.412083 574.225
## 120258 -37.27597 -8.412083 574.840
## 120259 -37.27569 -8.412083 575.232
## 120260 -37.27541 -8.412083 575.567
## 120261 -37.27513 -8.412083 575.867
## 120262 -37.27486 -8.412083 576.186
## 120263 -37.27458 -8.412083 576.466
## 120264 -37.27430 -8.412083 576.687
## 120265 -37.27402 -8.412083 576.843
## 120266 -37.27375 -8.412083 576.868
## 120267 -37.27347 -8.412083 576.706
## 120268 -37.27319 -8.412083 576.234
## 120269 -37.27291 -8.412083 575.683
## 120270 -37.27263 -8.412083 575.165
## 120271 -37.27236 -8.412083 574.842
## 120272 -37.27208 -8.412083 574.507
## 120273 -37.27180 -8.412083 574.035
## 120274 -37.27152 -8.412083 573.306
## 120275 -37.27125 -8.412083 572.460
## 120276 -37.27097 -8.412083 571.573
## 120277 -37.27069 -8.412083 570.787
## 120278 -37.27041 -8.412083 570.032
## 120279 -37.27013 -8.412083 569.292
## 120280 -37.26986 -8.412083 568.545
## 120281 -37.26958 -8.412083 568.062
## 120282 -37.26930 -8.412083 567.977
## 120283 -37.26902 -8.412083 568.728
## 120284 -37.26875 -8.412083 569.741
## 120285 -37.26847 -8.412083 570.742
## 120286 -37.26819 -8.412083 571.138
## 120287 -37.26791 -8.412083 571.456
## 120288 -37.26763 -8.412083 571.947
## 120289 -37.26736 -8.412083 572.961
## 120290 -37.26708 -8.412083 573.977
## 120291 -37.26680 -8.412083 574.683
## 120292 -37.26652 -8.412083 574.799
## 120293 -37.26625 -8.412083 574.524
## 120294 -37.26597 -8.412083 573.917
## 120295 -37.26569 -8.412083 573.119
## 120296 -37.26541 -8.412083 572.176
## 120297 -37.26513 -8.412083 571.188
## 120298 -37.26486 -8.412083 570.349
## 120299 -37.26458 -8.412083 569.451
## 120300 -37.26430 -8.412083 568.364
## 120301 -37.26402 -8.412083 566.930
## 120302 -37.26375 -8.412083 565.550
## 120303 -37.26347 -8.412083 564.386
## 120304 -37.26319 -8.412083 563.731
## 120305 -37.26291 -8.412083 563.700
## 120306 -37.26263 -8.412083 564.457
## 120307 -37.26236 -8.412083 566.175
## 120308 -37.26208 -8.412083 568.246
## 120309 -37.26180 -8.412083 570.381
## 120310 -37.26152 -8.412083 571.526
## 120311 -37.26125 -8.412083 572.206
## 120312 -37.26097 -8.412083 572.293
## 120313 -37.26069 -8.412083 571.775
## 120314 -37.26041 -8.412083 571.012
## 120315 -37.26013 -8.412083 570.321
## 120316 -37.25986 -8.412083 569.997
## 120317 -37.25958 -8.412083 569.811
## 120318 -37.25930 -8.412083 569.652
## 120319 -37.25902 -8.412083 569.420
## 120320 -37.25875 -8.412083 569.055
## 120321 -37.25847 -8.412083 568.551
## 120322 -37.25819 -8.412083 567.845
## 120323 -37.25791 -8.412083 566.951
## 120324 -37.25763 -8.412083 565.848
## 120325 -37.25736 -8.412083 564.517
## 120326 -37.25708 -8.412083 563.209
## 120327 -37.25680 -8.412083 562.109
## 120328 -37.25652 -8.412083 561.384
## 120329 -37.25625 -8.412083 561.100
## 120330 -37.25597 -8.412083 561.299
## 120331 -37.25569 -8.412083 562.243
## 120332 -37.25541 -8.412083 563.145
## 120333 -37.25513 -8.412083 563.501
## 120334 -37.25486 -8.412083 562.634
## 120335 -37.25458 -8.412083 561.571
## 120336 -37.25430 -8.412083 560.912
## 120337 -37.25402 -8.412083 561.388
## 120338 -37.25375 -8.412083 562.435
## 120339 -37.25347 -8.412083 563.551
## 120340 -37.25319 -8.412083 564.119
## 120341 -37.25291 -8.412083 564.551
## 120342 -37.25263 -8.412083 564.998
## 120343 -37.25236 -8.412083 565.637
## 120344 -37.25208 -8.412083 566.234
## 120345 -37.25180 -8.412083 566.646
## 120346 -37.25152 -8.412083 566.828
## 120347 -37.25125 -8.412083 566.945
## 120348 -37.25097 -8.412083 567.151
## 120349 -37.25069 -8.412083 567.678
## 120350 -37.25041 -8.412083 568.343
## 120351 -37.25013 -8.412083 569.039
## 120352 -37.24986 -8.412083 569.605
## 120353 -37.24958 -8.412083 570.192
## 120354 -37.24930 -8.412083 570.844
## 120355 -37.24902 -8.412083 571.584
## 120356 -37.24875 -8.412083 572.422
## 120357 -37.24847 -8.412083 573.332
## 120358 -37.24819 -8.412083 574.356
## 120359 -37.24791 -8.412083 575.271
## 120360 -37.24763 -8.412083 575.972
## 120361 -37.24736 -8.412083 576.346
## 120362 -37.24708 -8.412083 576.631
## 120363 -37.24680 -8.412083 576.985
## 120364 -37.24652 -8.412083 577.546
## 120365 -37.24625 -8.412083 578.215
## 120366 -37.24597 -8.412083 578.928
## 120367 -37.24569 -8.412083 579.653
## 120368 -37.24541 -8.412083 580.417
## 120369 -37.24513 -8.412083 581.275
## 120370 -37.24486 -8.412083 582.233
## 120371 -37.24458 -8.412083 583.263
## 120372 -37.24430 -8.412083 584.309
## 120373 -37.24402 -8.412083 585.303
## 120374 -37.24375 -8.412083 586.331
## 120375 -37.24347 -8.412083 587.442
## 120376 -37.24319 -8.412083 588.800
## 120377 -37.24291 -8.412083 590.327
## 120378 -37.24263 -8.412083 591.998
## 120379 -37.24236 -8.412083 593.717
## 120380 -37.24208 -8.412083 595.423
## 120381 -37.24180 -8.412083 597.000
## 120382 -37.24152 -8.412083 598.356
## 120383 -37.24125 -8.412083 599.426
## 120384 -37.24097 -8.412083 600.216
## 120385 -37.24069 -8.412083 600.657
## 120386 -37.24041 -8.412083 601.044
## 120387 -37.24013 -8.412083 601.566
## 120388 -37.23986 -8.412083 602.478
## 120389 -37.23958 -8.412083 603.225
## 120390 -37.23930 -8.412083 603.422
## 120391 -37.23902 -8.412083 602.756
## 120392 -37.23875 -8.412083 601.628
## 120393 -37.23847 -8.412083 600.231
## 120394 -37.23819 -8.412083 598.847
## 120395 -37.23791 -8.412083 597.525
## 120396 -37.23763 -8.412083 596.410
## 120397 -37.23736 -8.412083 595.617
## 120398 -37.23708 -8.412083 594.891
## 120399 -37.23680 -8.412083 594.000
## 120400 -37.23652 -8.412083 592.772
## 120401 -37.23625 -8.412083 591.315
## 120402 -37.23597 -8.412083 589.678
## 120403 -37.23569 -8.412083 587.843
## 120404 -37.23541 -8.412083 586.052
## 120405 -37.23513 -8.412083 584.445
## 120406 -37.23486 -8.412083 583.329
## 120407 -37.23458 -8.412083 582.278
## 120408 -37.23430 -8.412083 580.963
## 120409 -37.23402 -8.412083 579.471
## 120410 -37.23375 -8.412083 577.821
## 120411 -37.23347 -8.412083 576.425
## 120412 -37.23319 -8.412083 575.439
## 120413 -37.23291 -8.412083 574.942
## 120414 -37.23263 -8.412083 574.997
## 120415 -37.23236 -8.412083 575.717
## 120416 -37.23208 -8.412083 576.669
## 120417 -37.23180 -8.412083 577.502
## 120418 -37.23152 -8.412083 577.971
## 120419 -37.23125 -8.412083 578.530
## 120420 -37.23097 -8.412083 579.369
## 120421 -37.23069 -8.412083 580.910
## 120422 -37.23041 -8.412083 582.578
## 120423 -37.23013 -8.412083 584.110
## 120424 -37.22986 -8.412083 585.202
## 120425 -37.22958 -8.412083 586.043
## 120426 -37.22930 -8.412083 586.734
## 120427 -37.22902 -8.412083 587.348
## 120428 -37.22875 -8.412083 587.819
## 120429 -37.22847 -8.412083 588.120
## 120430 -37.22819 -8.412083 588.210
## 120431 -37.22791 -8.412083 588.260
## 120432 -37.22763 -8.412083 588.401
## 120433 -37.22736 -8.412083 588.770
## 120434 -37.22708 -8.412083 588.955
## 120435 -37.22680 -8.412083 588.778
## 120436 -37.22652 -8.412083 587.397
## 120437 -37.22625 -8.412083 585.834
## 120438 -37.22597 -8.412083 584.475
## 120439 -37.22569 -8.412083 584.083
## 120440 -37.22541 -8.412083 583.815
## 120441 -37.22513 -8.412083 583.257
## 120442 -37.22486 -8.412083 581.959
## 120443 -37.22458 -8.412083 580.309
## 120444 -37.22430 -8.412083 578.496
## 120445 -37.22402 -8.412083 576.746
## 121289 -37.36597 -8.412361 522.390
## 121290 -37.36569 -8.412361 520.530
## 121291 -37.36541 -8.412361 519.579
## 121292 -37.36513 -8.412361 518.777
## 121293 -37.36486 -8.412361 519.043
## 121294 -37.36458 -8.412361 519.720
## 121295 -37.36430 -8.412361 520.749
## 121296 -37.36402 -8.412361 521.171
## 121297 -37.36375 -8.412361 521.760
## 121298 -37.36347 -8.412361 522.382
## 121299 -37.36319 -8.412361 523.530
## 121300 -37.36291 -8.412361 525.198
## 121301 -37.36263 -8.412361 526.939
## 121302 -37.36236 -8.412361 528.854
## 121303 -37.36208 -8.412361 530.678
## 121304 -37.36180 -8.412361 532.585
## 121305 -37.36152 -8.412361 534.931
## 121306 -37.36125 -8.412361 536.700
## 121307 -37.36097 -8.412361 538.859
## 121308 -37.36069 -8.412361 540.733
## 121309 -37.36041 -8.412361 542.386
## 121310 -37.36013 -8.412361 543.982
## 121311 -37.35986 -8.412361 545.246
## 121312 -37.35958 -8.412361 546.557
## 121313 -37.35930 -8.412361 547.690
## 121314 -37.35902 -8.412361 548.934
## 121315 -37.35875 -8.412361 550.379
## 121316 -37.35847 -8.412361 551.694
## 121317 -37.35819 -8.412361 552.804
## 121318 -37.35791 -8.412361 553.714
## 121319 -37.35763 -8.412361 554.142
## 121320 -37.35736 -8.412361 555.116
## 121321 -37.35708 -8.412361 556.041
## 121322 -37.35680 -8.412361 556.869
## 121323 -37.35652 -8.412361 557.505
## 121324 -37.35625 -8.412361 557.835
## 121325 -37.35597 -8.412361 558.101
## 121326 -37.35569 -8.412361 558.002
## 121327 -37.35541 -8.412361 557.673
## 121328 -37.35513 -8.412361 557.101
## 121329 -37.35486 -8.412361 556.750
## 121330 -37.35458 -8.412361 556.466
## 121331 -37.35430 -8.412361 556.213
## 121332 -37.35402 -8.412361 555.941
## 121333 -37.35375 -8.412361 555.514
## 121334 -37.35347 -8.412361 555.220
## 121335 -37.35319 -8.412361 554.710
## 121336 -37.35291 -8.412361 554.185
## 121337 -37.35263 -8.412361 553.607
## 121338 -37.35236 -8.412361 553.234
## 121339 -37.35208 -8.412361 553.031
## 121340 -37.35180 -8.412361 552.901
## 121341 -37.35152 -8.412361 553.065
## 121342 -37.35125 -8.412361 553.492
## 121343 -37.35097 -8.412361 554.065
## 121344 -37.35069 -8.412361 554.915
## 121345 -37.35041 -8.412361 555.731
## 121346 -37.35013 -8.412361 556.468
## 121347 -37.34986 -8.412361 557.052
## 121348 -37.34958 -8.412361 557.548
## 121349 -37.34930 -8.412361 558.216
## 121350 -37.34902 -8.412361 558.954
## 121351 -37.34875 -8.412361 559.619
## 121352 -37.34847 -8.412361 560.082
## 121353 -37.34819 -8.412361 560.275
## 121354 -37.34791 -8.412361 560.523
## 121355 -37.34763 -8.412361 560.843
## 121356 -37.34736 -8.412361 561.402
## 121357 -37.34708 -8.412361 561.935
## 121358 -37.34680 -8.412361 562.425
## 121359 -37.34652 -8.412361 562.679
## 121360 -37.34625 -8.412361 562.643
## 121361 -37.34597 -8.412361 562.579
## 121362 -37.34569 -8.412361 562.364
## 121363 -37.34541 -8.412361 562.285
## 121364 -37.34513 -8.412361 562.391
## 121365 -37.34486 -8.412361 562.681
## 121366 -37.34458 -8.412361 563.118
## 121367 -37.34430 -8.412361 563.527
## 121368 -37.34402 -8.412361 563.922
## 121369 -37.34375 -8.412361 564.382
## 121370 -37.34347 -8.412361 564.708
## 121371 -37.34319 -8.412361 564.651
## 121372 -37.34291 -8.412361 564.651
## 121373 -37.34263 -8.412361 564.287
## 121374 -37.34236 -8.412361 563.586
## 121375 -37.34208 -8.412361 562.820
## 121376 -37.34180 -8.412361 562.594
## 121377 -37.34152 -8.412361 562.781
## 121378 -37.34125 -8.412361 563.250
## 121379 -37.34097 -8.412361 563.563
## 121380 -37.34069 -8.412361 563.427
## 121381 -37.34041 -8.412361 563.105
## 121382 -37.34013 -8.412361 562.810
## 121383 -37.33986 -8.412361 562.743
## 121384 -37.33958 -8.412361 562.584
## 121385 -37.33930 -8.412361 562.357
## 121386 -37.33902 -8.412361 561.831
## 121387 -37.33875 -8.412361 561.092
## 121388 -37.33847 -8.412361 560.331
## 121389 -37.33819 -8.412361 559.713
## 121390 -37.33791 -8.412361 559.422
## 121391 -37.33763 -8.412361 559.328
## 121392 -37.33736 -8.412361 559.593
## 121393 -37.33708 -8.412361 559.900
## 121394 -37.33680 -8.412361 560.259
## 121395 -37.33652 -8.412361 560.382
## 121396 -37.33625 -8.412361 560.456
## 121397 -37.33597 -8.412361 560.990
## 121398 -37.33569 -8.412361 561.743
## 121399 -37.33541 -8.412361 562.446
## 121400 -37.33513 -8.412361 562.600
## 121401 -37.33486 -8.412361 562.149
## 121402 -37.33458 -8.412361 561.658
## 121403 -37.33430 -8.412361 561.536
## 121404 -37.33402 -8.412361 562.187
## 121405 -37.33375 -8.412361 563.249
## 121406 -37.33347 -8.412361 564.398
## 121407 -37.33319 -8.412361 564.376
## 121408 -37.33291 -8.412361 563.804
## 121409 -37.33263 -8.412361 562.798
## 121410 -37.33236 -8.412361 561.649
## 121411 -37.33208 -8.412361 560.510
## 121412 -37.33180 -8.412361 559.688
## 121413 -37.33152 -8.412361 559.404
## 121414 -37.33125 -8.412361 559.303
## 121415 -37.33097 -8.412361 559.068
## 121416 -37.33069 -8.412361 558.601
## 121417 -37.33041 -8.412361 557.814
## 121418 -37.33013 -8.412361 557.823
## 121419 -37.32986 -8.412361 558.516
## 121420 -37.32958 -8.412361 559.292
## 121421 -37.32930 -8.412361 560.354
## 121422 -37.32902 -8.412361 560.711
## 121423 -37.32875 -8.412361 560.859
## 121424 -37.32847 -8.412361 560.672
## 121425 -37.32819 -8.412361 560.904
## 121426 -37.32791 -8.412361 561.169
## 121427 -37.32763 -8.412361 561.555
## 121428 -37.32736 -8.412361 561.777
## 121429 -37.32708 -8.412361 562.278
## 121430 -37.32680 -8.412361 563.013
## 121431 -37.32652 -8.412361 564.393
## 121432 -37.32625 -8.412361 565.446
## 121433 -37.32597 -8.412361 566.016
## 121434 -37.32569 -8.412361 565.636
## 121435 -37.32541 -8.412361 565.072
## 121436 -37.32513 -8.412361 564.638
## 121437 -37.32486 -8.412361 565.123
## 121438 -37.32458 -8.412361 565.778
## 121439 -37.32430 -8.412361 566.760
## 121440 -37.32402 -8.412361 567.744
## 121441 -37.32375 -8.412361 568.775
## 121442 -37.32347 -8.412361 570.113
## 121443 -37.32319 -8.412361 571.615
## 121444 -37.32291 -8.412361 573.127
## 121445 -37.32263 -8.412361 574.089
## 121446 -37.32236 -8.412361 574.233
## 121447 -37.32208 -8.412361 574.255
## 121448 -37.32180 -8.412361 573.975
## 121449 -37.32152 -8.412361 574.062
## 121450 -37.32125 -8.412361 574.204
## 121451 -37.32097 -8.412361 574.466
## 121452 -37.32069 -8.412361 574.649
## 121453 -37.32041 -8.412361 574.495
## 121454 -37.32013 -8.412361 574.598
## 121455 -37.31986 -8.412361 574.923
## 121456 -37.31958 -8.412361 575.392
## 121457 -37.31930 -8.412361 575.669
## 121458 -37.31902 -8.412361 575.875
## 121459 -37.31875 -8.412361 575.860
## 121460 -37.31847 -8.412361 575.990
## 121461 -37.31819 -8.412361 575.893
## 121462 -37.31791 -8.412361 575.778
## 121463 -37.31763 -8.412361 575.395
## 121464 -37.31736 -8.412361 574.869
## 121465 -37.31708 -8.412361 574.328
## 121466 -37.31680 -8.412361 573.915
## 121467 -37.31652 -8.412361 573.724
## 121468 -37.31625 -8.412361 573.645
## 121469 -37.31597 -8.412361 573.680
## 121470 -37.31569 -8.412361 573.736
## 121471 -37.31541 -8.412361 573.353
## 121472 -37.31513 -8.412361 573.081
## 121473 -37.31486 -8.412361 572.536
## 121474 -37.31458 -8.412361 572.102
## 121475 -37.31430 -8.412361 571.928
## 121476 -37.31402 -8.412361 572.168
## 121477 -37.31375 -8.412361 572.299
## 121478 -37.31347 -8.412361 572.167
## 121479 -37.31319 -8.412361 571.116
## 121480 -37.31291 -8.412361 569.628
## 121481 -37.31263 -8.412361 567.906
## 121482 -37.31236 -8.412361 566.117
## 121483 -37.31208 -8.412361 564.343
## 121484 -37.31180 -8.412361 562.661
## 121485 -37.31152 -8.412361 560.791
## 121486 -37.31125 -8.412361 559.295
## 121487 -37.31097 -8.412361 558.222
## 121488 -37.31069 -8.412361 558.057
## 121489 -37.31041 -8.412361 558.578
## 121490 -37.31013 -8.412361 559.561
## 121491 -37.30986 -8.412361 561.580
## 121492 -37.30958 -8.412361 563.725
## 121493 -37.30930 -8.412361 566.012
## 121494 -37.30902 -8.412361 567.687
## 121495 -37.30875 -8.412361 568.934
## 121496 -37.30847 -8.412361 570.188
## 121497 -37.30819 -8.412361 571.330
## 121498 -37.30791 -8.412361 572.311
## 121499 -37.30763 -8.412361 572.990
## 121500 -37.30736 -8.412361 573.338
## 121501 -37.30708 -8.412361 573.702
## 121502 -37.30680 -8.412361 574.389
## 121503 -37.30652 -8.412361 575.322
## 121504 -37.30625 -8.412361 576.808
## 121505 -37.30597 -8.412361 578.004
## 121506 -37.30569 -8.412361 578.982
## 121507 -37.30541 -8.412361 579.526
## 121508 -37.30513 -8.412361 579.429
## 121509 -37.30486 -8.412361 578.131
## 121510 -37.30458 -8.412361 576.503
## 121511 -37.30430 -8.412361 574.554
## 121512 -37.30402 -8.412361 573.272
## 121513 -37.30375 -8.412361 572.375
## 121514 -37.30347 -8.412361 571.630
## 121515 -37.30319 -8.412361 571.266
## 121516 -37.30291 -8.412361 571.099
## 121517 -37.30263 -8.412361 571.147
## 121518 -37.30236 -8.412361 570.766
## 121519 -37.30208 -8.412361 570.461
## 121520 -37.30180 -8.412361 570.402
## 121521 -37.30152 -8.412361 571.230
## 121522 -37.30125 -8.412361 572.263
## 121523 -37.30097 -8.412361 573.264
## 121524 -37.30069 -8.412361 573.929
## 121525 -37.30041 -8.412361 574.035
## 121526 -37.30013 -8.412361 573.709
## 121527 -37.29986 -8.412361 572.476
## 121528 -37.29958 -8.412361 571.211
## 121529 -37.29930 -8.412361 570.397
## 121530 -37.29902 -8.412361 571.000
## 121531 -37.29875 -8.412361 571.735
## 121532 -37.29847 -8.412361 572.314
## 121533 -37.29819 -8.412361 571.571
## 121534 -37.29791 -8.412361 570.644
## 121535 -37.29763 -8.412361 569.508
## 121536 -37.29736 -8.412361 568.802
## 121537 -37.29708 -8.412361 568.385
## 121538 -37.29680 -8.412361 567.981
## 121539 -37.29652 -8.412361 567.921
## 121540 -37.29625 -8.412361 568.079
## 121541 -37.29597 -8.412361 568.640
## 121542 -37.29569 -8.412361 569.494
## 121543 -37.29541 -8.412361 570.221
## 121544 -37.29513 -8.412361 570.022
## 121545 -37.29486 -8.412361 568.760
## 121546 -37.29458 -8.412361 567.392
## 121547 -37.29430 -8.412361 566.131
## 121548 -37.29402 -8.412361 565.762
## 121549 -37.29375 -8.412361 565.511
## 121550 -37.29347 -8.412361 565.603
## 121551 -37.29319 -8.412361 565.716
## 121552 -37.29291 -8.412361 565.289
## 121553 -37.29263 -8.412361 565.185
## 121554 -37.29236 -8.412361 565.167
## 121555 -37.29208 -8.412361 565.639
## 121556 -37.29180 -8.412361 566.050
## 121557 -37.29152 -8.412361 567.339
## 121558 -37.29125 -8.412361 567.932
## 121559 -37.29097 -8.412361 568.164
## 121560 -37.29069 -8.412361 567.615
## 121561 -37.29041 -8.412361 566.659
## 121562 -37.29013 -8.412361 565.981
## 121563 -37.28986 -8.412361 565.576
## 121564 -37.28958 -8.412361 565.034
## 121565 -37.28930 -8.412361 564.515
## 121566 -37.28902 -8.412361 563.665
## 121567 -37.28875 -8.412361 562.831
## 121568 -37.28847 -8.412361 561.947
## 121569 -37.28819 -8.412361 561.253
## 121570 -37.28791 -8.412361 561.048
## 121571 -37.28763 -8.412361 560.757
## 121572 -37.28736 -8.412361 560.577
## 121573 -37.28708 -8.412361 560.567
## 121574 -37.28680 -8.412361 560.778
## 121575 -37.28652 -8.412361 562.000
## 121576 -37.28625 -8.412361 563.425
## 121577 -37.28597 -8.412361 565.231
## 121578 -37.28569 -8.412361 566.880
## 121579 -37.28541 -8.412361 568.218
## 121580 -37.28513 -8.412361 569.312
## 121581 -37.28486 -8.412361 569.634
## 121582 -37.28458 -8.412361 569.889
## 121583 -37.28430 -8.412361 570.014
## 121584 -37.28402 -8.412361 571.276
## 121585 -37.28375 -8.412361 572.590
## 121586 -37.28347 -8.412361 573.906
## 121587 -37.28319 -8.412361 573.802
## 121588 -37.28291 -8.412361 572.956
## 121589 -37.28263 -8.412361 571.928
## 121590 -37.28236 -8.412361 570.555
## 121591 -37.28208 -8.412361 569.128
## 121592 -37.28180 -8.412361 567.058
## 121593 -37.28152 -8.412361 564.608
## 121594 -37.28125 -8.412361 562.715
## 121595 -37.28097 -8.412361 561.445
## 121596 -37.28069 -8.412361 561.661
## 121597 -37.28041 -8.412361 562.780
## 121598 -37.28013 -8.412361 564.071
## 121599 -37.27986 -8.412361 565.357
## 121600 -37.27958 -8.412361 566.487
## 121601 -37.27930 -8.412361 568.379
## 121602 -37.27902 -8.412361 569.892
## 121603 -37.27875 -8.412361 571.296
## 121604 -37.27847 -8.412361 572.578
## 121605 -37.27819 -8.412361 573.482
## 121606 -37.27791 -8.412361 574.031
## 121607 -37.27763 -8.412361 573.744
## 121608 -37.27736 -8.412361 573.215
## 121609 -37.27708 -8.412361 572.577
## 121610 -37.27680 -8.412361 572.600
## 121611 -37.27652 -8.412361 573.223
## 121612 -37.27625 -8.412361 573.887
## 121613 -37.27597 -8.412361 574.830
## 121614 -37.27569 -8.412361 575.411
## 121615 -37.27541 -8.412361 575.798
## 121616 -37.27513 -8.412361 575.879
## 121617 -37.27486 -8.412361 575.992
## 121618 -37.27458 -8.412361 576.078
## 121619 -37.27430 -8.412361 576.514
## 121620 -37.27402 -8.412361 576.726
## 121621 -37.27375 -8.412361 576.833
## 121622 -37.27347 -8.412361 576.761
## 121623 -37.27319 -8.412361 576.376
## 121624 -37.27291 -8.412361 575.776
## 121625 -37.27263 -8.412361 575.123
## 121626 -37.27236 -8.412361 574.745
## 121627 -37.27208 -8.412361 574.337
## 121628 -37.27180 -8.412361 573.776
## 121629 -37.27152 -8.412361 573.124
## 121630 -37.27125 -8.412361 572.149
## 121631 -37.27097 -8.412361 571.278
## 121632 -37.27069 -8.412361 570.655
## 121633 -37.27041 -8.412361 570.073
## 121634 -37.27013 -8.412361 569.677
## 121635 -37.26986 -8.412361 569.094
## 121636 -37.26958 -8.412361 568.679
## 121637 -37.26930 -8.412361 568.608
## 121638 -37.26902 -8.412361 569.252
## 121639 -37.26875 -8.412361 570.148
## 121640 -37.26847 -8.412361 570.922
## 121641 -37.26819 -8.412361 571.090
## 121642 -37.26791 -8.412361 571.519
## 121643 -37.26763 -8.412361 571.918
## 121644 -37.26736 -8.412361 573.100
## 121645 -37.26708 -8.412361 574.084
## 121646 -37.26680 -8.412361 574.642
## 121647 -37.26652 -8.412361 574.755
## 121648 -37.26625 -8.412361 574.526
## 121649 -37.26597 -8.412361 574.179
## 121650 -37.26569 -8.412361 573.663
## 121651 -37.26541 -8.412361 573.196
## 121652 -37.26513 -8.412361 572.857
## 121653 -37.26486 -8.412361 571.944
## 121654 -37.26458 -8.412361 570.837
## 121655 -37.26430 -8.412361 568.987
## 121656 -37.26402 -8.412361 567.021
## 121657 -37.26375 -8.412361 565.561
## 121658 -37.26347 -8.412361 564.448
## 121659 -37.26319 -8.412361 563.826
## 121660 -37.26291 -8.412361 563.762
## 121661 -37.26263 -8.412361 564.885
## 121662 -37.26236 -8.412361 566.519
## 121663 -37.26208 -8.412361 568.488
## 121664 -37.26180 -8.412361 570.300
## 121665 -37.26152 -8.412361 571.231
## 121666 -37.26125 -8.412361 571.986
## 121667 -37.26097 -8.412361 572.334
## 121668 -37.26069 -8.412361 571.962
## 121669 -37.26041 -8.412361 571.106
## 121670 -37.26013 -8.412361 570.354
## 121671 -37.25986 -8.412361 570.188
## 121672 -37.25958 -8.412361 570.092
## 121673 -37.25930 -8.412361 569.946
## 121674 -37.25902 -8.412361 569.585
## 121675 -37.25875 -8.412361 569.190
## 121676 -37.25847 -8.412361 568.633
## 121677 -37.25819 -8.412361 568.014
## 121678 -37.25791 -8.412361 567.126
## 121679 -37.25763 -8.412361 566.023
## 121680 -37.25736 -8.412361 564.635
## 121681 -37.25708 -8.412361 563.325
## 121682 -37.25680 -8.412361 562.315
## 121683 -37.25652 -8.412361 561.894
## 121684 -37.25625 -8.412361 561.989
## 121685 -37.25597 -8.412361 562.620
## 121686 -37.25569 -8.412361 563.610
## 121687 -37.25541 -8.412361 564.527
## 121688 -37.25513 -8.412361 565.004
## 121689 -37.25486 -8.412361 564.022
## 121690 -37.25458 -8.412361 562.942
## 121691 -37.25430 -8.412361 561.598
## 121692 -37.25402 -8.412361 561.435
## 121693 -37.25375 -8.412361 561.975
## 121694 -37.25347 -8.412361 562.733
## 121695 -37.25319 -8.412361 562.942
## 121696 -37.25291 -8.412361 563.285
## 121697 -37.25263 -8.412361 563.477
## 121698 -37.25236 -8.412361 564.320
## 121699 -37.25208 -8.412361 565.126
## 121700 -37.25180 -8.412361 565.739
## 121701 -37.25152 -8.412361 566.296
## 121702 -37.25125 -8.412361 566.532
## 121703 -37.25097 -8.412361 567.153
## 121704 -37.25069 -8.412361 567.852
## 121705 -37.25041 -8.412361 568.224
## 121706 -37.25013 -8.412361 568.621
## 121707 -37.24986 -8.412361 568.953
## 121708 -37.24958 -8.412361 569.545
## 121709 -37.24930 -8.412361 570.297
## 121710 -37.24902 -8.412361 570.937
## 121711 -37.24875 -8.412361 571.683
## 121712 -37.24847 -8.412361 572.346
## 121713 -37.24819 -8.412361 573.241
## 121714 -37.24791 -8.412361 574.015
## 121715 -37.24763 -8.412361 574.434
## 121716 -37.24736 -8.412361 574.569
## 121717 -37.24708 -8.412361 574.678
## 121718 -37.24680 -8.412361 575.328
## 121719 -37.24652 -8.412361 576.086
## 121720 -37.24625 -8.412361 576.889
## 121721 -37.24597 -8.412361 577.805
## 121722 -37.24569 -8.412361 578.487
## 121723 -37.24541 -8.412361 579.244
## 121724 -37.24513 -8.412361 579.993
## 121725 -37.24486 -8.412361 580.625
## 121726 -37.24458 -8.412361 581.467
## 121727 -37.24430 -8.412361 582.162
## 121728 -37.24402 -8.412361 583.346
## 121729 -37.24375 -8.412361 584.571
## 121730 -37.24347 -8.412361 586.020
## 121731 -37.24319 -8.412361 587.617
## 121732 -37.24291 -8.412361 589.040
## 121733 -37.24263 -8.412361 590.910
## 121734 -37.24236 -8.412361 592.712
## 121735 -37.24208 -8.412361 594.543
## 121736 -37.24180 -8.412361 595.743
## 121737 -37.24152 -8.412361 597.327
## 121738 -37.24125 -8.412361 598.531
## 121739 -37.24097 -8.412361 599.566
## 121740 -37.24069 -8.412361 600.182
## 121741 -37.24041 -8.412361 600.505
## 121742 -37.24013 -8.412361 601.152
## 121743 -37.23986 -8.412361 602.234
## 121744 -37.23958 -8.412361 603.130
## 121745 -37.23930 -8.412361 603.384
## 121746 -37.23902 -8.412361 602.583
## 121747 -37.23875 -8.412361 601.480
## 121748 -37.23847 -8.412361 600.006
## 121749 -37.23819 -8.412361 598.615
## 121750 -37.23791 -8.412361 597.272
## 121751 -37.23763 -8.412361 596.146
## 121752 -37.23736 -8.412361 595.340
## 121753 -37.23708 -8.412361 594.704
## 121754 -37.23680 -8.412361 594.223
## 121755 -37.23652 -8.412361 592.928
## 121756 -37.23625 -8.412361 591.497
## 121757 -37.23597 -8.412361 589.310
## 121758 -37.23569 -8.412361 587.373
## 121759 -37.23541 -8.412361 585.503
## 121760 -37.23513 -8.412361 583.745
## 121761 -37.23486 -8.412361 582.779
## 121762 -37.23458 -8.412361 581.817
## 121763 -37.23430 -8.412361 580.866
## 121764 -37.23402 -8.412361 579.586
## 121765 -37.23375 -8.412361 577.942
## 121766 -37.23347 -8.412361 576.113
## 121767 -37.23319 -8.412361 574.931
## 121768 -37.23291 -8.412361 575.139
## 121769 -37.23263 -8.412361 575.048
## 121770 -37.23236 -8.412361 575.673
## 121771 -37.23208 -8.412361 576.439
## 121772 -37.23180 -8.412361 577.338
## 121773 -37.23152 -8.412361 578.003
## 121774 -37.23125 -8.412361 578.752
## 121775 -37.23097 -8.412361 580.011
## 121776 -37.23069 -8.412361 581.614
## 121777 -37.23041 -8.412361 583.210
## 121778 -37.23013 -8.412361 584.361
## 121779 -37.22986 -8.412361 585.361
## 121780 -37.22958 -8.412361 586.087
## 121781 -37.22930 -8.412361 586.510
## 121782 -37.22902 -8.412361 586.867
## 121783 -37.22875 -8.412361 587.447
## 121784 -37.22847 -8.412361 587.921
## 121785 -37.22819 -8.412361 588.113
## 121786 -37.22791 -8.412361 588.165
## 121787 -37.22763 -8.412361 588.363
## 121788 -37.22736 -8.412361 588.725
## 121789 -37.22708 -8.412361 588.977
## 121790 -37.22680 -8.412361 588.986
## 121791 -37.22652 -8.412361 587.862
## 121792 -37.22625 -8.412361 586.507
## 121793 -37.22597 -8.412361 585.029
## 121794 -37.22569 -8.412361 584.704
## 121795 -37.22541 -8.412361 584.103
## 121796 -37.22513 -8.412361 583.642
## 121797 -37.22486 -8.412361 582.374
## 121798 -37.22458 -8.412361 580.723
## 121799 -37.22430 -8.412361 579.216
## 121800 -37.22402 -8.412361 577.573
## 121801 -37.22375 -8.412361 575.872
## 122643 -37.36625 -8.412639 522.596
## 122644 -37.36597 -8.412639 521.578
## 122645 -37.36569 -8.412639 520.473
## 122646 -37.36541 -8.412639 519.787
## 122647 -37.36513 -8.412639 519.780
## 122648 -37.36486 -8.412639 519.902
## 122649 -37.36458 -8.412639 520.318
## 122650 -37.36430 -8.412639 521.205
## 122651 -37.36402 -8.412639 521.945
## 122652 -37.36375 -8.412639 522.788
## 122653 -37.36347 -8.412639 523.729
## 122654 -37.36319 -8.412639 524.642
## 122655 -37.36291 -8.412639 526.117
## 122656 -37.36263 -8.412639 527.772
## 122657 -37.36236 -8.412639 529.812
## 122658 -37.36208 -8.412639 531.693
## 122659 -37.36180 -8.412639 533.834
## 122660 -37.36152 -8.412639 535.686
## 122661 -37.36125 -8.412639 537.314
## 122662 -37.36097 -8.412639 539.194
## 122663 -37.36069 -8.412639 541.444
## 122664 -37.36041 -8.412639 543.464
## 122665 -37.36013 -8.412639 545.141
## 122666 -37.35986 -8.412639 546.355
## 122667 -37.35958 -8.412639 547.629
## 122668 -37.35930 -8.412639 548.667
## 122669 -37.35902 -8.412639 549.641
## 122670 -37.35875 -8.412639 550.723
## 122671 -37.35847 -8.412639 551.887
## 122672 -37.35819 -8.412639 553.440
## 122673 -37.35791 -8.412639 554.543
## 122674 -37.35763 -8.412639 555.481
## 122675 -37.35736 -8.412639 556.268
## 122676 -37.35708 -8.412639 557.035
## 122677 -37.35680 -8.412639 557.823
## 122678 -37.35652 -8.412639 558.457
## 122679 -37.35625 -8.412639 558.850
## 122680 -37.35597 -8.412639 559.082
## 122681 -37.35569 -8.412639 559.146
## 122682 -37.35541 -8.412639 559.048
## 122683 -37.35513 -8.412639 558.614
## 122684 -37.35486 -8.412639 558.153
## 122685 -37.35458 -8.412639 557.691
## 122686 -37.35430 -8.412639 557.320
## 122687 -37.35402 -8.412639 557.058
## 122688 -37.35375 -8.412639 556.772
## 122689 -37.35347 -8.412639 556.482
## 122690 -37.35319 -8.412639 556.192
## 122691 -37.35291 -8.412639 555.903
## 122692 -37.35263 -8.412639 555.498
## 122693 -37.35236 -8.412639 555.171
## 122694 -37.35208 -8.412639 554.919
## 122695 -37.35180 -8.412639 554.871
## 122696 -37.35152 -8.412639 554.860
## 122697 -37.35125 -8.412639 554.944
## 122698 -37.35097 -8.412639 555.278
## 122699 -37.35069 -8.412639 556.009
## 122700 -37.35041 -8.412639 556.820
## 122701 -37.35013 -8.412639 557.442
## 122702 -37.34986 -8.412639 558.262
## 122703 -37.34958 -8.412639 559.084
## 122704 -37.34930 -8.412639 560.010
## 122705 -37.34902 -8.412639 560.617
## 122706 -37.34875 -8.412639 561.048
## 122707 -37.34847 -8.412639 561.340
## 122708 -37.34819 -8.412639 561.371
## 122709 -37.34791 -8.412639 561.413
## 122710 -37.34763 -8.412639 561.608
## 122711 -37.34736 -8.412639 562.096
## 122712 -37.34708 -8.412639 562.625
## 122713 -37.34680 -8.412639 563.088
## 122714 -37.34652 -8.412639 563.397
## 122715 -37.34625 -8.412639 563.595
## 122716 -37.34597 -8.412639 563.621
## 122717 -37.34569 -8.412639 563.315
## 122718 -37.34541 -8.412639 563.203
## 122719 -37.34513 -8.412639 563.272
## 122720 -37.34486 -8.412639 563.618
## 122721 -37.34458 -8.412639 563.962
## 122722 -37.34430 -8.412639 564.396
## 122723 -37.34402 -8.412639 564.648
## 122724 -37.34375 -8.412639 564.815
## 122725 -37.34347 -8.412639 565.035
## 122726 -37.34319 -8.412639 565.347
## 122727 -37.34291 -8.412639 565.529
## 122728 -37.34263 -8.412639 565.365
## 122729 -37.34236 -8.412639 564.484
## 122730 -37.34208 -8.412639 563.568
## 122731 -37.34180 -8.412639 563.119
## 122732 -37.34152 -8.412639 563.323
## 122733 -37.34125 -8.412639 563.754
## 122734 -37.34097 -8.412639 564.015
## 122735 -37.34069 -8.412639 563.825
## 122736 -37.34041 -8.412639 563.534
## 122737 -37.34013 -8.412639 563.384
## 122738 -37.33986 -8.412639 563.341
## 122739 -37.33958 -8.412639 563.298
## 122740 -37.33930 -8.412639 563.129
## 122741 -37.33902 -8.412639 562.751
## 122742 -37.33875 -8.412639 562.107
## 122743 -37.33847 -8.412639 561.462
## 122744 -37.33819 -8.412639 560.880
## 122745 -37.33791 -8.412639 560.685
## 122746 -37.33763 -8.412639 560.541
## 122747 -37.33736 -8.412639 560.818
## 122748 -37.33708 -8.412639 561.215
## 122749 -37.33680 -8.412639 561.714
## 122750 -37.33652 -8.412639 561.877
## 122751 -37.33625 -8.412639 562.060
## 122752 -37.33597 -8.412639 562.526
## 122753 -37.33569 -8.412639 563.411
## 122754 -37.33541 -8.412639 564.179
## 122755 -37.33513 -8.412639 564.325
## 122756 -37.33486 -8.412639 563.700
## 122757 -37.33458 -8.412639 563.012
## 122758 -37.33430 -8.412639 562.779
## 122759 -37.33402 -8.412639 563.335
## 122760 -37.33375 -8.412639 564.278
## 122761 -37.33347 -8.412639 565.322
## 122762 -37.33319 -8.412639 565.453
## 122763 -37.33291 -8.412639 565.146
## 122764 -37.33263 -8.412639 564.223
## 122765 -37.33236 -8.412639 562.870
## 122766 -37.33208 -8.412639 561.621
## 122767 -37.33180 -8.412639 560.549
## 122768 -37.33152 -8.412639 560.382
## 122769 -37.33125 -8.412639 560.445
## 122770 -37.33097 -8.412639 560.295
## 122771 -37.33069 -8.412639 559.564
## 122772 -37.33041 -8.412639 558.764
## 122773 -37.33013 -8.412639 558.561
## 122774 -37.32986 -8.412639 559.343
## 122775 -37.32958 -8.412639 560.268
## 122776 -37.32930 -8.412639 561.305
## 122777 -37.32902 -8.412639 561.459
## 122778 -37.32875 -8.412639 561.346
## 122779 -37.32847 -8.412639 560.944
## 122780 -37.32819 -8.412639 560.716
## 122781 -37.32791 -8.412639 560.678
## 122782 -37.32763 -8.412639 560.800
## 122783 -37.32736 -8.412639 561.420
## 122784 -37.32708 -8.412639 562.194
## 122785 -37.32680 -8.412639 563.451
## 122786 -37.32652 -8.412639 564.255
## 122787 -37.32625 -8.412639 565.291
## 122788 -37.32597 -8.412639 565.784
## 122789 -37.32569 -8.412639 565.687
## 122790 -37.32541 -8.412639 565.552
## 122791 -37.32513 -8.412639 565.433
## 122792 -37.32486 -8.412639 566.117
## 122793 -37.32458 -8.412639 567.161
## 122794 -37.32430 -8.412639 568.215
## 122795 -37.32402 -8.412639 569.296
## 122796 -37.32375 -8.412639 570.467
## 122797 -37.32347 -8.412639 571.746
## 122798 -37.32319 -8.412639 573.198
## 122799 -37.32291 -8.412639 574.479
## 122800 -37.32263 -8.412639 575.262
## 122801 -37.32236 -8.412639 575.102
## 122802 -37.32208 -8.412639 574.637
## 122803 -37.32180 -8.412639 574.077
## 122804 -37.32152 -8.412639 574.433
## 122805 -37.32125 -8.412639 575.029
## 122806 -37.32097 -8.412639 575.504
## 122807 -37.32069 -8.412639 575.376
## 122808 -37.32041 -8.412639 575.119
## 122809 -37.32013 -8.412639 575.141
## 122810 -37.31986 -8.412639 575.529
## 122811 -37.31958 -8.412639 575.927
## 122812 -37.31930 -8.412639 576.227
## 122813 -37.31902 -8.412639 576.136
## 122814 -37.31875 -8.412639 576.175
## 122815 -37.31847 -8.412639 576.248
## 122816 -37.31819 -8.412639 576.256
## 122817 -37.31791 -8.412639 576.289
## 122818 -37.31763 -8.412639 575.989
## 122819 -37.31736 -8.412639 575.547
## 122820 -37.31708 -8.412639 575.167
## 122821 -37.31680 -8.412639 574.634
## 122822 -37.31652 -8.412639 574.384
## 122823 -37.31625 -8.412639 574.426
## 122824 -37.31597 -8.412639 574.436
## 122825 -37.31569 -8.412639 573.996
## 122826 -37.31541 -8.412639 573.310
## 122827 -37.31513 -8.412639 572.566
## 122828 -37.31486 -8.412639 572.338
## 122829 -37.31458 -8.412639 572.284
## 122830 -37.31430 -8.412639 572.274
## 122831 -37.31402 -8.412639 572.223
## 122832 -37.31375 -8.412639 572.052
## 122833 -37.31347 -8.412639 571.735
## 122834 -37.31319 -8.412639 570.730
## 122835 -37.31291 -8.412639 569.336
## 122836 -37.31263 -8.412639 567.689
## 122837 -37.31236 -8.412639 565.970
## 122838 -37.31208 -8.412639 564.359
## 122839 -37.31180 -8.412639 562.846
## 122840 -37.31152 -8.412639 561.264
## 122841 -37.31125 -8.412639 560.033
## 122842 -37.31097 -8.412639 559.253
## 122843 -37.31069 -8.412639 559.234
## 122844 -37.31041 -8.412639 559.920
## 122845 -37.31013 -8.412639 560.954
## 122846 -37.30986 -8.412639 562.823
## 122847 -37.30958 -8.412639 564.864
## 122848 -37.30930 -8.412639 567.125
## 122849 -37.30902 -8.412639 568.772
## 122850 -37.30875 -8.412639 570.146
## 122851 -37.30847 -8.412639 571.381
## 122852 -37.30819 -8.412639 572.686
## 122853 -37.30791 -8.412639 573.756
## 122854 -37.30763 -8.412639 574.408
## 122855 -37.30736 -8.412639 574.796
## 122856 -37.30708 -8.412639 575.275
## 122857 -37.30680 -8.412639 575.853
## 122858 -37.30652 -8.412639 576.986
## 122859 -37.30625 -8.412639 578.237
## 122860 -37.30597 -8.412639 579.476
## 122861 -37.30569 -8.412639 580.270
## 122862 -37.30541 -8.412639 580.528
## 122863 -37.30513 -8.412639 580.389
## 122864 -37.30486 -8.412639 579.383
## 122865 -37.30458 -8.412639 577.987
## 122866 -37.30430 -8.412639 576.645
## 122867 -37.30402 -8.412639 575.502
## 122868 -37.30375 -8.412639 574.611
## 122869 -37.30347 -8.412639 573.860
## 122870 -37.30319 -8.412639 573.328
## 122871 -37.30291 -8.412639 572.972
## 122872 -37.30263 -8.412639 572.669
## 122873 -37.30236 -8.412639 572.030
## 122874 -37.30208 -8.412639 571.486
## 122875 -37.30180 -8.412639 571.143
## 122876 -37.30152 -8.412639 571.786
## 122877 -37.30125 -8.412639 572.720
## 122878 -37.30097 -8.412639 573.607
## 122879 -37.30069 -8.412639 573.938
## 122880 -37.30041 -8.412639 573.754
## 122881 -37.30013 -8.412639 573.350
## 122882 -37.29986 -8.412639 572.676
## 122883 -37.29958 -8.412639 571.911
## 122884 -37.29930 -8.412639 571.789
## 122885 -37.29902 -8.412639 571.827
## 122886 -37.29875 -8.412639 572.487
## 122887 -37.29847 -8.412639 572.875
## 122888 -37.29819 -8.412639 572.302
## 122889 -37.29791 -8.412639 571.496
## 122890 -37.29763 -8.412639 570.422
## 122891 -37.29736 -8.412639 569.855
## 122892 -37.29708 -8.412639 569.567
## 122893 -37.29680 -8.412639 569.325
## 122894 -37.29652 -8.412639 569.245
## 122895 -37.29625 -8.412639 569.451
## 122896 -37.29597 -8.412639 569.949
## 122897 -37.29569 -8.412639 570.624
## 122898 -37.29541 -8.412639 571.055
## 122899 -37.29513 -8.412639 570.618
## 122900 -37.29486 -8.412639 569.231
## 122901 -37.29458 -8.412639 567.708
## 122902 -37.29430 -8.412639 566.407
## 122903 -37.29402 -8.412639 566.465
## 122904 -37.29375 -8.412639 566.869
## 122905 -37.29347 -8.412639 567.161
## 122906 -37.29319 -8.412639 566.536
## 122907 -37.29291 -8.412639 565.867
## 122908 -37.29263 -8.412639 565.484
## 122909 -37.29236 -8.412639 565.828
## 122910 -37.29208 -8.412639 566.428
## 122911 -37.29180 -8.412639 567.349
## 122912 -37.29152 -8.412639 567.707
## 122913 -37.29125 -8.412639 568.313
## 122914 -37.29097 -8.412639 568.186
## 122915 -37.29069 -8.412639 568.135
## 122916 -37.29041 -8.412639 567.967
## 122917 -37.29013 -8.412639 567.667
## 122918 -37.28986 -8.412639 567.034
## 122919 -37.28958 -8.412639 566.242
## 122920 -37.28930 -8.412639 565.339
## 122921 -37.28902 -8.412639 564.227
## 122922 -37.28875 -8.412639 562.882
## 122923 -37.28847 -8.412639 561.729
## 122924 -37.28819 -8.412639 561.472
## 122925 -37.28791 -8.412639 561.391
## 122926 -37.28763 -8.412639 561.595
## 122927 -37.28736 -8.412639 561.030
## 122928 -37.28708 -8.412639 560.604
## 122929 -37.28680 -8.412639 560.704
## 122930 -37.28652 -8.412639 562.016
## 122931 -37.28625 -8.412639 563.810
## 122932 -37.28597 -8.412639 565.729
## 122933 -37.28569 -8.412639 567.330
## 122934 -37.28541 -8.412639 568.579
## 122935 -37.28513 -8.412639 569.704
## 122936 -37.28486 -8.412639 569.948
## 122937 -37.28458 -8.412639 570.108
## 122938 -37.28430 -8.412639 570.206
## 122939 -37.28402 -8.412639 571.533
## 122940 -37.28375 -8.412639 572.971
## 122941 -37.28347 -8.412639 574.271
## 122942 -37.28319 -8.412639 574.332
## 122943 -37.28291 -8.412639 573.715
## 122944 -37.28263 -8.412639 572.786
## 122945 -37.28236 -8.412639 571.360
## 122946 -37.28208 -8.412639 569.814
## 122947 -37.28180 -8.412639 567.442
## 122948 -37.28152 -8.412639 565.259
## 122949 -37.28125 -8.412639 563.505
## 122950 -37.28097 -8.412639 562.358
## 122951 -37.28069 -8.412639 562.573
## 122952 -37.28041 -8.412639 563.357
## 122953 -37.28013 -8.412639 564.509
## 122954 -37.27986 -8.412639 565.151
## 122955 -37.27958 -8.412639 565.715
## 122956 -37.27930 -8.412639 567.016
## 122957 -37.27902 -8.412639 568.564
## 122958 -37.27875 -8.412639 570.093
## 122959 -37.27847 -8.412639 571.349
## 122960 -37.27819 -8.412639 572.201
## 122961 -37.27791 -8.412639 572.809
## 122962 -37.27763 -8.412639 572.593
## 122963 -37.27736 -8.412639 572.278
## 122964 -37.27708 -8.412639 571.946
## 122965 -37.27680 -8.412639 572.309
## 122966 -37.27652 -8.412639 573.024
## 122967 -37.27625 -8.412639 573.873
## 122968 -37.27597 -8.412639 574.850
## 122969 -37.27569 -8.412639 575.557
## 122970 -37.27541 -8.412639 576.070
## 122971 -37.27513 -8.412639 576.164
## 122972 -37.27486 -8.412639 576.028
## 122973 -37.27458 -8.412639 575.906
## 122974 -37.27430 -8.412639 576.009
## 122975 -37.27402 -8.412639 576.457
## 122976 -37.27375 -8.412639 576.851
## 122977 -37.27347 -8.412639 576.885
## 122978 -37.27319 -8.412639 576.400
## 122979 -37.27291 -8.412639 575.691
## 122980 -37.27263 -8.412639 575.066
## 122981 -37.27236 -8.412639 574.669
## 122982 -37.27208 -8.412639 574.220
## 122983 -37.27180 -8.412639 573.672
## 122984 -37.27152 -8.412639 572.740
## 122985 -37.27125 -8.412639 571.754
## 122986 -37.27097 -8.412639 570.822
## 122987 -37.27069 -8.412639 570.470
## 122988 -37.27041 -8.412639 570.269
## 122989 -37.27013 -8.412639 570.127
## 122990 -37.26986 -8.412639 569.563
## 122991 -37.26958 -8.412639 569.192
## 122992 -37.26930 -8.412639 569.090
## 122993 -37.26902 -8.412639 569.629
## 122994 -37.26875 -8.412639 570.193
## 122995 -37.26847 -8.412639 570.829
## 122996 -37.26819 -8.412639 571.370
## 122997 -37.26791 -8.412639 571.963
## 122998 -37.26763 -8.412639 572.720
## 122999 -37.26736 -8.412639 573.745
## 123000 -37.26708 -8.412639 574.603
## 123001 -37.26680 -8.412639 575.185
## 123002 -37.26652 -8.412639 575.030
## 123003 -37.26625 -8.412639 574.515
## 123004 -37.26597 -8.412639 574.081
## 123005 -37.26569 -8.412639 574.301
## 123006 -37.26541 -8.412639 574.316
## 123007 -37.26513 -8.412639 574.300
## 123008 -37.26486 -8.412639 572.987
## 123009 -37.26458 -8.412639 571.459
## 123010 -37.26430 -8.412639 568.937
## 123011 -37.26402 -8.412639 567.148
## 123012 -37.26375 -8.412639 565.623
## 123013 -37.26347 -8.412639 564.491
## 123014 -37.26319 -8.412639 563.868
## 123015 -37.26291 -8.412639 563.873
## 123016 -37.26263 -8.412639 564.957
## 123017 -37.26236 -8.412639 566.512
## 123018 -37.26208 -8.412639 568.433
## 123019 -37.26180 -8.412639 570.052
## 123020 -37.26152 -8.412639 570.973
## 123021 -37.26125 -8.412639 571.837
## 123022 -37.26097 -8.412639 572.316
## 123023 -37.26069 -8.412639 571.992
## 123024 -37.26041 -8.412639 571.354
## 123025 -37.26013 -8.412639 570.559
## 123026 -37.25986 -8.412639 570.544
## 123027 -37.25958 -8.412639 570.717
## 123028 -37.25930 -8.412639 570.657
## 123029 -37.25902 -8.412639 570.062
## 123030 -37.25875 -8.412639 569.338
## 123031 -37.25847 -8.412639 568.645
## 123032 -37.25819 -8.412639 567.972
## 123033 -37.25791 -8.412639 567.097
## 123034 -37.25763 -8.412639 565.921
## 123035 -37.25736 -8.412639 564.652
## 123036 -37.25708 -8.412639 563.554
## 123037 -37.25680 -8.412639 562.693
## 123038 -37.25652 -8.412639 562.689
## 123039 -37.25625 -8.412639 562.915
## 123040 -37.25597 -8.412639 563.751
## 123041 -37.25569 -8.412639 564.807
## 123042 -37.25541 -8.412639 565.765
## 123043 -37.25513 -8.412639 565.953
## 123044 -37.25486 -8.412639 565.074
## 123045 -37.25458 -8.412639 563.791
## 123046 -37.25430 -8.412639 562.689
## 123047 -37.25402 -8.412639 561.897
## 123048 -37.25375 -8.412639 561.685
## 123049 -37.25347 -8.412639 561.961
## 123050 -37.25319 -8.412639 562.038
## 123051 -37.25291 -8.412639 562.173
## 123052 -37.25263 -8.412639 562.408
## 123053 -37.25236 -8.412639 563.412
## 123054 -37.25208 -8.412639 564.550
## 123055 -37.25180 -8.412639 565.360
## 123056 -37.25152 -8.412639 565.867
## 123057 -37.25125 -8.412639 566.227
## 123058 -37.25097 -8.412639 566.651
## 123059 -37.25069 -8.412639 566.950
## 123060 -37.25041 -8.412639 567.160
## 123061 -37.25013 -8.412639 567.314
## 123062 -37.24986 -8.412639 567.570
## 123063 -37.24958 -8.412639 568.029
## 123064 -37.24930 -8.412639 568.655
## 123065 -37.24902 -8.412639 569.550
## 123066 -37.24875 -8.412639 570.572
## 123067 -37.24847 -8.412639 571.377
## 123068 -37.24819 -8.412639 571.969
## 123069 -37.24791 -8.412639 572.445
## 123070 -37.24763 -8.412639 572.731
## 123071 -37.24736 -8.412639 572.766
## 123072 -37.24708 -8.412639 572.781
## 123073 -37.24680 -8.412639 573.281
## 123074 -37.24652 -8.412639 574.436
## 123075 -37.24625 -8.412639 575.682
## 123076 -37.24597 -8.412639 576.786
## 123077 -37.24569 -8.412639 577.433
## 123078 -37.24541 -8.412639 578.052
## 123079 -37.24513 -8.412639 578.723
## 123080 -37.24486 -8.412639 579.305
## 123081 -37.24458 -8.412639 580.126
## 123082 -37.24430 -8.412639 580.704
## 123083 -37.24402 -8.412639 582.075
## 123084 -37.24375 -8.412639 583.765
## 123085 -37.24347 -8.412639 585.475
## 123086 -37.24319 -8.412639 586.693
## 123087 -37.24291 -8.412639 587.821
## 123088 -37.24263 -8.412639 589.532
## 123089 -37.24236 -8.412639 591.631
## 123090 -37.24208 -8.412639 593.745
## 123091 -37.24180 -8.412639 595.297
## 123092 -37.24152 -8.412639 596.735
## 123093 -37.24125 -8.412639 597.930
## 123094 -37.24097 -8.412639 598.949
## 123095 -37.24069 -8.412639 599.644
## 123096 -37.24041 -8.412639 600.198
## 123097 -37.24013 -8.412639 600.914
## 123098 -37.23986 -8.412639 601.801
## 123099 -37.23958 -8.412639 602.551
## 123100 -37.23930 -8.412639 602.584
## 123101 -37.23902 -8.412639 601.998
## 123102 -37.23875 -8.412639 601.098
## 123103 -37.23847 -8.412639 599.746
## 123104 -37.23819 -8.412639 598.224
## 123105 -37.23791 -8.412639 596.731
## 123106 -37.23763 -8.412639 595.562
## 123107 -37.23736 -8.412639 594.828
## 123108 -37.23708 -8.412639 594.212
## 123109 -37.23680 -8.412639 593.717
## 123110 -37.23652 -8.412639 592.724
## 123111 -37.23625 -8.412639 591.432
## 123112 -37.23597 -8.412639 589.320
## 123113 -37.23569 -8.412639 587.078
## 123114 -37.23541 -8.412639 584.703
## 123115 -37.23513 -8.412639 583.089
## 123116 -37.23486 -8.412639 582.077
## 123117 -37.23458 -8.412639 581.144
## 123118 -37.23430 -8.412639 580.220
## 123119 -37.23402 -8.412639 578.889
## 123120 -37.23375 -8.412639 576.865
## 123121 -37.23347 -8.412639 575.053
## 123122 -37.23319 -8.412639 574.763
## 123123 -37.23291 -8.412639 575.070
## 123124 -37.23263 -8.412639 575.846
## 123125 -37.23236 -8.412639 575.946
## 123126 -37.23208 -8.412639 575.962
## 123127 -37.23180 -8.412639 576.711
## 123128 -37.23152 -8.412639 577.739
## 123129 -37.23125 -8.412639 579.128
## 123130 -37.23097 -8.412639 580.604
## 123131 -37.23069 -8.412639 582.160
## 123132 -37.23041 -8.412639 583.688
## 123133 -37.23013 -8.412639 584.936
## 123134 -37.22986 -8.412639 585.670
## 123135 -37.22958 -8.412639 586.192
## 123136 -37.22930 -8.412639 586.454
## 123137 -37.22902 -8.412639 587.003
## 123138 -37.22875 -8.412639 587.457
## 123139 -37.22847 -8.412639 587.978
## 123140 -37.22819 -8.412639 588.030
## 123141 -37.22791 -8.412639 587.978
## 123142 -37.22763 -8.412639 588.174
## 123143 -37.22736 -8.412639 588.540
## 123144 -37.22708 -8.412639 588.850
## 123145 -37.22680 -8.412639 588.829
## 123146 -37.22652 -8.412639 588.268
## 123147 -37.22625 -8.412639 587.666
## 123148 -37.22597 -8.412639 586.650
## 123149 -37.22569 -8.412639 585.844
## 123150 -37.22541 -8.412639 584.985
## 123151 -37.22513 -8.412639 583.998
## 123152 -37.22486 -8.412639 582.761
## 123153 -37.22458 -8.412639 581.132
## 123154 -37.22430 -8.412639 579.618
## 123155 -37.22402 -8.412639 578.020
## 123156 -37.22375 -8.412639 576.480
## 123997 -37.36652 -8.412917 522.412
## 123998 -37.36625 -8.412917 521.660
## 123999 -37.36597 -8.412917 521.042
## 124000 -37.36569 -8.412917 520.561
## 124001 -37.36541 -8.412917 520.488
## 124002 -37.36513 -8.412917 520.666
## 124003 -37.36486 -8.412917 521.035
## 124004 -37.36458 -8.412917 521.598
## 124005 -37.36430 -8.412917 522.432
## 124006 -37.36402 -8.412917 523.155
## 124007 -37.36375 -8.412917 524.153
## 124008 -37.36347 -8.412917 525.274
## 124009 -37.36319 -8.412917 526.660
## 124010 -37.36291 -8.412917 528.167
## 124011 -37.36263 -8.412917 529.639
## 124012 -37.36236 -8.412917 531.647
## 124013 -37.36208 -8.412917 533.474
## 124014 -37.36180 -8.412917 535.023
## 124015 -37.36152 -8.412917 536.666
## 124016 -37.36125 -8.412917 538.144
## 124017 -37.36097 -8.412917 539.916
## 124018 -37.36069 -8.412917 541.799
## 124019 -37.36041 -8.412917 543.900
## 124020 -37.36013 -8.412917 546.128
## 124021 -37.35986 -8.412917 547.323
## 124022 -37.35958 -8.412917 548.591
## 124023 -37.35930 -8.412917 549.493
## 124024 -37.35902 -8.412917 550.854
## 124025 -37.35875 -8.412917 551.993
## 124026 -37.35847 -8.412917 553.242
## 124027 -37.35819 -8.412917 554.523
## 124028 -37.35791 -8.412917 555.833
## 124029 -37.35763 -8.412917 557.013
## 124030 -37.35736 -8.412917 557.845
## 124031 -37.35708 -8.412917 558.512
## 124032 -37.35680 -8.412917 558.923
## 124033 -37.35652 -8.412917 559.517
## 124034 -37.35625 -8.412917 559.880
## 124035 -37.35597 -8.412917 560.076
## 124036 -37.35569 -8.412917 560.232
## 124037 -37.35541 -8.412917 560.203
## 124038 -37.35513 -8.412917 560.030
## 124039 -37.35486 -8.412917 559.654
## 124040 -37.35458 -8.412917 559.207
## 124041 -37.35430 -8.412917 558.721
## 124042 -37.35402 -8.412917 558.420
## 124043 -37.35375 -8.412917 558.126
## 124044 -37.35347 -8.412917 557.900
## 124045 -37.35319 -8.412917 557.715
## 124046 -37.35291 -8.412917 557.575
## 124047 -37.35263 -8.412917 557.485
## 124048 -37.35236 -8.412917 557.268
## 124049 -37.35208 -8.412917 557.094
## 124050 -37.35180 -8.412917 556.915
## 124051 -37.35152 -8.412917 556.737
## 124052 -37.35125 -8.412917 556.663
## 124053 -37.35097 -8.412917 556.841
## 124054 -37.35069 -8.412917 557.311
## 124055 -37.35041 -8.412917 558.049
## 124056 -37.35013 -8.412917 559.008
## 124057 -37.34986 -8.412917 559.932
## 124058 -37.34958 -8.412917 560.900
## 124059 -37.34930 -8.412917 561.680
## 124060 -37.34902 -8.412917 562.330
## 124061 -37.34875 -8.412917 562.713
## 124062 -37.34847 -8.412917 562.964
## 124063 -37.34819 -8.412917 562.806
## 124064 -37.34791 -8.412917 562.681
## 124065 -37.34763 -8.412917 562.600
## 124066 -37.34736 -8.412917 563.008
## 124067 -37.34708 -8.412917 563.449
## 124068 -37.34680 -8.412917 563.931
## 124069 -37.34652 -8.412917 564.173
## 124070 -37.34625 -8.412917 564.365
## 124071 -37.34597 -8.412917 564.405
## 124072 -37.34569 -8.412917 564.389
## 124073 -37.34541 -8.412917 564.313
## 124074 -37.34513 -8.412917 564.220
## 124075 -37.34486 -8.412917 564.493
## 124076 -37.34458 -8.412917 564.739
## 124077 -37.34430 -8.412917 564.993
## 124078 -37.34402 -8.412917 565.096
## 124079 -37.34375 -8.412917 565.230
## 124080 -37.34347 -8.412917 565.407
## 124081 -37.34319 -8.412917 565.808
## 124082 -37.34291 -8.412917 566.064
## 124083 -37.34263 -8.412917 565.936
## 124084 -37.34236 -8.412917 565.173
## 124085 -37.34208 -8.412917 564.274
## 124086 -37.34180 -8.412917 563.670
## 124087 -37.34152 -8.412917 563.761
## 124088 -37.34125 -8.412917 564.075
## 124089 -37.34097 -8.412917 564.502
## 124090 -37.34069 -8.412917 564.297
## 124091 -37.34041 -8.412917 564.095
## 124092 -37.34013 -8.412917 563.885
## 124093 -37.33986 -8.412917 563.941
## 124094 -37.33958 -8.412917 563.978
## 124095 -37.33930 -8.412917 563.915
## 124096 -37.33902 -8.412917 563.627
## 124097 -37.33875 -8.412917 563.207
## 124098 -37.33847 -8.412917 562.802
## 124099 -37.33819 -8.412917 562.438
## 124100 -37.33791 -8.412917 562.254
## 124101 -37.33763 -8.412917 562.310
## 124102 -37.33736 -8.412917 562.604
## 124103 -37.33708 -8.412917 563.024
## 124104 -37.33680 -8.412917 563.226
## 124105 -37.33652 -8.412917 563.478
## 124106 -37.33625 -8.412917 563.622
## 124107 -37.33597 -8.412917 563.923
## 124108 -37.33569 -8.412917 564.770
## 124109 -37.33541 -8.412917 565.554
## 124110 -37.33513 -8.412917 566.068
## 124111 -37.33486 -8.412917 565.502
## 124112 -37.33458 -8.412917 564.888
## 124113 -37.33430 -8.412917 564.488
## 124114 -37.33402 -8.412917 565.074
## 124115 -37.33375 -8.412917 565.748
## 124116 -37.33347 -8.412917 566.321
## 124117 -37.33319 -8.412917 566.390
## 124118 -37.33291 -8.412917 566.064
## 124119 -37.33263 -8.412917 565.451
## 124120 -37.33236 -8.412917 564.168
## 124121 -37.33208 -8.412917 562.983
## 124122 -37.33180 -8.412917 562.146
## 124123 -37.33152 -8.412917 561.936
## 124124 -37.33125 -8.412917 562.049
## 124125 -37.33097 -8.412917 561.990
## 124126 -37.33069 -8.412917 561.208
## 124127 -37.33041 -8.412917 560.349
## 124128 -37.33013 -8.412917 559.970
## 124129 -37.32986 -8.412917 560.423
## 124130 -37.32958 -8.412917 561.211
## 124131 -37.32930 -8.412917 561.768
## 124132 -37.32902 -8.412917 561.658
## 124133 -37.32875 -8.412917 561.260
## 124134 -37.32847 -8.412917 560.845
## 124135 -37.32819 -8.412917 560.408
## 124136 -37.32791 -8.412917 560.288
## 124137 -37.32763 -8.412917 560.529
## 124138 -37.32736 -8.412917 561.340
## 124139 -37.32708 -8.412917 562.391
## 124140 -37.32680 -8.412917 563.590
## 124141 -37.32652 -8.412917 564.453
## 124142 -37.32625 -8.412917 565.249
## 124143 -37.32597 -8.412917 565.815
## 124144 -37.32569 -8.412917 566.040
## 124145 -37.32541 -8.412917 566.211
## 124146 -37.32513 -8.412917 566.559
## 124147 -37.32486 -8.412917 567.424
## 124148 -37.32458 -8.412917 568.513
## 124149 -37.32430 -8.412917 569.622
## 124150 -37.32402 -8.412917 570.820
## 124151 -37.32375 -8.412917 571.930
## 124152 -37.32347 -8.412917 573.046
## 124153 -37.32319 -8.412917 574.417
## 124154 -37.32291 -8.412917 575.513
## 124155 -37.32263 -8.412917 575.994
## 124156 -37.32236 -8.412917 575.747
## 124157 -37.32208 -8.412917 575.154
## 124158 -37.32180 -8.412917 574.837
## 124159 -37.32152 -8.412917 575.279
## 124160 -37.32125 -8.412917 575.899
## 124161 -37.32097 -8.412917 576.348
## 124162 -37.32069 -8.412917 576.246
## 124163 -37.32041 -8.412917 575.959
## 124164 -37.32013 -8.412917 575.804
## 124165 -37.31986 -8.412917 576.111
## 124166 -37.31958 -8.412917 576.506
## 124167 -37.31930 -8.412917 576.854
## 124168 -37.31902 -8.412917 576.691
## 124169 -37.31875 -8.412917 576.528
## 124170 -37.31847 -8.412917 576.466
## 124171 -37.31819 -8.412917 576.599
## 124172 -37.31791 -8.412917 576.816
## 124173 -37.31763 -8.412917 577.106
## 124174 -37.31736 -8.412917 576.665
## 124175 -37.31708 -8.412917 576.318
## 124176 -37.31680 -8.412917 575.936
## 124177 -37.31652 -8.412917 575.834
## 124178 -37.31625 -8.412917 575.672
## 124179 -37.31597 -8.412917 575.132
## 124180 -37.31569 -8.412917 574.461
## 124181 -37.31541 -8.412917 573.489
## 124182 -37.31513 -8.412917 572.617
## 124183 -37.31486 -8.412917 572.274
## 124184 -37.31458 -8.412917 572.112
## 124185 -37.31430 -8.412917 572.053
## 124186 -37.31402 -8.412917 571.922
## 124187 -37.31375 -8.412917 571.643
## 124188 -37.31347 -8.412917 571.108
## 124189 -37.31319 -8.412917 570.087
## 124190 -37.31291 -8.412917 568.800
## 124191 -37.31263 -8.412917 567.333
## 124192 -37.31236 -8.412917 565.836
## 124193 -37.31208 -8.412917 564.393
## 124194 -37.31180 -8.412917 563.134
## 124195 -37.31152 -8.412917 562.041
## 124196 -37.31125 -8.412917 561.338
## 124197 -37.31097 -8.412917 561.230
## 124198 -37.31069 -8.412917 561.323
## 124199 -37.31041 -8.412917 562.079
## 124200 -37.31013 -8.412917 563.338
## 124201 -37.30986 -8.412917 565.087
## 124202 -37.30958 -8.412917 567.005
## 124203 -37.30930 -8.412917 568.545
## 124204 -37.30902 -8.412917 570.154
## 124205 -37.30875 -8.412917 571.348
## 124206 -37.30847 -8.412917 572.355
## 124207 -37.30819 -8.412917 573.775
## 124208 -37.30791 -8.412917 574.955
## 124209 -37.30763 -8.412917 575.875
## 124210 -37.30736 -8.412917 576.354
## 124211 -37.30708 -8.412917 576.774
## 124212 -37.30680 -8.412917 577.424
## 124213 -37.30652 -8.412917 578.583
## 124214 -37.30625 -8.412917 579.821
## 124215 -37.30597 -8.412917 580.891
## 124216 -37.30569 -8.412917 581.462
## 124217 -37.30541 -8.412917 581.587
## 124218 -37.30513 -8.412917 581.264
## 124219 -37.30486 -8.412917 580.502
## 124220 -37.30458 -8.412917 579.508
## 124221 -37.30430 -8.412917 578.416
## 124222 -37.30402 -8.412917 577.611
## 124223 -37.30375 -8.412917 576.903
## 124224 -37.30347 -8.412917 576.431
## 124225 -37.30319 -8.412917 575.786
## 124226 -37.30291 -8.412917 575.261
## 124227 -37.30263 -8.412917 574.586
## 124228 -37.30236 -8.412917 573.781
## 124229 -37.30208 -8.412917 573.041
## 124230 -37.30180 -8.412917 572.693
## 124231 -37.30152 -8.412917 572.990
## 124232 -37.30125 -8.412917 573.490
## 124233 -37.30097 -8.412917 573.799
## 124234 -37.30069 -8.412917 573.975
## 124235 -37.30041 -8.412917 573.769
## 124236 -37.30013 -8.412917 573.394
## 124237 -37.29986 -8.412917 572.944
## 124238 -37.29958 -8.412917 572.583
## 124239 -37.29930 -8.412917 572.543
## 124240 -37.29902 -8.412917 572.870
## 124241 -37.29875 -8.412917 573.274
## 124242 -37.29847 -8.412917 573.520
## 124243 -37.29819 -8.412917 572.978
## 124244 -37.29791 -8.412917 572.277
## 124245 -37.29763 -8.412917 571.607
## 124246 -37.29736 -8.412917 571.321
## 124247 -37.29708 -8.412917 571.204
## 124248 -37.29680 -8.412917 571.188
## 124249 -37.29652 -8.412917 571.190
## 124250 -37.29625 -8.412917 571.241
## 124251 -37.29597 -8.412917 571.250
## 124252 -37.29569 -8.412917 571.701
## 124253 -37.29541 -8.412917 571.797
## 124254 -37.29513 -8.412917 571.377
## 124255 -37.29486 -8.412917 569.927
## 124256 -37.29458 -8.412917 568.384
## 124257 -37.29430 -8.412917 567.209
## 124258 -37.29402 -8.412917 567.576
## 124259 -37.29375 -8.412917 568.018
## 124260 -37.29347 -8.412917 568.419
## 124261 -37.29319 -8.412917 567.491
## 124262 -37.29291 -8.412917 566.625
## 124263 -37.29263 -8.412917 566.157
## 124264 -37.29236 -8.412917 566.683
## 124265 -37.29208 -8.412917 567.569
## 124266 -37.29180 -8.412917 568.662
## 124267 -37.29152 -8.412917 568.885
## 124268 -37.29125 -8.412917 569.140
## 124269 -37.29097 -8.412917 569.252
## 124270 -37.29069 -8.412917 569.423
## 124271 -37.29041 -8.412917 569.416
## 124272 -37.29013 -8.412917 569.126
## 124273 -37.28986 -8.412917 568.403
## 124274 -37.28958 -8.412917 567.401
## 124275 -37.28930 -8.412917 566.245
## 124276 -37.28902 -8.412917 564.705
## 124277 -37.28875 -8.412917 563.315
## 124278 -37.28847 -8.412917 562.276
## 124279 -37.28819 -8.412917 562.012
## 124280 -37.28791 -8.412917 562.015
## 124281 -37.28763 -8.412917 561.898
## 124282 -37.28736 -8.412917 561.350
## 124283 -37.28708 -8.412917 560.919
## 124284 -37.28680 -8.412917 561.120
## 124285 -37.28652 -8.412917 562.330
## 124286 -37.28625 -8.412917 563.981
## 124287 -37.28597 -8.412917 565.673
## 124288 -37.28569 -8.412917 567.230
## 124289 -37.28541 -8.412917 568.412
## 124290 -37.28513 -8.412917 569.186
## 124291 -37.28486 -8.412917 569.382
## 124292 -37.28458 -8.412917 569.557
## 124293 -37.28430 -8.412917 570.092
## 124294 -37.28402 -8.412917 571.436
## 124295 -37.28375 -8.412917 572.812
## 124296 -37.28347 -8.412917 573.712
## 124297 -37.28319 -8.412917 574.007
## 124298 -37.28291 -8.412917 573.540
## 124299 -37.28263 -8.412917 572.574
## 124300 -37.28236 -8.412917 571.270
## 124301 -37.28208 -8.412917 569.696
## 124302 -37.28180 -8.412917 568.180
## 124303 -37.28152 -8.412917 566.176
## 124304 -37.28125 -8.412917 564.725
## 124305 -37.28097 -8.412917 563.878
## 124306 -37.28069 -8.412917 563.979
## 124307 -37.28041 -8.412917 564.503
## 124308 -37.28013 -8.412917 565.032
## 124309 -37.27986 -8.412917 565.056
## 124310 -37.27958 -8.412917 565.137
## 124311 -37.27930 -8.412917 565.467
## 124312 -37.27902 -8.412917 566.801
## 124313 -37.27875 -8.412917 568.217
## 124314 -37.27847 -8.412917 569.842
## 124315 -37.27819 -8.412917 570.691
## 124316 -37.27791 -8.412917 571.473
## 124317 -37.27763 -8.412917 571.927
## 124318 -37.27736 -8.412917 572.054
## 124319 -37.27708 -8.412917 572.124
## 124320 -37.27680 -8.412917 572.267
## 124321 -37.27652 -8.412917 573.140
## 124322 -37.27625 -8.412917 574.039
## 124323 -37.27597 -8.412917 574.932
## 124324 -37.27569 -8.412917 575.683
## 124325 -37.27541 -8.412917 576.184
## 124326 -37.27513 -8.412917 576.374
## 124327 -37.27486 -8.412917 576.159
## 124328 -37.27458 -8.412917 575.877
## 124329 -37.27430 -8.412917 575.777
## 124330 -37.27402 -8.412917 576.253
## 124331 -37.27375 -8.412917 576.707
## 124332 -37.27347 -8.412917 577.002
## 124333 -37.27319 -8.412917 576.547
## 124334 -37.27291 -8.412917 575.917
## 124335 -37.27263 -8.412917 575.250
## 124336 -37.27236 -8.412917 574.802
## 124337 -37.27208 -8.412917 574.303
## 124338 -37.27180 -8.412917 573.573
## 124339 -37.27152 -8.412917 572.559
## 124340 -37.27125 -8.412917 571.530
## 124341 -37.27097 -8.412917 570.672
## 124342 -37.27069 -8.412917 570.474
## 124343 -37.27041 -8.412917 570.410
## 124344 -37.27013 -8.412917 570.309
## 124345 -37.26986 -8.412917 569.882
## 124346 -37.26958 -8.412917 569.514
## 124347 -37.26930 -8.412917 569.358
## 124348 -37.26902 -8.412917 569.770
## 124349 -37.26875 -8.412917 570.462
## 124350 -37.26847 -8.412917 571.467
## 124351 -37.26819 -8.412917 572.172
## 124352 -37.26791 -8.412917 573.055
## 124353 -37.26763 -8.412917 574.008
## 124354 -37.26736 -8.412917 574.981
## 124355 -37.26708 -8.412917 575.760
## 124356 -37.26680 -8.412917 575.916
## 124357 -37.26652 -8.412917 575.594
## 124358 -37.26625 -8.412917 574.956
## 124359 -37.26597 -8.412917 574.137
## 124360 -37.26569 -8.412917 574.571
## 124361 -37.26541 -8.412917 574.638
## 124362 -37.26513 -8.412917 574.215
## 124363 -37.26486 -8.412917 572.791
## 124364 -37.26458 -8.412917 570.941
## 124365 -37.26430 -8.412917 569.121
## 124366 -37.26402 -8.412917 567.208
## 124367 -37.26375 -8.412917 565.699
## 124368 -37.26347 -8.412917 564.522
## 124369 -37.26319 -8.412917 564.001
## 124370 -37.26291 -8.412917 564.018
## 124371 -37.26263 -8.412917 564.697
## 124372 -37.26236 -8.412917 566.059
## 124373 -37.26208 -8.412917 567.761
## 124374 -37.26180 -8.412917 569.498
## 124375 -37.26152 -8.412917 570.905
## 124376 -37.26125 -8.412917 571.888
## 124377 -37.26097 -8.412917 572.269
## 124378 -37.26069 -8.412917 572.172
## 124379 -37.26041 -8.412917 571.700
## 124380 -37.26013 -8.412917 571.437
## 124381 -37.25986 -8.412917 571.249
## 124382 -37.25958 -8.412917 571.276
## 124383 -37.25930 -8.412917 571.002
## 124384 -37.25902 -8.412917 570.428
## 124385 -37.25875 -8.412917 569.583
## 124386 -37.25847 -8.412917 568.572
## 124387 -37.25819 -8.412917 567.786
## 124388 -37.25791 -8.412917 566.850
## 124389 -37.25763 -8.412917 565.789
## 124390 -37.25736 -8.412917 564.559
## 124391 -37.25708 -8.412917 563.516
## 124392 -37.25680 -8.412917 562.952
## 124393 -37.25652 -8.412917 563.059
## 124394 -37.25625 -8.412917 563.641
## 124395 -37.25597 -8.412917 564.470
## 124396 -37.25569 -8.412917 565.564
## 124397 -37.25541 -8.412917 566.361
## 124398 -37.25513 -8.412917 566.579
## 124399 -37.25486 -8.412917 565.860
## 124400 -37.25458 -8.412917 564.723
## 124401 -37.25430 -8.412917 563.513
## 124402 -37.25402 -8.412917 562.602
## 124403 -37.25375 -8.412917 561.991
## 124404 -37.25347 -8.412917 561.546
## 124405 -37.25319 -8.412917 561.449
## 124406 -37.25291 -8.412917 561.589
## 124407 -37.25263 -8.412917 562.140
## 124408 -37.25236 -8.412917 563.200
## 124409 -37.25208 -8.412917 564.332
## 124410 -37.25180 -8.412917 564.990
## 124411 -37.25152 -8.412917 565.513
## 124412 -37.25125 -8.412917 565.540
## 124413 -37.25097 -8.412917 565.278
## 124414 -37.25069 -8.412917 565.328
## 124415 -37.25041 -8.412917 565.279
## 124416 -37.25013 -8.412917 565.318
## 124417 -37.24986 -8.412917 565.466
## 124418 -37.24958 -8.412917 565.840
## 124419 -37.24930 -8.412917 566.647
## 124420 -37.24902 -8.412917 567.667
## 124421 -37.24875 -8.412917 568.868
## 124422 -37.24847 -8.412917 570.121
## 124423 -37.24819 -8.412917 570.608
## 124424 -37.24791 -8.412917 571.004
## 124425 -37.24763 -8.412917 571.160
## 124426 -37.24736 -8.412917 571.124
## 124427 -37.24708 -8.412917 571.205
## 124428 -37.24680 -8.412917 571.689
## 124429 -37.24652 -8.412917 572.910
## 124430 -37.24625 -8.412917 574.293
## 124431 -37.24597 -8.412917 575.757
## 124432 -37.24569 -8.412917 576.452
## 124433 -37.24541 -8.412917 577.125
## 124434 -37.24513 -8.412917 577.736
## 124435 -37.24486 -8.412917 578.399
## 124436 -37.24458 -8.412917 579.238
## 124437 -37.24430 -8.412917 580.461
## 124438 -37.24402 -8.412917 582.003
## 124439 -37.24375 -8.412917 583.672
## 124440 -37.24347 -8.412917 585.084
## 124441 -37.24319 -8.412917 586.218
## 124442 -37.24291 -8.412917 587.267
## 124443 -37.24263 -8.412917 588.656
## 124444 -37.24236 -8.412917 590.691
## 124445 -37.24208 -8.412917 592.891
## 124446 -37.24180 -8.412917 594.973
## 124447 -37.24152 -8.412917 596.452
## 124448 -37.24125 -8.412917 597.653
## 124449 -37.24097 -8.412917 598.369
## 124450 -37.24069 -8.412917 599.183
## 124451 -37.24041 -8.412917 599.680
## 124452 -37.24013 -8.412917 600.161
## 124453 -37.23986 -8.412917 600.746
## 124454 -37.23958 -8.412917 601.183
## 124455 -37.23930 -8.412917 601.300
## 124456 -37.23902 -8.412917 600.902
## 124457 -37.23875 -8.412917 600.128
## 124458 -37.23847 -8.412917 599.043
## 124459 -37.23819 -8.412917 597.533
## 124460 -37.23791 -8.412917 596.055
## 124461 -37.23763 -8.412917 594.824
## 124462 -37.23736 -8.412917 594.089
## 124463 -37.23708 -8.412917 593.513
## 124464 -37.23680 -8.412917 592.968
## 124465 -37.23652 -8.412917 592.021
## 124466 -37.23625 -8.412917 590.820
## 124467 -37.23597 -8.412917 589.345
## 124468 -37.23569 -8.412917 586.980
## 124469 -37.23541 -8.412917 584.679
## 124470 -37.23513 -8.412917 582.670
## 124471 -37.23486 -8.412917 581.392
## 124472 -37.23458 -8.412917 580.267
## 124473 -37.23430 -8.412917 579.072
## 124474 -37.23402 -8.412917 577.122
## 124475 -37.23375 -8.412917 575.344
## 124476 -37.23347 -8.412917 574.464
## 124477 -37.23319 -8.412917 574.615
## 124478 -37.23291 -8.412917 575.489
## 124479 -37.23263 -8.412917 576.280
## 124480 -37.23236 -8.412917 576.271
## 124481 -37.23208 -8.412917 576.194
## 124482 -37.23180 -8.412917 576.403
## 124483 -37.23152 -8.412917 577.507
## 124484 -37.23125 -8.412917 578.935
## 124485 -37.23097 -8.412917 580.674
## 124486 -37.23069 -8.412917 582.349
## 124487 -37.23041 -8.412917 583.970
## 124488 -37.23013 -8.412917 585.266
## 124489 -37.22986 -8.412917 586.016
## 124490 -37.22958 -8.412917 586.507
## 124491 -37.22930 -8.412917 586.879
## 124492 -37.22902 -8.412917 587.521
## 124493 -37.22875 -8.412917 587.987
## 124494 -37.22847 -8.412917 588.221
## 124495 -37.22819 -8.412917 588.128
## 124496 -37.22791 -8.412917 587.946
## 124497 -37.22763 -8.412917 587.919
## 124498 -37.22736 -8.412917 588.269
## 124499 -37.22708 -8.412917 588.691
## 124500 -37.22680 -8.412917 588.973
## 124501 -37.22652 -8.412917 589.008
## 124502 -37.22625 -8.412917 588.725
## 124503 -37.22597 -8.412917 588.187
## 124504 -37.22569 -8.412917 587.315
## 124505 -37.22541 -8.412917 586.194
## 124506 -37.22513 -8.412917 584.590
## 124507 -37.22486 -8.412917 583.171
## 124508 -37.22458 -8.412917 581.394
## 124509 -37.22430 -8.412917 579.503
## 124510 -37.22402 -8.412917 577.983
## 124511 -37.22375 -8.412917 576.405
## 124512 -37.22347 -8.412917 574.945
## 125352 -37.36652 -8.413194 521.088
## 125353 -37.36625 -8.413194 520.624
## 125354 -37.36597 -8.413194 520.400
## 125355 -37.36569 -8.413194 520.855
## 125356 -37.36541 -8.413194 521.221
## 125357 -37.36513 -8.413194 521.738
## 125358 -37.36486 -8.413194 522.438
## 125359 -37.36458 -8.413194 523.139
## 125360 -37.36430 -8.413194 523.643
## 125361 -37.36402 -8.413194 524.522
## 125362 -37.36375 -8.413194 525.540
## 125363 -37.36347 -8.413194 527.100
## 125364 -37.36319 -8.413194 528.751
## 125365 -37.36291 -8.413194 530.360
## 125366 -37.36263 -8.413194 531.963
## 125367 -37.36236 -8.413194 533.616
## 125368 -37.36208 -8.413194 535.268
## 125369 -37.36180 -8.413194 536.643
## 125370 -37.36152 -8.413194 537.796
## 125371 -37.36125 -8.413194 539.114
## 125372 -37.36097 -8.413194 540.281
## 125373 -37.36069 -8.413194 542.191
## 125374 -37.36041 -8.413194 544.224
## 125375 -37.36013 -8.413194 546.439
## 125376 -37.35986 -8.413194 548.117
## 125377 -37.35958 -8.413194 549.465
## 125378 -37.35930 -8.413194 550.898
## 125379 -37.35902 -8.413194 552.163
## 125380 -37.35875 -8.413194 553.421
## 125381 -37.35847 -8.413194 554.559
## 125382 -37.35819 -8.413194 555.751
## 125383 -37.35791 -8.413194 557.098
## 125384 -37.35763 -8.413194 558.517
## 125385 -37.35736 -8.413194 559.395
## 125386 -37.35708 -8.413194 559.960
## 125387 -37.35680 -8.413194 560.196
## 125388 -37.35652 -8.413194 560.491
## 125389 -37.35625 -8.413194 560.792
## 125390 -37.35597 -8.413194 560.989
## 125391 -37.35569 -8.413194 561.118
## 125392 -37.35541 -8.413194 561.170
## 125393 -37.35513 -8.413194 561.245
## 125394 -37.35486 -8.413194 561.059
## 125395 -37.35458 -8.413194 560.724
## 125396 -37.35430 -8.413194 560.189
## 125397 -37.35402 -8.413194 559.798
## 125398 -37.35375 -8.413194 559.492
## 125399 -37.35347 -8.413194 559.266
## 125400 -37.35319 -8.413194 559.193
## 125401 -37.35291 -8.413194 559.164
## 125402 -37.35263 -8.413194 559.261
## 125403 -37.35236 -8.413194 559.247
## 125404 -37.35208 -8.413194 559.111
## 125405 -37.35180 -8.413194 558.974
## 125406 -37.35152 -8.413194 558.574
## 125407 -37.35125 -8.413194 558.323
## 125408 -37.35097 -8.413194 558.376
## 125409 -37.35069 -8.413194 558.682
## 125410 -37.35041 -8.413194 559.360
## 125411 -37.35013 -8.413194 560.413
## 125412 -37.34986 -8.413194 561.540
## 125413 -37.34958 -8.413194 562.499
## 125414 -37.34930 -8.413194 563.341
## 125415 -37.34902 -8.413194 563.880
## 125416 -37.34875 -8.413194 564.305
## 125417 -37.34847 -8.413194 564.452
## 125418 -37.34819 -8.413194 564.317
## 125419 -37.34791 -8.413194 564.117
## 125420 -37.34763 -8.413194 563.919
## 125421 -37.34736 -8.413194 564.129
## 125422 -37.34708 -8.413194 564.355
## 125423 -37.34680 -8.413194 564.786
## 125424 -37.34652 -8.413194 564.996
## 125425 -37.34625 -8.413194 565.134
## 125426 -37.34597 -8.413194 565.355
## 125427 -37.34569 -8.413194 565.467
## 125428 -37.34541 -8.413194 565.484
## 125429 -37.34513 -8.413194 565.364
## 125430 -37.34486 -8.413194 565.435
## 125431 -37.34458 -8.413194 565.545
## 125432 -37.34430 -8.413194 565.608
## 125433 -37.34402 -8.413194 565.556
## 125434 -37.34375 -8.413194 565.622
## 125435 -37.34347 -8.413194 565.755
## 125436 -37.34319 -8.413194 566.258
## 125437 -37.34291 -8.413194 566.532
## 125438 -37.34263 -8.413194 566.622
## 125439 -37.34236 -8.413194 565.877
## 125440 -37.34208 -8.413194 565.096
## 125441 -37.34180 -8.413194 564.293
## 125442 -37.34152 -8.413194 564.315
## 125443 -37.34125 -8.413194 564.509
## 125444 -37.34097 -8.413194 564.884
## 125445 -37.34069 -8.413194 564.804
## 125446 -37.34041 -8.413194 564.600
## 125447 -37.34013 -8.413194 564.444
## 125448 -37.33986 -8.413194 564.560
## 125449 -37.33958 -8.413194 564.705
## 125450 -37.33930 -8.413194 564.774
## 125451 -37.33902 -8.413194 564.540
## 125452 -37.33875 -8.413194 564.327
## 125453 -37.33847 -8.413194 564.188
## 125454 -37.33819 -8.413194 564.101
## 125455 -37.33791 -8.413194 563.973
## 125456 -37.33763 -8.413194 564.089
## 125457 -37.33736 -8.413194 564.457
## 125458 -37.33708 -8.413194 564.870
## 125459 -37.33680 -8.413194 565.118
## 125460 -37.33652 -8.413194 565.063
## 125461 -37.33625 -8.413194 565.179
## 125462 -37.33597 -8.413194 565.296
## 125463 -37.33569 -8.413194 566.025
## 125464 -37.33541 -8.413194 566.805
## 125465 -37.33513 -8.413194 567.588
## 125466 -37.33486 -8.413194 567.342
## 125467 -37.33458 -8.413194 566.854
## 125468 -37.33430 -8.413194 566.512
## 125469 -37.33402 -8.413194 566.878
## 125470 -37.33375 -8.413194 567.363
## 125471 -37.33347 -8.413194 567.544
## 125472 -37.33319 -8.413194 567.313
## 125473 -37.33291 -8.413194 566.955
## 125474 -37.33263 -8.413194 566.485
## 125475 -37.33236 -8.413194 565.529
## 125476 -37.33208 -8.413194 564.563
## 125477 -37.33180 -8.413194 563.879
## 125478 -37.33152 -8.413194 563.849
## 125479 -37.33125 -8.413194 564.009
## 125480 -37.33097 -8.413194 564.109
## 125481 -37.33069 -8.413194 563.221
## 125482 -37.33041 -8.413194 562.303
## 125483 -37.33013 -8.413194 561.598
## 125484 -37.32986 -8.413194 561.870
## 125485 -37.32958 -8.413194 562.395
## 125486 -37.32930 -8.413194 562.551
## 125487 -37.32902 -8.413194 561.998
## 125488 -37.32875 -8.413194 561.357
## 125489 -37.32847 -8.413194 560.736
## 125490 -37.32819 -8.413194 560.423
## 125491 -37.32791 -8.413194 560.337
## 125492 -37.32763 -8.413194 560.693
## 125493 -37.32736 -8.413194 561.674
## 125494 -37.32708 -8.413194 562.733
## 125495 -37.32680 -8.413194 563.817
## 125496 -37.32652 -8.413194 564.569
## 125497 -37.32625 -8.413194 565.351
## 125498 -37.32597 -8.413194 566.170
## 125499 -37.32569 -8.413194 566.643
## 125500 -37.32541 -8.413194 567.213
## 125501 -37.32513 -8.413194 567.890
## 125502 -37.32486 -8.413194 569.020
## 125503 -37.32458 -8.413194 570.138
## 125504 -37.32430 -8.413194 571.218
## 125505 -37.32402 -8.413194 572.270
## 125506 -37.32375 -8.413194 573.262
## 125507 -37.32347 -8.413194 574.264
## 125508 -37.32319 -8.413194 575.429
## 125509 -37.32291 -8.413194 576.317
## 125510 -37.32263 -8.413194 576.788
## 125511 -37.32236 -8.413194 576.355
## 125512 -37.32208 -8.413194 575.757
## 125513 -37.32180 -8.413194 575.598
## 125514 -37.32152 -8.413194 576.227
## 125515 -37.32125 -8.413194 576.917
## 125516 -37.32097 -8.413194 577.408
## 125517 -37.32069 -8.413194 577.153
## 125518 -37.32041 -8.413194 576.893
## 125519 -37.32013 -8.413194 576.628
## 125520 -37.31986 -8.413194 576.856
## 125521 -37.31958 -8.413194 577.215
## 125522 -37.31930 -8.413194 577.482
## 125523 -37.31902 -8.413194 577.271
## 125524 -37.31875 -8.413194 576.973
## 125525 -37.31847 -8.413194 576.670
## 125526 -37.31819 -8.413194 576.979
## 125527 -37.31791 -8.413194 577.361
## 125528 -37.31763 -8.413194 577.740
## 125529 -37.31736 -8.413194 577.762
## 125530 -37.31708 -8.413194 577.464
## 125531 -37.31680 -8.413194 577.282
## 125532 -37.31652 -8.413194 577.281
## 125533 -37.31625 -8.413194 577.064
## 125534 -37.31597 -8.413194 576.237
## 125535 -37.31569 -8.413194 575.096
## 125536 -37.31541 -8.413194 573.977
## 125537 -37.31513 -8.413194 572.938
## 125538 -37.31486 -8.413194 572.356
## 125539 -37.31458 -8.413194 571.962
## 125540 -37.31430 -8.413194 571.803
## 125541 -37.31402 -8.413194 571.537
## 125542 -37.31375 -8.413194 571.175
## 125543 -37.31347 -8.413194 570.379
## 125544 -37.31319 -8.413194 569.405
## 125545 -37.31291 -8.413194 568.176
## 125546 -37.31263 -8.413194 566.907
## 125547 -37.31236 -8.413194 565.715
## 125548 -37.31208 -8.413194 564.519
## 125549 -37.31180 -8.413194 563.531
## 125550 -37.31152 -8.413194 562.963
## 125551 -37.31125 -8.413194 562.786
## 125552 -37.31097 -8.413194 563.094
## 125553 -37.31069 -8.413194 563.672
## 125554 -37.31041 -8.413194 564.473
## 125555 -37.31013 -8.413194 565.778
## 125556 -37.30986 -8.413194 567.458
## 125557 -37.30958 -8.413194 569.136
## 125558 -37.30930 -8.413194 570.551
## 125559 -37.30902 -8.413194 571.482
## 125560 -37.30875 -8.413194 572.587
## 125561 -37.30847 -8.413194 573.479
## 125562 -37.30819 -8.413194 574.849
## 125563 -37.30791 -8.413194 576.180
## 125564 -37.30763 -8.413194 577.407
## 125565 -37.30736 -8.413194 578.028
## 125566 -37.30708 -8.413194 578.460
## 125567 -37.30680 -8.413194 579.114
## 125568 -37.30652 -8.413194 580.287
## 125569 -37.30625 -8.413194 581.441
## 125570 -37.30597 -8.413194 582.362
## 125571 -37.30569 -8.413194 582.653
## 125572 -37.30541 -8.413194 582.674
## 125573 -37.30513 -8.413194 582.260
## 125574 -37.30486 -8.413194 581.647
## 125575 -37.30458 -8.413194 580.928
## 125576 -37.30430 -8.413194 580.206
## 125577 -37.30402 -8.413194 579.675
## 125578 -37.30375 -8.413194 579.089
## 125579 -37.30347 -8.413194 578.747
## 125580 -37.30319 -8.413194 578.237
## 125581 -37.30291 -8.413194 577.589
## 125582 -37.30263 -8.413194 576.722
## 125583 -37.30236 -8.413194 575.654
## 125584 -37.30208 -8.413194 574.763
## 125585 -37.30180 -8.413194 574.300
## 125586 -37.30152 -8.413194 574.316
## 125587 -37.30125 -8.413194 574.412
## 125588 -37.30097 -8.413194 574.321
## 125589 -37.30069 -8.413194 574.028
## 125590 -37.30041 -8.413194 573.814
## 125591 -37.30013 -8.413194 573.597
## 125592 -37.29986 -8.413194 573.227
## 125593 -37.29958 -8.413194 573.016
## 125594 -37.29930 -8.413194 573.209
## 125595 -37.29902 -8.413194 573.569
## 125596 -37.29875 -8.413194 574.008
## 125597 -37.29847 -8.413194 574.138
## 125598 -37.29819 -8.413194 573.706
## 125599 -37.29791 -8.413194 573.202
## 125600 -37.29763 -8.413194 572.887
## 125601 -37.29736 -8.413194 572.987
## 125602 -37.29708 -8.413194 573.052
## 125603 -37.29680 -8.413194 573.210
## 125604 -37.29652 -8.413194 573.224
## 125605 -37.29625 -8.413194 573.076
## 125606 -37.29597 -8.413194 572.821
## 125607 -37.29569 -8.413194 572.735
## 125608 -37.29541 -8.413194 572.641
## 125609 -37.29513 -8.413194 572.236
## 125610 -37.29486 -8.413194 570.758
## 125611 -37.29458 -8.413194 569.381
## 125612 -37.29430 -8.413194 568.603
## 125613 -37.29402 -8.413194 569.002
## 125614 -37.29375 -8.413194 569.492
## 125615 -37.29347 -8.413194 569.592
## 125616 -37.29319 -8.413194 568.583
## 125617 -37.29291 -8.413194 567.599
## 125618 -37.29263 -8.413194 567.088
## 125619 -37.29236 -8.413194 567.755
## 125620 -37.29208 -8.413194 568.742
## 125621 -37.29180 -8.413194 569.605
## 125622 -37.29152 -8.413194 570.000
## 125623 -37.29125 -8.413194 570.148
## 125624 -37.29097 -8.413194 570.345
## 125625 -37.29069 -8.413194 570.716
## 125626 -37.29041 -8.413194 570.690
## 125627 -37.29013 -8.413194 570.400
## 125628 -37.28986 -8.413194 569.482
## 125629 -37.28958 -8.413194 568.404
## 125630 -37.28930 -8.413194 567.025
## 125631 -37.28902 -8.413194 565.168
## 125632 -37.28875 -8.413194 563.756
## 125633 -37.28847 -8.413194 562.929
## 125634 -37.28819 -8.413194 562.655
## 125635 -37.28791 -8.413194 562.532
## 125636 -37.28763 -8.413194 562.371
## 125637 -37.28736 -8.413194 561.659
## 125638 -37.28708 -8.413194 561.283
## 125639 -37.28680 -8.413194 561.512
## 125640 -37.28652 -8.413194 562.643
## 125641 -37.28625 -8.413194 564.069
## 125642 -37.28597 -8.413194 565.671
## 125643 -37.28569 -8.413194 566.784
## 125644 -37.28541 -8.413194 567.768
## 125645 -37.28513 -8.413194 568.315
## 125646 -37.28486 -8.413194 568.349
## 125647 -37.28458 -8.413194 568.602
## 125648 -37.28430 -8.413194 569.527
## 125649 -37.28402 -8.413194 571.042
## 125650 -37.28375 -8.413194 572.434
## 125651 -37.28347 -8.413194 573.206
## 125652 -37.28319 -8.413194 573.379
## 125653 -37.28291 -8.413194 573.089
## 125654 -37.28263 -8.413194 572.132
## 125655 -37.28236 -8.413194 571.034
## 125656 -37.28208 -8.413194 569.671
## 125657 -37.28180 -8.413194 568.389
## 125658 -37.28152 -8.413194 567.121
## 125659 -37.28125 -8.413194 565.854
## 125660 -37.28097 -8.413194 565.406
## 125661 -37.28069 -8.413194 565.376
## 125662 -37.28041 -8.413194 565.602
## 125663 -37.28013 -8.413194 565.631
## 125664 -37.27986 -8.413194 565.011
## 125665 -37.27958 -8.413194 564.707
## 125666 -37.27930 -8.413194 564.450
## 125667 -37.27902 -8.413194 565.207
## 125668 -37.27875 -8.413194 566.467
## 125669 -37.27847 -8.413194 567.957
## 125670 -37.27819 -8.413194 569.265
## 125671 -37.27791 -8.413194 570.271
## 125672 -37.27763 -8.413194 571.380
## 125673 -37.27736 -8.413194 572.031
## 125674 -37.27708 -8.413194 572.378
## 125675 -37.27680 -8.413194 572.688
## 125676 -37.27652 -8.413194 573.422
## 125677 -37.27625 -8.413194 574.211
## 125678 -37.27597 -8.413194 575.177
## 125679 -37.27569 -8.413194 575.862
## 125680 -37.27541 -8.413194 576.362
## 125681 -37.27513 -8.413194 576.651
## 125682 -37.27486 -8.413194 576.443
## 125683 -37.27458 -8.413194 576.120
## 125684 -37.27430 -8.413194 575.841
## 125685 -37.27402 -8.413194 576.219
## 125686 -37.27375 -8.413194 576.671
## 125687 -37.27347 -8.413194 577.071
## 125688 -37.27319 -8.413194 576.757
## 125689 -37.27291 -8.413194 576.172
## 125690 -37.27263 -8.413194 575.516
## 125691 -37.27236 -8.413194 575.074
## 125692 -37.27208 -8.413194 574.519
## 125693 -37.27180 -8.413194 573.656
## 125694 -37.27152 -8.413194 572.554
## 125695 -37.27125 -8.413194 571.542
## 125696 -37.27097 -8.413194 570.815
## 125697 -37.27069 -8.413194 570.687
## 125698 -37.27041 -8.413194 570.695
## 125699 -37.27013 -8.413194 570.656
## 125700 -37.26986 -8.413194 570.271
## 125701 -37.26958 -8.413194 569.935
## 125702 -37.26930 -8.413194 569.785
## 125703 -37.26902 -8.413194 570.014
## 125704 -37.26875 -8.413194 570.780
## 125705 -37.26847 -8.413194 571.934
## 125706 -37.26819 -8.413194 573.130
## 125707 -37.26791 -8.413194 574.134
## 125708 -37.26763 -8.413194 575.166
## 125709 -37.26736 -8.413194 576.214
## 125710 -37.26708 -8.413194 576.828
## 125711 -37.26680 -8.413194 576.914
## 125712 -37.26652 -8.413194 576.110
## 125713 -37.26625 -8.413194 575.383
## 125714 -37.26597 -8.413194 574.796
## 125715 -37.26569 -8.413194 574.729
## 125716 -37.26541 -8.413194 574.672
## 125717 -37.26513 -8.413194 573.962
## 125718 -37.26486 -8.413194 572.323
## 125719 -37.26458 -8.413194 570.561
## 125720 -37.26430 -8.413194 568.907
## 125721 -37.26402 -8.413194 567.485
## 125722 -37.26375 -8.413194 566.282
## 125723 -37.26347 -8.413194 564.880
## 125724 -37.26319 -8.413194 564.349
## 125725 -37.26291 -8.413194 564.252
## 125726 -37.26263 -8.413194 564.489
## 125727 -37.26236 -8.413194 565.545
## 125728 -37.26208 -8.413194 567.083
## 125729 -37.26180 -8.413194 568.942
## 125730 -37.26152 -8.413194 570.809
## 125731 -37.26125 -8.413194 572.035
## 125732 -37.26097 -8.413194 572.436
## 125733 -37.26069 -8.413194 572.521
## 125734 -37.26041 -8.413194 572.253
## 125735 -37.26013 -8.413194 571.931
## 125736 -37.25986 -8.413194 571.960
## 125737 -37.25958 -8.413194 571.686
## 125738 -37.25930 -8.413194 571.360
## 125739 -37.25902 -8.413194 570.542
## 125740 -37.25875 -8.413194 569.668
## 125741 -37.25847 -8.413194 568.428
## 125742 -37.25819 -8.413194 567.497
## 125743 -37.25791 -8.413194 566.563
## 125744 -37.25763 -8.413194 565.594
## 125745 -37.25736 -8.413194 564.466
## 125746 -37.25708 -8.413194 563.546
## 125747 -37.25680 -8.413194 563.188
## 125748 -37.25652 -8.413194 563.576
## 125749 -37.25625 -8.413194 564.323
## 125750 -37.25597 -8.413194 565.168
## 125751 -37.25569 -8.413194 566.203
## 125752 -37.25541 -8.413194 566.985
## 125753 -37.25513 -8.413194 567.184
## 125754 -37.25486 -8.413194 566.498
## 125755 -37.25458 -8.413194 565.388
## 125756 -37.25430 -8.413194 564.295
## 125757 -37.25402 -8.413194 563.425
## 125758 -37.25375 -8.413194 562.564
## 125759 -37.25347 -8.413194 561.635
## 125760 -37.25319 -8.413194 561.289
## 125761 -37.25291 -8.413194 561.459
## 125762 -37.25263 -8.413194 562.361
## 125763 -37.25236 -8.413194 563.503
## 125764 -37.25208 -8.413194 564.604
## 125765 -37.25180 -8.413194 565.394
## 125766 -37.25152 -8.413194 565.474
## 125767 -37.25125 -8.413194 565.236
## 125768 -37.25097 -8.413194 564.412
## 125769 -37.25069 -8.413194 563.889
## 125770 -37.25041 -8.413194 563.647
## 125771 -37.25013 -8.413194 563.563
## 125772 -37.24986 -8.413194 563.698
## 125773 -37.24958 -8.413194 564.042
## 125774 -37.24930 -8.413194 564.781
## 125775 -37.24902 -8.413194 566.063
## 125776 -37.24875 -8.413194 567.350
## 125777 -37.24847 -8.413194 568.763
## 125778 -37.24819 -8.413194 569.512
## 125779 -37.24791 -8.413194 569.915
## 125780 -37.24763 -8.413194 570.019
## 125781 -37.24736 -8.413194 570.012
## 125782 -37.24708 -8.413194 570.222
## 125783 -37.24680 -8.413194 570.753
## 125784 -37.24652 -8.413194 571.987
## 125785 -37.24625 -8.413194 573.454
## 125786 -37.24597 -8.413194 574.947
## 125787 -37.24569 -8.413194 575.928
## 125788 -37.24541 -8.413194 576.629
## 125789 -37.24513 -8.413194 577.195
## 125790 -37.24486 -8.413194 577.975
## 125791 -37.24458 -8.413194 578.944
## 125792 -37.24430 -8.413194 580.554
## 125793 -37.24402 -8.413194 582.425
## 125794 -37.24375 -8.413194 584.074
## 125795 -37.24347 -8.413194 585.341
## 125796 -37.24319 -8.413194 586.062
## 125797 -37.24291 -8.413194 586.990
## 125798 -37.24263 -8.413194 588.129
## 125799 -37.24236 -8.413194 589.968
## 125800 -37.24208 -8.413194 592.160
## 125801 -37.24180 -8.413194 594.514
## 125802 -37.24152 -8.413194 596.278
## 125803 -37.24125 -8.413194 597.487
## 125804 -37.24097 -8.413194 598.227
## 125805 -37.24069 -8.413194 598.755
## 125806 -37.24041 -8.413194 599.188
## 125807 -37.24013 -8.413194 599.277
## 125808 -37.23986 -8.413194 599.611
## 125809 -37.23958 -8.413194 599.828
## 125810 -37.23930 -8.413194 599.988
## 125811 -37.23902 -8.413194 599.651
## 125812 -37.23875 -8.413194 599.054
## 125813 -37.23847 -8.413194 598.178
## 125814 -37.23819 -8.413194 596.859
## 125815 -37.23791 -8.413194 595.429
## 125816 -37.23763 -8.413194 594.122
## 125817 -37.23736 -8.413194 593.383
## 125818 -37.23708 -8.413194 592.773
## 125819 -37.23680 -8.413194 592.024
## 125820 -37.23652 -8.413194 591.134
## 125821 -37.23625 -8.413194 589.955
## 125822 -37.23597 -8.413194 588.819
## 125823 -37.23569 -8.413194 586.708
## 125824 -37.23541 -8.413194 584.391
## 125825 -37.23513 -8.413194 582.262
## 125826 -37.23486 -8.413194 580.802
## 125827 -37.23458 -8.413194 579.617
## 125828 -37.23430 -8.413194 578.040
## 125829 -37.23402 -8.413194 575.526
## 125830 -37.23375 -8.413194 573.911
## 125831 -37.23347 -8.413194 573.661
## 125832 -37.23319 -8.413194 574.738
## 125833 -37.23291 -8.413194 575.886
## 125834 -37.23263 -8.413194 576.789
## 125835 -37.23236 -8.413194 576.811
## 125836 -37.23208 -8.413194 576.655
## 125837 -37.23180 -8.413194 576.592
## 125838 -37.23152 -8.413194 577.419
## 125839 -37.23125 -8.413194 578.810
## 125840 -37.23097 -8.413194 580.683
## 125841 -37.23069 -8.413194 582.469
## 125842 -37.23041 -8.413194 584.154
## 125843 -37.23013 -8.413194 585.531
## 125844 -37.22986 -8.413194 586.371
## 125845 -37.22958 -8.413194 586.919
## 125846 -37.22930 -8.413194 587.563
## 125847 -37.22902 -8.413194 588.249
## 125848 -37.22875 -8.413194 588.728
## 125849 -37.22847 -8.413194 588.764
## 125850 -37.22819 -8.413194 588.410
## 125851 -37.22791 -8.413194 588.069
## 125852 -37.22763 -8.413194 587.769
## 125853 -37.22736 -8.413194 588.075
## 125854 -37.22708 -8.413194 588.577
## 125855 -37.22680 -8.413194 589.128
## 125856 -37.22652 -8.413194 589.612
## 125857 -37.22625 -8.413194 589.506
## 125858 -37.22597 -8.413194 589.407
## 125859 -37.22569 -8.413194 588.526
## 125860 -37.22541 -8.413194 587.298
## 125861 -37.22513 -8.413194 585.456
## 125862 -37.22486 -8.413194 583.433
## 125863 -37.22458 -8.413194 581.495
## 125864 -37.22430 -8.413194 579.630
## 125865 -37.22402 -8.413194 577.827
## 125866 -37.22375 -8.413194 576.294
## 125867 -37.22347 -8.413194 574.866
## 126650 -37.38236 -8.413472 514.375
## 126651 -37.38208 -8.413472 513.986
## 126706 -37.36680 -8.413472 520.281
## 126707 -37.36652 -8.413472 520.006
## 126708 -37.36625 -8.413472 520.144
## 126709 -37.36597 -8.413472 520.371
## 126710 -37.36569 -8.413472 521.348
## 126711 -37.36541 -8.413472 522.468
## 126712 -37.36513 -8.413472 523.590
## 126713 -37.36486 -8.413472 524.151
## 126714 -37.36458 -8.413472 524.622
## 126715 -37.36430 -8.413472 525.084
## 126716 -37.36402 -8.413472 525.864
## 126717 -37.36375 -8.413472 526.739
## 126718 -37.36347 -8.413472 528.121
## 126719 -37.36319 -8.413472 530.112
## 126720 -37.36291 -8.413472 532.097
## 126721 -37.36263 -8.413472 533.975
## 126722 -37.36236 -8.413472 535.256
## 126723 -37.36208 -8.413472 536.498
## 126724 -37.36180 -8.413472 537.597
## 126725 -37.36152 -8.413472 538.887
## 126726 -37.36125 -8.413472 540.353
## 126727 -37.36097 -8.413472 541.724
## 126728 -37.36069 -8.413472 543.132
## 126729 -37.36041 -8.413472 544.616
## 126730 -37.36013 -8.413472 546.445
## 126731 -37.35986 -8.413472 548.486
## 126732 -37.35958 -8.413472 550.241
## 126733 -37.35930 -8.413472 551.927
## 126734 -37.35902 -8.413472 553.214
## 126735 -37.35875 -8.413472 554.572
## 126736 -37.35847 -8.413472 555.801
## 126737 -37.35819 -8.413472 556.969
## 126738 -37.35791 -8.413472 558.271
## 126739 -37.35763 -8.413472 559.592
## 126740 -37.35736 -8.413472 560.504
## 126741 -37.35708 -8.413472 561.008
## 126742 -37.35680 -8.413472 561.241
## 126743 -37.35652 -8.413472 561.292
## 126744 -37.35625 -8.413472 561.256
## 126745 -37.35597 -8.413472 561.302
## 126746 -37.35569 -8.413472 561.625
## 126747 -37.35541 -8.413472 561.952
## 126748 -37.35513 -8.413472 562.186
## 126749 -37.35486 -8.413472 562.157
## 126750 -37.35458 -8.413472 562.042
## 126751 -37.35430 -8.413472 561.604
## 126752 -37.35402 -8.413472 561.167
## 126753 -37.35375 -8.413472 560.799
## 126754 -37.35347 -8.413472 560.504
## 126755 -37.35319 -8.413472 560.549
## 126756 -37.35291 -8.413472 560.537
## 126757 -37.35263 -8.413472 560.675
## 126758 -37.35236 -8.413472 560.757
## 126759 -37.35208 -8.413472 560.767
## 126760 -37.35180 -8.413472 560.656
## 126761 -37.35152 -8.413472 560.217
## 126762 -37.35125 -8.413472 559.992
## 126763 -37.35097 -8.413472 559.907
## 126764 -37.35069 -8.413472 560.095
## 126765 -37.35041 -8.413472 560.669
## 126766 -37.35013 -8.413472 561.708
## 126767 -37.34986 -8.413472 562.711
## 126768 -37.34958 -8.413472 563.514
## 126769 -37.34930 -8.413472 564.300
## 126770 -37.34902 -8.413472 564.930
## 126771 -37.34875 -8.413472 565.504
## 126772 -37.34847 -8.413472 565.746
## 126773 -37.34819 -8.413472 565.706
## 126774 -37.34791 -8.413472 565.763
## 126775 -37.34763 -8.413472 565.742
## 126776 -37.34736 -8.413472 565.628
## 126777 -37.34708 -8.413472 565.614
## 126778 -37.34680 -8.413472 565.748
## 126779 -37.34652 -8.413472 565.904
## 126780 -37.34625 -8.413472 565.936
## 126781 -37.34597 -8.413472 566.113
## 126782 -37.34569 -8.413472 566.414
## 126783 -37.34541 -8.413472 566.706
## 126784 -37.34513 -8.413472 566.766
## 126785 -37.34486 -8.413472 566.607
## 126786 -37.34458 -8.413472 566.498
## 126787 -37.34430 -8.413472 566.373
## 126788 -37.34402 -8.413472 566.293
## 126789 -37.34375 -8.413472 566.320
## 126790 -37.34347 -8.413472 566.433
## 126791 -37.34319 -8.413472 566.876
## 126792 -37.34291 -8.413472 567.036
## 126793 -37.34263 -8.413472 566.933
## 126794 -37.34236 -8.413472 566.694
## 126795 -37.34208 -8.413472 566.392
## 126796 -37.34180 -8.413472 565.766
## 126797 -37.34152 -8.413472 565.510
## 126798 -37.34125 -8.413472 565.281
## 126799 -37.34097 -8.413472 565.427
## 126800 -37.34069 -8.413472 565.382
## 126801 -37.34041 -8.413472 565.244
## 126802 -37.34013 -8.413472 565.200
## 126803 -37.33986 -8.413472 565.254
## 126804 -37.33958 -8.413472 565.375
## 126805 -37.33930 -8.413472 565.497
## 126806 -37.33902 -8.413472 565.501
## 126807 -37.33875 -8.413472 565.657
## 126808 -37.33847 -8.413472 565.728
## 126809 -37.33819 -8.413472 565.666
## 126810 -37.33791 -8.413472 565.523
## 126811 -37.33763 -8.413472 565.632
## 126812 -37.33736 -8.413472 565.984
## 126813 -37.33708 -8.413472 566.330
## 126814 -37.33680 -8.413472 566.533
## 126815 -37.33652 -8.413472 566.507
## 126816 -37.33625 -8.413472 566.585
## 126817 -37.33597 -8.413472 566.723
## 126818 -37.33569 -8.413472 567.313
## 126819 -37.33541 -8.413472 567.976
## 126820 -37.33513 -8.413472 568.500
## 126821 -37.33486 -8.413472 568.897
## 126822 -37.33458 -8.413472 569.109
## 126823 -37.33430 -8.413472 569.013
## 126824 -37.33402 -8.413472 569.000
## 126825 -37.33375 -8.413472 568.871
## 126826 -37.33347 -8.413472 568.752
## 126827 -37.33319 -8.413472 568.398
## 126828 -37.33291 -8.413472 567.757
## 126829 -37.33263 -8.413472 567.068
## 126830 -37.33236 -8.413472 566.715
## 126831 -37.33208 -8.413472 566.423
## 126832 -37.33180 -8.413472 566.221
## 126833 -37.33152 -8.413472 566.067
## 126834 -37.33125 -8.413472 565.983
## 126835 -37.33097 -8.413472 565.850
## 126836 -37.33069 -8.413472 565.306
## 126837 -37.33041 -8.413472 564.768
## 126838 -37.33013 -8.413472 564.299
## 126839 -37.32986 -8.413472 564.001
## 126840 -37.32958 -8.413472 563.869
## 126841 -37.32930 -8.413472 563.656
## 126842 -37.32902 -8.413472 562.936
## 126843 -37.32875 -8.413472 562.105
## 126844 -37.32847 -8.413472 561.286
## 126845 -37.32819 -8.413472 561.139
## 126846 -37.32791 -8.413472 561.392
## 126847 -37.32763 -8.413472 561.923
## 126848 -37.32736 -8.413472 562.724
## 126849 -37.32708 -8.413472 563.607
## 126850 -37.32680 -8.413472 564.622
## 126851 -37.32652 -8.413472 565.156
## 126852 -37.32625 -8.413472 565.613
## 126853 -37.32597 -8.413472 566.058
## 126854 -37.32569 -8.413472 567.407
## 126855 -37.32541 -8.413472 568.958
## 126856 -37.32513 -8.413472 570.377
## 126857 -37.32486 -8.413472 571.095
## 126858 -37.32458 -8.413472 571.761
## 126859 -37.32430 -8.413472 572.521
## 126860 -37.32402 -8.413472 573.562
## 126861 -37.32375 -8.413472 574.459
## 126862 -37.32347 -8.413472 575.350
## 126863 -37.32319 -8.413472 576.322
## 126864 -37.32291 -8.413472 577.099
## 126865 -37.32263 -8.413472 577.300
## 126866 -37.32236 -8.413472 577.033
## 126867 -37.32208 -8.413472 576.698
## 126868 -37.32180 -8.413472 576.750
## 126869 -37.32152 -8.413472 577.213
## 126870 -37.32125 -8.413472 577.693
## 126871 -37.32097 -8.413472 578.201
## 126872 -37.32069 -8.413472 578.078
## 126873 -37.32041 -8.413472 577.958
## 126874 -37.32013 -8.413472 577.670
## 126875 -37.31986 -8.413472 578.002
## 126876 -37.31958 -8.413472 578.454
## 126877 -37.31930 -8.413472 578.714
## 126878 -37.31902 -8.413472 578.176
## 126879 -37.31875 -8.413472 577.564
## 126880 -37.31847 -8.413472 576.972
## 126881 -37.31819 -8.413472 577.477
## 126882 -37.31791 -8.413472 578.062
## 126883 -37.31763 -8.413472 578.633
## 126884 -37.31736 -8.413472 578.564
## 126885 -37.31708 -8.413472 578.205
## 126886 -37.31680 -8.413472 577.950
## 126887 -37.31652 -8.413472 578.057
## 126888 -37.31625 -8.413472 577.935
## 126889 -37.31597 -8.413472 577.058
## 126890 -37.31569 -8.413472 575.886
## 126891 -37.31541 -8.413472 574.752
## 126892 -37.31513 -8.413472 573.693
## 126893 -37.31486 -8.413472 572.790
## 126894 -37.31458 -8.413472 571.966
## 126895 -37.31430 -8.413472 571.510
## 126896 -37.31402 -8.413472 571.209
## 126897 -37.31375 -8.413472 570.754
## 126898 -37.31347 -8.413472 569.884
## 126899 -37.31319 -8.413472 568.922
## 126900 -37.31291 -8.413472 567.800
## 126901 -37.31263 -8.413472 566.802
## 126902 -37.31236 -8.413472 565.607
## 126903 -37.31208 -8.413472 564.518
## 126904 -37.31180 -8.413472 563.686
## 126905 -37.31152 -8.413472 563.833
## 126906 -37.31125 -8.413472 564.428
## 126907 -37.31097 -8.413472 565.148
## 126908 -37.31069 -8.413472 565.824
## 126909 -37.31041 -8.413472 566.620
## 126910 -37.31013 -8.413472 567.949
## 126911 -37.30986 -8.413472 569.195
## 126912 -37.30958 -8.413472 570.414
## 126913 -37.30930 -8.413472 571.552
## 126914 -37.30902 -8.413472 572.441
## 126915 -37.30875 -8.413472 573.492
## 126916 -37.30847 -8.413472 574.357
## 126917 -37.30819 -8.413472 576.019
## 126918 -37.30791 -8.413472 577.757
## 126919 -37.30763 -8.413472 579.172
## 126920 -37.30736 -8.413472 579.874
## 126921 -37.30708 -8.413472 580.350
## 126922 -37.30680 -8.413472 581.077
## 126923 -37.30652 -8.413472 582.056
## 126924 -37.30625 -8.413472 582.932
## 126925 -37.30597 -8.413472 583.629
## 126926 -37.30569 -8.413472 583.888
## 126927 -37.30541 -8.413472 583.862
## 126928 -37.30513 -8.413472 583.445
## 126929 -37.30486 -8.413472 583.028
## 126930 -37.30458 -8.413472 582.568
## 126931 -37.30430 -8.413472 582.024
## 126932 -37.30402 -8.413472 581.695
## 126933 -37.30375 -8.413472 581.266
## 126934 -37.30347 -8.413472 581.026
## 126935 -37.30319 -8.413472 580.336
## 126936 -37.30291 -8.413472 579.426
## 126937 -37.30263 -8.413472 578.245
## 126938 -37.30236 -8.413472 577.257
## 126939 -37.30208 -8.413472 576.370
## 126940 -37.30180 -8.413472 575.876
## 126941 -37.30152 -8.413472 575.355
## 126942 -37.30125 -8.413472 574.986
## 126943 -37.30097 -8.413472 574.598
## 126944 -37.30069 -8.413472 574.140
## 126945 -37.30041 -8.413472 573.857
## 126946 -37.30013 -8.413472 573.475
## 126947 -37.29986 -8.413472 573.601
## 126948 -37.29958 -8.413472 573.880
## 126949 -37.29930 -8.413472 574.368
## 126950 -37.29902 -8.413472 574.507
## 126951 -37.29875 -8.413472 574.531
## 126952 -37.29847 -8.413472 574.354
## 126953 -37.29819 -8.413472 574.506
## 126954 -37.29791 -8.413472 574.627
## 126955 -37.29763 -8.413472 574.673
## 126956 -37.29736 -8.413472 574.777
## 126957 -37.29708 -8.413472 574.888
## 126958 -37.29680 -8.413472 575.073
## 126959 -37.29652 -8.413472 574.974
## 126960 -37.29625 -8.413472 574.545
## 126961 -37.29597 -8.413472 574.158
## 126962 -37.29569 -8.413472 573.654
## 126963 -37.29541 -8.413472 573.035
## 126964 -37.29513 -8.413472 572.097
## 126965 -37.29486 -8.413472 571.471
## 126966 -37.29458 -8.413472 571.060
## 126967 -37.29430 -8.413472 570.911
## 126968 -37.29402 -8.413472 570.908
## 126969 -37.29375 -8.413472 571.054
## 126970 -37.29347 -8.413472 571.032
## 126971 -37.29319 -8.413472 570.042
## 126972 -37.29291 -8.413472 569.029
## 126973 -37.29263 -8.413472 568.451
## 126974 -37.29236 -8.413472 569.262
## 126975 -37.29208 -8.413472 570.191
## 126976 -37.29180 -8.413472 570.912
## 126977 -37.29152 -8.413472 571.265
## 126978 -37.29125 -8.413472 571.346
## 126979 -37.29097 -8.413472 571.645
## 126980 -37.29069 -8.413472 571.569
## 126981 -37.29041 -8.413472 571.189
## 126982 -37.29013 -8.413472 570.703
## 126983 -37.28986 -8.413472 569.860
## 126984 -37.28958 -8.413472 568.810
## 126985 -37.28930 -8.413472 567.457
## 126986 -37.28902 -8.413472 565.653
## 126987 -37.28875 -8.413472 564.472
## 126988 -37.28847 -8.413472 563.790
## 126989 -37.28819 -8.413472 563.294
## 126990 -37.28791 -8.413472 562.868
## 126991 -37.28763 -8.413472 562.450
## 126992 -37.28736 -8.413472 561.917
## 126993 -37.28708 -8.413472 561.702
## 126994 -37.28680 -8.413472 561.796
## 126995 -37.28652 -8.413472 562.884
## 126996 -37.28625 -8.413472 564.191
## 126997 -37.28597 -8.413472 565.713
## 126998 -37.28569 -8.413472 566.183
## 126999 -37.28541 -8.413472 566.321
## 127000 -37.28513 -8.413472 566.279
## 127001 -37.28486 -8.413472 566.950
## 127002 -37.28458 -8.413472 567.657
## 127003 -37.28430 -8.413472 569.158
## 127004 -37.28402 -8.413472 570.422
## 127005 -37.28375 -8.413472 571.746
## 127006 -37.28347 -8.413472 572.584
## 127007 -37.28319 -8.413472 572.906
## 127008 -37.28291 -8.413472 572.846
## 127009 -37.28263 -8.413472 572.133
## 127010 -37.28236 -8.413472 571.227
## 127011 -37.28208 -8.413472 570.099
## 127012 -37.28180 -8.413472 568.938
## 127013 -37.28152 -8.413472 567.975
## 127014 -37.28125 -8.413472 566.966
## 127015 -37.28097 -8.413472 566.597
## 127016 -37.28069 -8.413472 566.261
## 127017 -37.28041 -8.413472 566.010
## 127018 -37.28013 -8.413472 565.592
## 127019 -37.27986 -8.413472 564.907
## 127020 -37.27958 -8.413472 564.387
## 127021 -37.27930 -8.413472 564.115
## 127022 -37.27902 -8.413472 564.428
## 127023 -37.27875 -8.413472 565.298
## 127024 -37.27847 -8.413472 566.634
## 127025 -37.27819 -8.413472 568.178
## 127026 -37.27791 -8.413472 569.635
## 127027 -37.27763 -8.413472 570.988
## 127028 -37.27736 -8.413472 571.902
## 127029 -37.27708 -8.413472 572.590
## 127030 -37.27680 -8.413472 573.227
## 127031 -37.27652 -8.413472 573.820
## 127032 -37.27625 -8.413472 574.538
## 127033 -37.27597 -8.413472 575.263
## 127034 -37.27569 -8.413472 576.109
## 127035 -37.27541 -8.413472 576.795
## 127036 -37.27513 -8.413472 577.149
## 127037 -37.27486 -8.413472 576.927
## 127038 -37.27458 -8.413472 576.561
## 127039 -37.27430 -8.413472 576.409
## 127040 -37.27402 -8.413472 576.569
## 127041 -37.27375 -8.413472 576.800
## 127042 -37.27347 -8.413472 577.079
## 127043 -37.27319 -8.413472 576.997
## 127044 -37.27291 -8.413472 576.753
## 127045 -37.27263 -8.413472 576.334
## 127046 -37.27236 -8.413472 575.581
## 127047 -37.27208 -8.413472 574.841
## 127048 -37.27180 -8.413472 573.797
## 127049 -37.27152 -8.413472 572.893
## 127050 -37.27125 -8.413472 572.043
## 127051 -37.27097 -8.413472 571.427
## 127052 -37.27069 -8.413472 571.243
## 127053 -37.27041 -8.413472 571.245
## 127054 -37.27013 -8.413472 571.247
## 127055 -37.26986 -8.413472 570.918
## 127056 -37.26958 -8.413472 570.518
## 127057 -37.26930 -8.413472 570.396
## 127058 -37.26902 -8.413472 570.637
## 127059 -37.26875 -8.413472 571.383
## 127060 -37.26847 -8.413472 572.475
## 127061 -37.26819 -8.413472 573.906
## 127062 -37.26791 -8.413472 575.270
## 127063 -37.26763 -8.413472 576.634
## 127064 -37.26736 -8.413472 577.037
## 127065 -37.26708 -8.413472 577.043
## 127066 -37.26680 -8.413472 576.597
## 127067 -37.26652 -8.413472 576.226
## 127068 -37.26625 -8.413472 575.789
## 127069 -37.26597 -8.413472 575.315
## 127070 -37.26569 -8.413472 574.921
## 127071 -37.26541 -8.413472 574.390
## 127072 -37.26513 -8.413472 573.471
## 127073 -37.26486 -8.413472 572.107
## 127074 -37.26458 -8.413472 570.488
## 127075 -37.26430 -8.413472 569.151
## 127076 -37.26402 -8.413472 567.972
## 127077 -37.26375 -8.413472 567.048
## 127078 -37.26347 -8.413472 566.208
## 127079 -37.26319 -8.413472 565.234
## 127080 -37.26291 -8.413472 564.468
## 127081 -37.26263 -8.413472 564.417
## 127082 -37.26236 -8.413472 565.235
## 127083 -37.26208 -8.413472 566.533
## 127084 -37.26180 -8.413472 568.269
## 127085 -37.26152 -8.413472 570.438
## 127086 -37.26125 -8.413472 572.203
## 127087 -37.26097 -8.413472 572.844
## 127088 -37.26069 -8.413472 573.175
## 127089 -37.26041 -8.413472 573.155
## 127090 -37.26013 -8.413472 573.057
## 127091 -37.25986 -8.413472 572.521
## 127092 -37.25958 -8.413472 571.540
## 127093 -37.25930 -8.413472 570.814
## 127094 -37.25902 -8.413472 570.032
## 127095 -37.25875 -8.413472 569.167
## 127096 -37.25847 -8.413472 567.883
## 127097 -37.25819 -8.413472 567.116
## 127098 -37.25791 -8.413472 566.458
## 127099 -37.25763 -8.413472 565.772
## 127100 -37.25736 -8.413472 564.503
## 127101 -37.25708 -8.413472 563.538
## 127102 -37.25680 -8.413472 563.288
## 127103 -37.25652 -8.413472 563.975
## 127104 -37.25625 -8.413472 565.126
## 127105 -37.25597 -8.413472 566.266
## 127106 -37.25569 -8.413472 567.010
## 127107 -37.25541 -8.413472 567.426
## 127108 -37.25513 -8.413472 567.305
## 127109 -37.25486 -8.413472 567.020
## 127110 -37.25458 -8.413472 566.111
## 127111 -37.25430 -8.413472 565.331
## 127112 -37.25402 -8.413472 564.248
## 127113 -37.25375 -8.413472 563.063
## 127114 -37.25347 -8.413472 562.016
## 127115 -37.25319 -8.413472 561.647
## 127116 -37.25291 -8.413472 561.897
## 127117 -37.25263 -8.413472 562.677
## 127118 -37.25236 -8.413472 564.169
## 127119 -37.25208 -8.413472 565.535
## 127120 -37.25180 -8.413472 566.526
## 127121 -37.25152 -8.413472 565.997
## 127122 -37.25125 -8.413472 565.076
## 127123 -37.25097 -8.413472 563.883
## 127124 -37.25069 -8.413472 563.427
## 127125 -37.25041 -8.413472 563.268
## 127126 -37.25013 -8.413472 563.170
## 127127 -37.24986 -8.413472 563.205
## 127128 -37.24958 -8.413472 563.538
## 127129 -37.24930 -8.413472 564.339
## 127130 -37.24902 -8.413472 565.502
## 127131 -37.24875 -8.413472 566.737
## 127132 -37.24847 -8.413472 568.186
## 127133 -37.24819 -8.413472 568.974
## 127134 -37.24791 -8.413472 569.479
## 127135 -37.24763 -8.413472 569.688
## 127136 -37.24736 -8.413472 569.814
## 127137 -37.24708 -8.413472 570.145
## 127138 -37.24680 -8.413472 570.760
## 127139 -37.24652 -8.413472 572.170
## 127140 -37.24625 -8.413472 573.794
## 127141 -37.24597 -8.413472 575.431
## 127142 -37.24569 -8.413472 576.203
## 127143 -37.24541 -8.413472 576.681
## 127144 -37.24513 -8.413472 577.104
## 127145 -37.24486 -8.413472 578.096
## 127146 -37.24458 -8.413472 579.154
## 127147 -37.24430 -8.413472 580.862
## 127148 -37.24402 -8.413472 582.849
## 127149 -37.24375 -8.413472 584.578
## 127150 -37.24347 -8.413472 585.890
## 127151 -37.24319 -8.413472 586.211
## 127152 -37.24291 -8.413472 586.595
## 127153 -37.24263 -8.413472 587.283
## 127154 -37.24236 -8.413472 589.485
## 127155 -37.24208 -8.413472 591.899
## 127156 -37.24180 -8.413472 594.519
## 127157 -37.24152 -8.413472 595.988
## 127158 -37.24125 -8.413472 597.071
## 127159 -37.24097 -8.413472 597.636
## 127160 -37.24069 -8.413472 598.419
## 127161 -37.24041 -8.413472 598.937
## 127162 -37.24013 -8.413472 599.255
## 127163 -37.23986 -8.413472 598.868
## 127164 -37.23958 -8.413472 598.534
## 127165 -37.23930 -8.413472 598.163
## 127166 -37.23902 -8.413472 598.427
## 127167 -37.23875 -8.413472 598.418
## 127168 -37.23847 -8.413472 597.845
## 127169 -37.23819 -8.413472 596.510
## 127170 -37.23791 -8.413472 595.045
## 127171 -37.23763 -8.413472 593.690
## 127172 -37.23736 -8.413472 592.985
## 127173 -37.23708 -8.413472 592.337
## 127174 -37.23680 -8.413472 591.547
## 127175 -37.23652 -8.413472 590.388
## 127176 -37.23625 -8.413472 588.865
## 127177 -37.23597 -8.413472 587.651
## 127178 -37.23569 -8.413472 585.830
## 127179 -37.23541 -8.413472 584.023
## 127180 -37.23513 -8.413472 582.243
## 127181 -37.23486 -8.413472 580.513
## 127182 -37.23458 -8.413472 579.293
## 127183 -37.23430 -8.413472 577.449
## 127184 -37.23402 -8.413472 575.115
## 127185 -37.23375 -8.413472 573.734
## 127186 -37.23347 -8.413472 573.697
## 127187 -37.23319 -8.413472 575.203
## 127188 -37.23291 -8.413472 576.923
## 127189 -37.23263 -8.413472 578.224
## 127190 -37.23236 -8.413472 577.758
## 127191 -37.23208 -8.413472 577.059
## 127192 -37.23180 -8.413472 576.616
## 127193 -37.23152 -8.413472 577.663
## 127194 -37.23125 -8.413472 579.152
## 127195 -37.23097 -8.413472 581.107
## 127196 -37.23069 -8.413472 582.693
## 127197 -37.23041 -8.413472 584.143
## 127198 -37.23013 -8.413472 585.383
## 127199 -37.22986 -8.413472 586.585
## 127200 -37.22958 -8.413472 587.570
## 127201 -37.22930 -8.413472 588.421
## 127202 -37.22902 -8.413472 589.047
## 127203 -37.22875 -8.413472 589.507
## 127204 -37.22847 -8.413472 589.492
## 127205 -37.22819 -8.413472 589.004
## 127206 -37.22791 -8.413472 588.424
## 127207 -37.22763 -8.413472 587.929
## 127208 -37.22736 -8.413472 588.191
## 127209 -37.22708 -8.413472 588.546
## 127210 -37.22680 -8.413472 589.264
## 127211 -37.22652 -8.413472 589.785
## 127212 -37.22625 -8.413472 589.777
## 127213 -37.22597 -8.413472 589.671
## 127214 -37.22569 -8.413472 588.863
## 127215 -37.22541 -8.413472 587.590
## 127216 -37.22513 -8.413472 585.757
## 127217 -37.22486 -8.413472 583.462
## 127218 -37.22458 -8.413472 581.276
## 127219 -37.22430 -8.413472 579.273
## 127220 -37.22402 -8.413472 577.747
## 127221 -37.22375 -8.413472 576.462
## 127222 -37.22347 -8.413472 575.160
## 127223 -37.22319 -8.413472 573.702
## 128005 -37.38236 -8.413750 514.783
## 128006 -37.38208 -8.413750 514.476
## 128007 -37.38180 -8.413750 514.105
## 128008 -37.38152 -8.413750 514.488
## 128009 -37.38125 -8.413750 514.852
## 128061 -37.36680 -8.413750 519.673
## 128062 -37.36652 -8.413750 519.649
## 128063 -37.36625 -8.413750 520.057
## 128064 -37.36597 -8.413750 520.743
## 128065 -37.36569 -8.413750 522.225
## 128066 -37.36541 -8.413750 523.756
## 128067 -37.36513 -8.413750 525.029
## 128068 -37.36486 -8.413750 525.729
## 128069 -37.36458 -8.413750 526.109
## 128070 -37.36430 -8.413750 526.569
## 128071 -37.36402 -8.413750 526.935
## 128072 -37.36375 -8.413750 527.712
## 128073 -37.36347 -8.413750 528.857
## 128074 -37.36319 -8.413750 530.733
## 128075 -37.36291 -8.413750 532.764
## 128076 -37.36263 -8.413750 534.691
## 128077 -37.36236 -8.413750 536.099
## 128078 -37.36208 -8.413750 537.336
## 128079 -37.36180 -8.413750 538.461
## 128080 -37.36152 -8.413750 540.041
## 128081 -37.36125 -8.413750 541.550
## 128082 -37.36097 -8.413750 543.130
## 128083 -37.36069 -8.413750 544.312
## 128084 -37.36041 -8.413750 545.606
## 128085 -37.36013 -8.413750 547.045
## 128086 -37.35986 -8.413750 548.795
## 128087 -37.35958 -8.413750 550.615
## 128088 -37.35930 -8.413750 552.311
## 128089 -37.35902 -8.413750 553.916
## 128090 -37.35875 -8.413750 555.311
## 128091 -37.35847 -8.413750 556.621
## 128092 -37.35819 -8.413750 558.021
## 128093 -37.35791 -8.413750 559.302
## 128094 -37.35763 -8.413750 560.347
## 128095 -37.35736 -8.413750 561.095
## 128096 -37.35708 -8.413750 561.530
## 128097 -37.35680 -8.413750 561.648
## 128098 -37.35652 -8.413750 561.629
## 128099 -37.35625 -8.413750 561.523
## 128100 -37.35597 -8.413750 561.576
## 128101 -37.35569 -8.413750 561.898
## 128102 -37.35541 -8.413750 562.367
## 128103 -37.35513 -8.413750 562.778
## 128104 -37.35486 -8.413750 562.949
## 128105 -37.35458 -8.413750 562.951
## 128106 -37.35430 -8.413750 562.753
## 128107 -37.35402 -8.413750 562.435
## 128108 -37.35375 -8.413750 562.069
## 128109 -37.35347 -8.413750 561.765
## 128110 -37.35319 -8.413750 561.683
## 128111 -37.35291 -8.413750 561.698
## 128112 -37.35263 -8.413750 561.779
## 128113 -37.35236 -8.413750 561.874
## 128114 -37.35208 -8.413750 561.917
## 128115 -37.35180 -8.413750 561.836
## 128116 -37.35152 -8.413750 561.580
## 128117 -37.35125 -8.413750 561.315
## 128118 -37.35097 -8.413750 561.232
## 128119 -37.35069 -8.413750 561.471
## 128120 -37.35041 -8.413750 561.968
## 128121 -37.35013 -8.413750 562.636
## 128122 -37.34986 -8.413750 563.331
## 128123 -37.34958 -8.413750 564.056
## 128124 -37.34930 -8.413750 564.656
## 128125 -37.34902 -8.413750 565.527
## 128126 -37.34875 -8.413750 566.181
## 128127 -37.34847 -8.413750 566.672
## 128128 -37.34819 -8.413750 567.026
## 128129 -37.34791 -8.413750 567.221
## 128130 -37.34763 -8.413750 567.283
## 128131 -37.34736 -8.413750 567.210
## 128132 -37.34708 -8.413750 567.085
## 128133 -37.34680 -8.413750 567.045
## 128134 -37.34652 -8.413750 566.864
## 128135 -37.34625 -8.413750 566.859
## 128136 -37.34597 -8.413750 566.966
## 128137 -37.34569 -8.413750 567.358
## 128138 -37.34541 -8.413750 567.749
## 128139 -37.34513 -8.413750 567.987
## 128140 -37.34486 -8.413750 567.921
## 128141 -37.34458 -8.413750 567.720
## 128142 -37.34430 -8.413750 567.552
## 128143 -37.34402 -8.413750 567.361
## 128144 -37.34375 -8.413750 567.323
## 128145 -37.34347 -8.413750 567.436
## 128146 -37.34319 -8.413750 567.607
## 128147 -37.34291 -8.413750 567.818
## 128148 -37.34263 -8.413750 567.940
## 128149 -37.34236 -8.413750 567.907
## 128150 -37.34208 -8.413750 567.748
## 128151 -37.34180 -8.413750 567.484
## 128152 -37.34152 -8.413750 567.111
## 128153 -37.34125 -8.413750 566.733
## 128154 -37.34097 -8.413750 566.547
## 128155 -37.34069 -8.413750 566.135
## 128156 -37.34041 -8.413750 565.960
## 128157 -37.34013 -8.413750 565.902
## 128158 -37.33986 -8.413750 565.965
## 128159 -37.33958 -8.413750 566.130
## 128160 -37.33930 -8.413750 566.375
## 128161 -37.33902 -8.413750 566.691
## 128162 -37.33875 -8.413750 566.982
## 128163 -37.33847 -8.413750 567.081
## 128164 -37.33819 -8.413750 567.002
## 128165 -37.33791 -8.413750 566.826
## 128166 -37.33763 -8.413750 566.721
## 128167 -37.33736 -8.413750 567.023
## 128168 -37.33708 -8.413750 567.378
## 128169 -37.33680 -8.413750 567.592
## 128170 -37.33652 -8.413750 567.775
## 128171 -37.33625 -8.413750 567.868
## 128172 -37.33597 -8.413750 567.921
## 128173 -37.33569 -8.413750 568.575
## 128174 -37.33541 -8.413750 569.202
## 128175 -37.33513 -8.413750 569.847
## 128176 -37.33486 -8.413750 570.415
## 128177 -37.33458 -8.413750 570.847
## 128178 -37.33430 -8.413750 571.044
## 128179 -37.33402 -8.413750 570.934
## 128180 -37.33375 -8.413750 570.611
## 128181 -37.33347 -8.413750 570.246
## 128182 -37.33319 -8.413750 569.500
## 128183 -37.33291 -8.413750 568.863
## 128184 -37.33263 -8.413750 568.328
## 128185 -37.33236 -8.413750 568.111
## 128186 -37.33208 -8.413750 568.056
## 128187 -37.33180 -8.413750 568.036
## 128188 -37.33152 -8.413750 568.173
## 128189 -37.33125 -8.413750 568.179
## 128190 -37.33097 -8.413750 567.941
## 128191 -37.33069 -8.413750 567.630
## 128192 -37.33041 -8.413750 567.135
## 128193 -37.33013 -8.413750 566.542
## 128194 -37.32986 -8.413750 566.389
## 128195 -37.32958 -8.413750 566.081
## 128196 -37.32930 -8.413750 565.578
## 128197 -37.32902 -8.413750 564.647
## 128198 -37.32875 -8.413750 563.703
## 128199 -37.32847 -8.413750 562.953
## 128200 -37.32819 -8.413750 562.862
## 128201 -37.32791 -8.413750 563.130
## 128202 -37.32763 -8.413750 563.685
## 128203 -37.32736 -8.413750 564.415
## 128204 -37.32708 -8.413750 565.177
## 128205 -37.32680 -8.413750 565.829
## 128206 -37.32652 -8.413750 566.067
## 128207 -37.32625 -8.413750 566.443
## 128208 -37.32597 -8.413750 567.125
## 128209 -37.32569 -8.413750 568.830
## 128210 -37.32541 -8.413750 570.688
## 128211 -37.32513 -8.413750 572.325
## 128212 -37.32486 -8.413750 573.164
## 128213 -37.32458 -8.413750 573.692
## 128214 -37.32430 -8.413750 574.115
## 128215 -37.32402 -8.413750 574.726
## 128216 -37.32375 -8.413750 575.443
## 128217 -37.32347 -8.413750 576.172
## 128218 -37.32319 -8.413750 577.047
## 128219 -37.32291 -8.413750 577.730
## 128220 -37.32263 -8.413750 578.119
## 128221 -37.32236 -8.413750 577.959
## 128222 -37.32208 -8.413750 577.701
## 128223 -37.32180 -8.413750 577.715
## 128224 -37.32152 -8.413750 578.046
## 128225 -37.32125 -8.413750 578.570
## 128226 -37.32097 -8.413750 578.933
## 128227 -37.32069 -8.413750 579.055
## 128228 -37.32041 -8.413750 579.019
## 128229 -37.32013 -8.413750 579.089
## 128230 -37.31986 -8.413750 579.586
## 128231 -37.31958 -8.413750 580.020
## 128232 -37.31930 -8.413750 580.185
## 128233 -37.31902 -8.413750 579.362
## 128234 -37.31875 -8.413750 578.549
## 128235 -37.31847 -8.413750 577.992
## 128236 -37.31819 -8.413750 578.228
## 128237 -37.31791 -8.413750 578.727
## 128238 -37.31763 -8.413750 579.129
## 128239 -37.31736 -8.413750 578.935
## 128240 -37.31708 -8.413750 578.567
## 128241 -37.31680 -8.413750 578.153
## 128242 -37.31652 -8.413750 578.136
## 128243 -37.31625 -8.413750 578.053
## 128244 -37.31597 -8.413750 577.494
## 128245 -37.31569 -8.413750 576.783
## 128246 -37.31541 -8.413750 575.634
## 128247 -37.31513 -8.413750 574.354
## 128248 -37.31486 -8.413750 573.370
## 128249 -37.31458 -8.413750 572.447
## 128250 -37.31430 -8.413750 571.698
## 128251 -37.31402 -8.413750 571.058
## 128252 -37.31375 -8.413750 570.445
## 128253 -37.31347 -8.413750 569.745
## 128254 -37.31319 -8.413750 568.783
## 128255 -37.31291 -8.413750 567.721
## 128256 -37.31263 -8.413750 566.611
## 128257 -37.31236 -8.413750 565.469
## 128258 -37.31208 -8.413750 564.615
## 128259 -37.31180 -8.413750 564.233
## 128260 -37.31152 -8.413750 564.847
## 128261 -37.31125 -8.413750 565.756
## 128262 -37.31097 -8.413750 566.908
## 128263 -37.31069 -8.413750 567.557
## 128264 -37.31041 -8.413750 568.292
## 128265 -37.31013 -8.413750 569.092
## 128266 -37.30986 -8.413750 569.982
## 128267 -37.30958 -8.413750 570.955
## 128268 -37.30930 -8.413750 571.787
## 128269 -37.30902 -8.413750 572.960
## 128270 -37.30875 -8.413750 574.124
## 128271 -37.30847 -8.413750 575.300
## 128272 -37.30819 -8.413750 577.442
## 128273 -37.30791 -8.413750 579.359
## 128274 -37.30763 -8.413750 580.943
## 128275 -37.30736 -8.413750 581.782
## 128276 -37.30708 -8.413750 582.343
## 128277 -37.30680 -8.413750 582.954
## 128278 -37.30652 -8.413750 583.701
## 128279 -37.30625 -8.413750 584.453
## 128280 -37.30597 -8.413750 584.983
## 128281 -37.30569 -8.413750 585.200
## 128282 -37.30541 -8.413750 585.144
## 128283 -37.30513 -8.413750 584.934
## 128284 -37.30486 -8.413750 584.707
## 128285 -37.30458 -8.413750 584.424
## 128286 -37.30430 -8.413750 584.090
## 128287 -37.30402 -8.413750 583.744
## 128288 -37.30375 -8.413750 583.307
## 128289 -37.30347 -8.413750 582.905
## 128290 -37.30319 -8.413750 581.893
## 128291 -37.30291 -8.413750 580.897
## 128292 -37.30263 -8.413750 579.789
## 128293 -37.30236 -8.413750 578.695
## 128294 -37.30208 -8.413750 577.627
## 128295 -37.30180 -8.413750 576.626
## 128296 -37.30152 -8.413750 575.969
## 128297 -37.30125 -8.413750 575.373
## 128298 -37.30097 -8.413750 574.692
## 128299 -37.30069 -8.413750 574.328
## 128300 -37.30041 -8.413750 573.970
## 128301 -37.30013 -8.413750 573.889
## 128302 -37.29986 -8.413750 574.285
## 128303 -37.29958 -8.413750 574.823
## 128304 -37.29930 -8.413750 575.342
## 128305 -37.29902 -8.413750 575.371
## 128306 -37.29875 -8.413750 575.383
## 128307 -37.29847 -8.413750 575.369
## 128308 -37.29819 -8.413750 575.698
## 128309 -37.29791 -8.413750 576.027
## 128310 -37.29763 -8.413750 576.316
## 128311 -37.29736 -8.413750 576.487
## 128312 -37.29708 -8.413750 576.549
## 128313 -37.29680 -8.413750 576.449
## 128314 -37.29652 -8.413750 576.176
## 128315 -37.29625 -8.413750 575.682
## 128316 -37.29597 -8.413750 574.864
## 128317 -37.29569 -8.413750 574.213
## 128318 -37.29541 -8.413750 573.407
## 128319 -37.29513 -8.413750 572.836
## 128320 -37.29486 -8.413750 572.546
## 128321 -37.29458 -8.413750 572.551
## 128322 -37.29430 -8.413750 572.509
## 128323 -37.29402 -8.413750 572.917
## 128324 -37.29375 -8.413750 572.984
## 128325 -37.29347 -8.413750 572.939
## 128326 -37.29319 -8.413750 571.799
## 128327 -37.29291 -8.413750 570.883
## 128328 -37.29263 -8.413750 570.447
## 128329 -37.29236 -8.413750 571.022
## 128330 -37.29208 -8.413750 571.891
## 128331 -37.29180 -8.413750 572.731
## 128332 -37.29152 -8.413750 572.716
## 128333 -37.29125 -8.413750 572.520
## 128334 -37.29097 -8.413750 572.272
## 128335 -37.29069 -8.413750 571.710
## 128336 -37.29041 -8.413750 571.163
## 128337 -37.29013 -8.413750 570.479
## 128338 -37.28986 -8.413750 569.615
## 128339 -37.28958 -8.413750 568.625
## 128340 -37.28930 -8.413750 567.581
## 128341 -37.28902 -8.413750 566.370
## 128342 -37.28875 -8.413750 565.283
## 128343 -37.28847 -8.413750 564.388
## 128344 -37.28819 -8.413750 563.752
## 128345 -37.28791 -8.413750 563.279
## 128346 -37.28763 -8.413750 562.847
## 128347 -37.28736 -8.413750 562.283
## 128348 -37.28708 -8.413750 561.963
## 128349 -37.28680 -8.413750 562.190
## 128350 -37.28652 -8.413750 563.107
## 128351 -37.28625 -8.413750 564.217
## 128352 -37.28597 -8.413750 565.267
## 128353 -37.28569 -8.413750 565.187
## 128354 -37.28541 -8.413750 565.060
## 128355 -37.28513 -8.413750 565.112
## 128356 -37.28486 -8.413750 565.821
## 128357 -37.28458 -8.413750 566.866
## 128358 -37.28430 -8.413750 568.006
## 128359 -37.28402 -8.413750 569.617
## 128360 -37.28375 -8.413750 570.996
## 128361 -37.28347 -8.413750 571.953
## 128362 -37.28319 -8.413750 572.700
## 128363 -37.28291 -8.413750 572.857
## 128364 -37.28263 -8.413750 572.573
## 128365 -37.28236 -8.413750 571.912
## 128366 -37.28208 -8.413750 570.967
## 128367 -37.28180 -8.413750 570.077
## 128368 -37.28152 -8.413750 568.753
## 128369 -37.28125 -8.413750 567.716
## 128370 -37.28097 -8.413750 566.961
## 128371 -37.28069 -8.413750 566.347
## 128372 -37.28041 -8.413750 565.929
## 128373 -37.28013 -8.413750 565.476
## 128374 -37.27986 -8.413750 564.815
## 128375 -37.27958 -8.413750 564.281
## 128376 -37.27930 -8.413750 564.017
## 128377 -37.27902 -8.413750 564.477
## 128378 -37.27875 -8.413750 565.256
## 128379 -37.27847 -8.413750 566.366
## 128380 -37.27819 -8.413750 567.770
## 128381 -37.27791 -8.413750 569.230
## 128382 -37.27763 -8.413750 570.586
## 128383 -37.27736 -8.413750 571.637
## 128384 -37.27708 -8.413750 572.545
## 128385 -37.27680 -8.413750 573.273
## 128386 -37.27652 -8.413750 574.074
## 128387 -37.27625 -8.413750 574.802
## 128388 -37.27597 -8.413750 575.493
## 128389 -37.27569 -8.413750 576.478
## 128390 -37.27541 -8.413750 577.249
## 128391 -37.27513 -8.413750 577.673
## 128392 -37.27486 -8.413750 577.537
## 128393 -37.27458 -8.413750 577.232
## 128394 -37.27430 -8.413750 577.035
## 128395 -37.27402 -8.413750 577.145
## 128396 -37.27375 -8.413750 577.332
## 128397 -37.27347 -8.413750 577.409
## 128398 -37.27319 -8.413750 577.406
## 128399 -37.27291 -8.413750 577.161
## 128400 -37.27263 -8.413750 576.715
## 128401 -37.27236 -8.413750 576.047
## 128402 -37.27208 -8.413750 575.257
## 128403 -37.27180 -8.413750 574.311
## 128404 -37.27152 -8.413750 573.490
## 128405 -37.27125 -8.413750 572.722
## 128406 -37.27097 -8.413750 572.231
## 128407 -37.27069 -8.413750 572.070
## 128408 -37.27041 -8.413750 572.096
## 128409 -37.27013 -8.413750 572.080
## 128410 -37.26986 -8.413750 571.740
## 128411 -37.26958 -8.413750 571.431
## 128412 -37.26930 -8.413750 571.412
## 128413 -37.26902 -8.413750 571.667
## 128414 -37.26875 -8.413750 572.366
## 128415 -37.26847 -8.413750 573.436
## 128416 -37.26819 -8.413750 574.700
## 128417 -37.26791 -8.413750 575.967
## 128418 -37.26763 -8.413750 576.851
## 128419 -37.26736 -8.413750 577.038
## 128420 -37.26708 -8.413750 576.838
## 128421 -37.26680 -8.413750 576.415
## 128422 -37.26652 -8.413750 576.141
## 128423 -37.26625 -8.413750 575.782
## 128424 -37.26597 -8.413750 575.223
## 128425 -37.26569 -8.413750 574.998
## 128426 -37.26541 -8.413750 574.450
## 128427 -37.26513 -8.413750 573.637
## 128428 -37.26486 -8.413750 572.463
## 128429 -37.26458 -8.413750 571.170
## 128430 -37.26430 -8.413750 570.038
## 128431 -37.26402 -8.413750 569.114
## 128432 -37.26375 -8.413750 568.298
## 128433 -37.26347 -8.413750 567.443
## 128434 -37.26319 -8.413750 566.176
## 128435 -37.26291 -8.413750 565.155
## 128436 -37.26263 -8.413750 564.724
## 128437 -37.26236 -8.413750 565.209
## 128438 -37.26208 -8.413750 566.359
## 128439 -37.26180 -8.413750 567.989
## 128440 -37.26152 -8.413750 570.084
## 128441 -37.26125 -8.413750 572.062
## 128442 -37.26097 -8.413750 573.473
## 128443 -37.26069 -8.413750 574.181
## 128444 -37.26041 -8.413750 574.146
## 128445 -37.26013 -8.413750 573.895
## 128446 -37.25986 -8.413750 572.580
## 128447 -37.25958 -8.413750 571.354
## 128448 -37.25930 -8.413750 570.065
## 128449 -37.25902 -8.413750 569.019
## 128450 -37.25875 -8.413750 568.055
## 128451 -37.25847 -8.413750 567.166
## 128452 -37.25819 -8.413750 566.833
## 128453 -37.25791 -8.413750 566.379
## 128454 -37.25763 -8.413750 565.716
## 128455 -37.25736 -8.413750 564.595
## 128456 -37.25708 -8.413750 563.689
## 128457 -37.25680 -8.413750 563.527
## 128458 -37.25652 -8.413750 564.438
## 128459 -37.25625 -8.413750 565.787
## 128460 -37.25597 -8.413750 567.018
## 128461 -37.25569 -8.413750 567.804
## 128462 -37.25541 -8.413750 568.084
## 128463 -37.25513 -8.413750 568.007
## 128464 -37.25486 -8.413750 567.708
## 128465 -37.25458 -8.413750 567.084
## 128466 -37.25430 -8.413750 566.162
## 128467 -37.25402 -8.413750 564.878
## 128468 -37.25375 -8.413750 563.633
## 128469 -37.25347 -8.413750 562.677
## 128470 -37.25319 -8.413750 562.510
## 128471 -37.25291 -8.413750 562.874
## 128472 -37.25263 -8.413750 563.780
## 128473 -37.25236 -8.413750 565.317
## 128474 -37.25208 -8.413750 566.708
## 128475 -37.25180 -8.413750 567.382
## 128476 -37.25152 -8.413750 566.805
## 128477 -37.25125 -8.413750 565.785
## 128478 -37.25097 -8.413750 564.543
## 128479 -37.25069 -8.413750 564.315
## 128480 -37.25041 -8.413750 564.164
## 128481 -37.25013 -8.413750 564.171
## 128482 -37.24986 -8.413750 564.247
## 128483 -37.24958 -8.413750 564.535
## 128484 -37.24930 -8.413750 565.194
## 128485 -37.24902 -8.413750 566.082
## 128486 -37.24875 -8.413750 567.166
## 128487 -37.24847 -8.413750 568.378
## 128488 -37.24819 -8.413750 569.040
## 128489 -37.24791 -8.413750 569.683
## 128490 -37.24763 -8.413750 570.169
## 128491 -37.24736 -8.413750 570.538
## 128492 -37.24708 -8.413750 571.020
## 128493 -37.24680 -8.413750 571.850
## 128494 -37.24652 -8.413750 573.478
## 128495 -37.24625 -8.413750 575.094
## 128496 -37.24597 -8.413750 576.620
## 128497 -37.24569 -8.413750 577.072
## 128498 -37.24541 -8.413750 577.462
## 128499 -37.24513 -8.413750 577.927
## 128500 -37.24486 -8.413750 578.761
## 128501 -37.24458 -8.413750 579.883
## 128502 -37.24430 -8.413750 581.421
## 128503 -37.24402 -8.413750 583.165
## 128504 -37.24375 -8.413750 584.849
## 128505 -37.24347 -8.413750 586.110
## 128506 -37.24319 -8.413750 586.356
## 128507 -37.24291 -8.413750 586.593
## 128508 -37.24263 -8.413750 587.403
## 128509 -37.24236 -8.413750 589.467
## 128510 -37.24208 -8.413750 591.867
## 128511 -37.24180 -8.413750 594.040
## 128512 -37.24152 -8.413750 595.438
## 128513 -37.24125 -8.413750 596.461
## 128514 -37.24097 -8.413750 597.105
## 128515 -37.24069 -8.413750 598.017
## 128516 -37.24041 -8.413750 598.547
## 128517 -37.24013 -8.413750 598.690
## 128518 -37.23986 -8.413750 598.230
## 128519 -37.23958 -8.413750 597.652
## 128520 -37.23930 -8.413750 597.288
## 128521 -37.23902 -8.413750 597.569
## 128522 -37.23875 -8.413750 597.740
## 128523 -37.23847 -8.413750 597.571
## 128524 -37.23819 -8.413750 596.424
## 128525 -37.23791 -8.413750 595.061
## 128526 -37.23763 -8.413750 593.775
## 128527 -37.23736 -8.413750 592.957
## 128528 -37.23708 -8.413750 592.171
## 128529 -37.23680 -8.413750 591.316
## 128530 -37.23652 -8.413750 589.679
## 128531 -37.23625 -8.413750 588.001
## 128532 -37.23597 -8.413750 586.353
## 128533 -37.23569 -8.413750 584.667
## 128534 -37.23541 -8.413750 583.128
## 128535 -37.23513 -8.413750 581.667
## 128536 -37.23486 -8.413750 580.333
## 128537 -37.23458 -8.413750 579.030
## 128538 -37.23430 -8.413750 577.831
## 128539 -37.23402 -8.413750 576.075
## 128540 -37.23375 -8.413750 574.915
## 128541 -37.23347 -8.413750 574.796
## 128542 -37.23319 -8.413750 576.232
## 128543 -37.23291 -8.413750 578.078
## 128544 -37.23263 -8.413750 579.369
## 128545 -37.23236 -8.413750 578.741
## 128546 -37.23208 -8.413750 577.828
## 128547 -37.23180 -8.413750 577.462
## 128548 -37.23152 -8.413750 578.353
## 128549 -37.23125 -8.413750 579.821
## 128550 -37.23097 -8.413750 581.609
## 128551 -37.23069 -8.413750 582.962
## 128552 -37.23041 -8.413750 584.314
## 128553 -37.23013 -8.413750 585.598
## 128554 -37.22986 -8.413750 586.877
## 128555 -37.22958 -8.413750 588.015
## 128556 -37.22930 -8.413750 588.880
## 128557 -37.22902 -8.413750 589.740
## 128558 -37.22875 -8.413750 590.191
## 128559 -37.22847 -8.413750 590.235
## 128560 -37.22819 -8.413750 589.712
## 128561 -37.22791 -8.413750 589.055
## 128562 -37.22763 -8.413750 588.566
## 128563 -37.22736 -8.413750 588.572
## 128564 -37.22708 -8.413750 588.817
## 128565 -37.22680 -8.413750 589.166
## 128566 -37.22652 -8.413750 589.470
## 128567 -37.22625 -8.413750 589.523
## 128568 -37.22597 -8.413750 589.212
## 128569 -37.22569 -8.413750 588.322
## 128570 -37.22541 -8.413750 586.980
## 128571 -37.22513 -8.413750 585.101
## 128572 -37.22486 -8.413750 583.177
## 128573 -37.22458 -8.413750 581.094
## 128574 -37.22430 -8.413750 579.129
## 128575 -37.22402 -8.413750 577.959
## 128576 -37.22375 -8.413750 576.832
## 128577 -37.22347 -8.413750 575.753
## 128578 -37.22319 -8.413750 574.472
## 129360 -37.38236 -8.414028 515.313
## 129361 -37.38208 -8.414028 515.083
## 129362 -37.38180 -8.414028 515.213
## 129363 -37.38152 -8.414028 515.463
## 129364 -37.38125 -8.414028 515.712
## 129365 -37.38097 -8.414028 516.050
## 129366 -37.38069 -8.414028 516.255
## 129367 -37.38041 -8.414028 516.333
## 129368 -37.38013 -8.414028 515.757
## 129416 -37.36680 -8.414028 519.257
## 129417 -37.36652 -8.414028 519.677
## 129418 -37.36625 -8.414028 520.275
## 129419 -37.36597 -8.414028 521.279
## 129420 -37.36569 -8.414028 523.045
## 129421 -37.36541 -8.414028 524.756
## 129422 -37.36513 -8.414028 526.295
## 129423 -37.36486 -8.414028 526.879
## 129424 -37.36458 -8.414028 527.241
## 129425 -37.36430 -8.414028 527.372
## 129426 -37.36402 -8.414028 527.685
## 129427 -37.36375 -8.414028 528.242
## 129428 -37.36347 -8.414028 529.188
## 129429 -37.36319 -8.414028 530.902
## 129430 -37.36291 -8.414028 532.941
## 129431 -37.36263 -8.414028 535.018
## 129432 -37.36236 -8.414028 536.522
## 129433 -37.36208 -8.414028 537.727
## 129434 -37.36180 -8.414028 539.289
## 129435 -37.36152 -8.414028 541.048
## 129436 -37.36125 -8.414028 542.671
## 129437 -37.36097 -8.414028 544.344
## 129438 -37.36069 -8.414028 545.565
## 129439 -37.36041 -8.414028 546.733
## 129440 -37.36013 -8.414028 547.644
## 129441 -37.35986 -8.414028 549.177
## 129442 -37.35958 -8.414028 550.942
## 129443 -37.35930 -8.414028 552.774
## 129444 -37.35902 -8.414028 554.501
## 129445 -37.35875 -8.414028 555.953
## 129446 -37.35847 -8.414028 557.344
## 129447 -37.35819 -8.414028 558.909
## 129448 -37.35791 -8.414028 560.116
## 129449 -37.35763 -8.414028 560.905
## 129450 -37.35736 -8.414028 561.438
## 129451 -37.35708 -8.414028 561.839
## 129452 -37.35680 -8.414028 562.011
## 129453 -37.35652 -8.414028 561.913
## 129454 -37.35625 -8.414028 561.722
## 129455 -37.35597 -8.414028 561.669
## 129456 -37.35569 -8.414028 562.096
## 129457 -37.35541 -8.414028 562.620
## 129458 -37.35513 -8.414028 563.172
## 129459 -37.35486 -8.414028 563.467
## 129460 -37.35458 -8.414028 563.622
## 129461 -37.35430 -8.414028 563.657
## 129462 -37.35402 -8.414028 563.399
## 129463 -37.35375 -8.414028 563.086
## 129464 -37.35347 -8.414028 562.781
## 129465 -37.35319 -8.414028 562.590
## 129466 -37.35291 -8.414028 562.634
## 129467 -37.35263 -8.414028 562.610
## 129468 -37.35236 -8.414028 562.700
## 129469 -37.35208 -8.414028 562.694
## 129470 -37.35180 -8.414028 562.785
## 129471 -37.35152 -8.414028 562.672
## 129472 -37.35125 -8.414028 562.444
## 129473 -37.35097 -8.414028 562.377
## 129474 -37.35069 -8.414028 562.744
## 129475 -37.35041 -8.414028 563.218
## 129476 -37.35013 -8.414028 563.455
## 129477 -37.34986 -8.414028 563.904
## 129478 -37.34958 -8.414028 564.524
## 129479 -37.34930 -8.414028 565.204
## 129480 -37.34902 -8.414028 566.000
## 129481 -37.34875 -8.414028 566.781
## 129482 -37.34847 -8.414028 567.464
## 129483 -37.34819 -8.414028 568.146
## 129484 -37.34791 -8.414028 568.442
## 129485 -37.34763 -8.414028 568.679
## 129486 -37.34736 -8.414028 568.656
## 129487 -37.34708 -8.414028 568.643
## 129488 -37.34680 -8.414028 568.143
## 129489 -37.34652 -8.414028 567.882
## 129490 -37.34625 -8.414028 567.801
## 129491 -37.34597 -8.414028 567.858
## 129492 -37.34569 -8.414028 568.341
## 129493 -37.34541 -8.414028 568.835
## 129494 -37.34513 -8.414028 569.350
## 129495 -37.34486 -8.414028 569.259
## 129496 -37.34458 -8.414028 568.792
## 129497 -37.34430 -8.414028 568.669
## 129498 -37.34402 -8.414028 568.470
## 129499 -37.34375 -8.414028 568.351
## 129500 -37.34347 -8.414028 568.455
## 129501 -37.34319 -8.414028 568.454
## 129502 -37.34291 -8.414028 568.694
## 129503 -37.34263 -8.414028 568.975
## 129504 -37.34236 -8.414028 569.154
## 129505 -37.34208 -8.414028 569.238
## 129506 -37.34180 -8.414028 569.201
## 129507 -37.34152 -8.414028 568.820
## 129508 -37.34125 -8.414028 568.281
## 129509 -37.34097 -8.414028 567.480
## 129510 -37.34069 -8.414028 567.012
## 129511 -37.34041 -8.414028 566.798
## 129512 -37.34013 -8.414028 566.724
## 129513 -37.33986 -8.414028 566.807
## 129514 -37.33958 -8.414028 566.969
## 129515 -37.33930 -8.414028 567.336
## 129516 -37.33902 -8.414028 567.953
## 129517 -37.33875 -8.414028 568.290
## 129518 -37.33847 -8.414028 568.440
## 129519 -37.33819 -8.414028 568.182
## 129520 -37.33791 -8.414028 567.929
## 129521 -37.33763 -8.414028 567.665
## 129522 -37.33736 -8.414028 567.870
## 129523 -37.33708 -8.414028 568.277
## 129524 -37.33680 -8.414028 568.727
## 129525 -37.33652 -8.414028 568.983
## 129526 -37.33625 -8.414028 569.138
## 129527 -37.33597 -8.414028 569.337
## 129528 -37.33569 -8.414028 569.756
## 129529 -37.33541 -8.414028 570.265
## 129530 -37.33513 -8.414028 570.869
## 129531 -37.33486 -8.414028 571.572
## 129532 -37.33458 -8.414028 572.311
## 129533 -37.33430 -8.414028 572.700
## 129534 -37.33402 -8.414028 572.511
## 129535 -37.33375 -8.414028 572.128
## 129536 -37.33347 -8.414028 571.289
## 129537 -37.33319 -8.414028 570.611
## 129538 -37.33291 -8.414028 570.053
## 129539 -37.33263 -8.414028 569.611
## 129540 -37.33236 -8.414028 569.598
## 129541 -37.33208 -8.414028 569.757
## 129542 -37.33180 -8.414028 569.953
## 129543 -37.33152 -8.414028 570.243
## 129544 -37.33125 -8.414028 570.352
## 129545 -37.33097 -8.414028 570.258
## 129546 -37.33069 -8.414028 569.898
## 129547 -37.33041 -8.414028 569.377
## 129548 -37.33013 -8.414028 569.051
## 129549 -37.32986 -8.414028 568.778
## 129550 -37.32958 -8.414028 568.460
## 129551 -37.32930 -8.414028 567.740
## 129552 -37.32902 -8.414028 566.745
## 129553 -37.32875 -8.414028 565.804
## 129554 -37.32847 -8.414028 565.194
## 129555 -37.32819 -8.414028 565.122
## 129556 -37.32791 -8.414028 565.359
## 129557 -37.32763 -8.414028 565.897
## 129558 -37.32736 -8.414028 566.494
## 129559 -37.32708 -8.414028 567.090
## 129560 -37.32680 -8.414028 567.333
## 129561 -37.32652 -8.414028 567.327
## 129562 -37.32625 -8.414028 567.648
## 129563 -37.32597 -8.414028 568.545
## 129564 -37.32569 -8.414028 570.460
## 129565 -37.32541 -8.414028 572.438
## 129566 -37.32513 -8.414028 574.355
## 129567 -37.32486 -8.414028 575.087
## 129568 -37.32458 -8.414028 575.435
## 129569 -37.32430 -8.414028 575.550
## 129570 -37.32402 -8.414028 575.747
## 129571 -37.32375 -8.414028 576.271
## 129572 -37.32347 -8.414028 576.891
## 129573 -37.32319 -8.414028 577.614
## 129574 -37.32291 -8.414028 578.243
## 129575 -37.32263 -8.414028 578.809
## 129576 -37.32236 -8.414028 578.832
## 129577 -37.32208 -8.414028 578.660
## 129578 -37.32180 -8.414028 578.491
## 129579 -37.32152 -8.414028 578.846
## 129580 -37.32125 -8.414028 579.421
## 129581 -37.32097 -8.414028 579.856
## 129582 -37.32069 -8.414028 579.954
## 129583 -37.32041 -8.414028 580.073
## 129584 -37.32013 -8.414028 580.526
## 129585 -37.31986 -8.414028 581.116
## 129586 -37.31958 -8.414028 581.502
## 129587 -37.31930 -8.414028 581.336
## 129588 -37.31902 -8.414028 580.430
## 129589 -37.31875 -8.414028 579.547
## 129590 -37.31847 -8.414028 578.890
## 129591 -37.31819 -8.414028 579.001
## 129592 -37.31791 -8.414028 579.349
## 129593 -37.31763 -8.414028 579.522
## 129594 -37.31736 -8.414028 579.180
## 129595 -37.31708 -8.414028 578.780
## 129596 -37.31680 -8.414028 578.232
## 129597 -37.31652 -8.414028 578.037
## 129598 -37.31625 -8.414028 578.102
## 129599 -37.31597 -8.414028 578.178
## 129600 -37.31569 -8.414028 577.527
## 129601 -37.31541 -8.414028 576.418
## 129602 -37.31513 -8.414028 575.126
## 129603 -37.31486 -8.414028 573.984
## 129604 -37.31458 -8.414028 573.011
## 129605 -37.31430 -8.414028 571.976
## 129606 -37.31402 -8.414028 571.104
## 129607 -37.31375 -8.414028 570.376
## 129608 -37.31347 -8.414028 569.816
## 129609 -37.31319 -8.414028 568.898
## 129610 -37.31291 -8.414028 567.886
## 129611 -37.31263 -8.414028 566.635
## 129612 -37.31236 -8.414028 565.567
## 129613 -37.31208 -8.414028 564.887
## 129614 -37.31180 -8.414028 565.045
## 129615 -37.31152 -8.414028 565.922
## 129616 -37.31125 -8.414028 567.025
## 129617 -37.31097 -8.414028 568.316
## 129618 -37.31069 -8.414028 568.967
## 129619 -37.31041 -8.414028 569.580
## 129620 -37.31013 -8.414028 569.817
## 129621 -37.30986 -8.414028 570.392
## 129622 -37.30958 -8.414028 571.175
## 129623 -37.30930 -8.414028 572.193
## 129624 -37.30902 -8.414028 573.404
## 129625 -37.30875 -8.414028 574.822
## 129626 -37.30847 -8.414028 576.675
## 129627 -37.30819 -8.414028 578.823
## 129628 -37.30791 -8.414028 580.805
## 129629 -37.30763 -8.414028 582.548
## 129630 -37.30736 -8.414028 583.464
## 129631 -37.30708 -8.414028 584.284
## 129632 -37.30680 -8.414028 584.548
## 129633 -37.30652 -8.414028 585.266
## 129634 -37.30625 -8.414028 585.939
## 129635 -37.30597 -8.414028 586.454
## 129636 -37.30569 -8.414028 586.544
## 129637 -37.30541 -8.414028 586.485
## 129638 -37.30513 -8.414028 586.444
## 129639 -37.30486 -8.414028 586.449
## 129640 -37.30458 -8.414028 586.464
## 129641 -37.30430 -8.414028 586.123
## 129642 -37.30402 -8.414028 585.723
## 129643 -37.30375 -8.414028 585.173
## 129644 -37.30347 -8.414028 584.335
## 129645 -37.30319 -8.414028 583.327
## 129646 -37.30291 -8.414028 582.347
## 129647 -37.30263 -8.414028 581.293
## 129648 -37.30236 -8.414028 580.243
## 129649 -37.30208 -8.414028 579.010
## 129650 -37.30180 -8.414028 577.678
## 129651 -37.30152 -8.414028 576.703
## 129652 -37.30125 -8.414028 575.964
## 129653 -37.30097 -8.414028 575.205
## 129654 -37.30069 -8.414028 574.659
## 129655 -37.30041 -8.414028 574.241
## 129656 -37.30013 -8.414028 574.391
## 129657 -37.29986 -8.414028 574.983
## 129658 -37.29958 -8.414028 575.653
## 129659 -37.29930 -8.414028 576.085
## 129660 -37.29902 -8.414028 576.153
## 129661 -37.29875 -8.414028 576.272
## 129662 -37.29847 -8.414028 576.435
## 129663 -37.29819 -8.414028 576.908
## 129664 -37.29791 -8.414028 577.302
## 129665 -37.29763 -8.414028 577.872
## 129666 -37.29736 -8.414028 577.858
## 129667 -37.29708 -8.414028 577.867
## 129668 -37.29680 -8.414028 577.564
## 129669 -37.29652 -8.414028 577.064
## 129670 -37.29625 -8.414028 576.568
## 129671 -37.29597 -8.414028 575.815
## 129672 -37.29569 -8.414028 574.843
## 129673 -37.29541 -8.414028 573.925
## 129674 -37.29513 -8.414028 573.411
## 129675 -37.29486 -8.414028 573.719
## 129676 -37.29458 -8.414028 574.026
## 129677 -37.29430 -8.414028 574.437
## 129678 -37.29402 -8.414028 574.745
## 129679 -37.29375 -8.414028 574.786
## 129680 -37.29347 -8.414028 574.304
## 129681 -37.29319 -8.414028 573.453
## 129682 -37.29291 -8.414028 572.771
## 129683 -37.29263 -8.414028 572.420
## 129684 -37.29236 -8.414028 572.955
## 129685 -37.29208 -8.414028 573.622
## 129686 -37.29180 -8.414028 574.403
## 129687 -37.29152 -8.414028 574.152
## 129688 -37.29125 -8.414028 573.634
## 129689 -37.29097 -8.414028 572.533
## 129690 -37.29069 -8.414028 571.731
## 129691 -37.29041 -8.414028 571.025
## 129692 -37.29013 -8.414028 570.136
## 129693 -37.28986 -8.414028 569.321
## 129694 -37.28958 -8.414028 568.383
## 129695 -37.28930 -8.414028 567.723
## 129696 -37.28902 -8.414028 567.208
## 129697 -37.28875 -8.414028 566.196
## 129698 -37.28847 -8.414028 565.095
## 129699 -37.28819 -8.414028 564.330
## 129700 -37.28791 -8.414028 563.779
## 129701 -37.28763 -8.414028 563.276
## 129702 -37.28736 -8.414028 562.710
## 129703 -37.28708 -8.414028 562.277
## 129704 -37.28680 -8.414028 562.455
## 129705 -37.28652 -8.414028 563.279
## 129706 -37.28625 -8.414028 564.145
## 129707 -37.28597 -8.414028 564.465
## 129708 -37.28569 -8.414028 564.238
## 129709 -37.28541 -8.414028 564.066
## 129710 -37.28513 -8.414028 564.168
## 129711 -37.28486 -8.414028 565.066
## 129712 -37.28458 -8.414028 566.190
## 129713 -37.28430 -8.414028 567.426
## 129714 -37.28402 -8.414028 568.874
## 129715 -37.28375 -8.414028 570.338
## 129716 -37.28347 -8.414028 571.523
## 129717 -37.28319 -8.414028 572.370
## 129718 -37.28291 -8.414028 572.732
## 129719 -37.28263 -8.414028 572.911
## 129720 -37.28236 -8.414028 572.456
## 129721 -37.28208 -8.414028 571.752
## 129722 -37.28180 -8.414028 570.549
## 129723 -37.28152 -8.414028 569.267
## 129724 -37.28125 -8.414028 568.035
## 129725 -37.28097 -8.414028 566.895
## 129726 -37.28069 -8.414028 566.116
## 129727 -37.28041 -8.414028 565.640
## 129728 -37.28013 -8.414028 565.283
## 129729 -37.27986 -8.414028 564.842
## 129730 -37.27958 -8.414028 564.499
## 129731 -37.27930 -8.414028 564.538
## 129732 -37.27902 -8.414028 565.120
## 129733 -37.27875 -8.414028 565.828
## 129734 -37.27847 -8.414028 566.751
## 129735 -37.27819 -8.414028 567.858
## 129736 -37.27791 -8.414028 569.095
## 129737 -37.27763 -8.414028 570.340
## 129738 -37.27736 -8.414028 571.340
## 129739 -37.27708 -8.414028 572.492
## 129740 -37.27680 -8.414028 573.378
## 129741 -37.27652 -8.414028 574.235
## 129742 -37.27625 -8.414028 575.003
## 129743 -37.27597 -8.414028 575.807
## 129744 -37.27569 -8.414028 576.780
## 129745 -37.27541 -8.414028 577.576
## 129746 -37.27513 -8.414028 578.108
## 129747 -37.27486 -8.414028 578.043
## 129748 -37.27458 -8.414028 577.902
## 129749 -37.27430 -8.414028 577.629
## 129750 -37.27402 -8.414028 577.759
## 129751 -37.27375 -8.414028 577.873
## 129752 -37.27347 -8.414028 577.919
## 129753 -37.27319 -8.414028 577.730
## 129754 -37.27291 -8.414028 577.359
## 129755 -37.27263 -8.414028 576.909
## 129756 -37.27236 -8.414028 576.270
## 129757 -37.27208 -8.414028 575.580
## 129758 -37.27180 -8.414028 574.781
## 129759 -37.27152 -8.414028 573.944
## 129760 -37.27125 -8.414028 573.235
## 129761 -37.27097 -8.414028 572.807
## 129762 -37.27069 -8.414028 572.730
## 129763 -37.27041 -8.414028 572.809
## 129764 -37.27013 -8.414028 572.858
## 129765 -37.26986 -8.414028 572.562
## 129766 -37.26958 -8.414028 572.486
## 129767 -37.26930 -8.414028 572.461
## 129768 -37.26902 -8.414028 572.934
## 129769 -37.26875 -8.414028 573.502
## 129770 -37.26847 -8.414028 574.449
## 129771 -37.26819 -8.414028 575.532
## 129772 -37.26791 -8.414028 576.521
## 129773 -37.26763 -8.414028 577.046
## 129774 -37.26736 -8.414028 576.813
## 129775 -37.26708 -8.414028 576.496
## 129776 -37.26680 -8.414028 576.203
## 129777 -37.26652 -8.414028 576.070
## 129778 -37.26625 -8.414028 575.836
## 129779 -37.26597 -8.414028 575.553
## 129780 -37.26569 -8.414028 575.205
## 129781 -37.26541 -8.414028 574.667
## 129782 -37.26513 -8.414028 573.995
## 129783 -37.26486 -8.414028 573.047
## 129784 -37.26458 -8.414028 572.090
## 129785 -37.26430 -8.414028 571.051
## 129786 -37.26402 -8.414028 570.355
## 129787 -37.26375 -8.414028 569.631
## 129788 -37.26347 -8.414028 568.738
## 129789 -37.26319 -8.414028 567.236
## 129790 -37.26291 -8.414028 566.073
## 129791 -37.26263 -8.414028 565.283
## 129792 -37.26236 -8.414028 565.534
## 129793 -37.26208 -8.414028 566.457
## 129794 -37.26180 -8.414028 567.973
## 129795 -37.26152 -8.414028 569.954
## 129796 -37.26125 -8.414028 572.153
## 129797 -37.26097 -8.414028 574.309
## 129798 -37.26069 -8.414028 575.109
## 129799 -37.26041 -8.414028 575.007
## 129800 -37.26013 -8.414028 573.978
## 129801 -37.25986 -8.414028 572.523
## 129802 -37.25958 -8.414028 571.129
## 129803 -37.25930 -8.414028 569.423
## 129804 -37.25902 -8.414028 568.081
## 129805 -37.25875 -8.414028 567.161
## 129806 -37.25847 -8.414028 566.826
## 129807 -37.25819 -8.414028 566.706
## 129808 -37.25791 -8.414028 566.423
## 129809 -37.25763 -8.414028 565.834
## 129810 -37.25736 -8.414028 564.803
## 129811 -37.25708 -8.414028 563.975
## 129812 -37.25680 -8.414028 563.790
## 129813 -37.25652 -8.414028 564.954
## 129814 -37.25625 -8.414028 566.433
## 129815 -37.25597 -8.414028 567.979
## 129816 -37.25569 -8.414028 568.548
## 129817 -37.25541 -8.414028 568.717
## 129818 -37.25513 -8.414028 568.555
## 129819 -37.25486 -8.414028 568.348
## 129820 -37.25458 -8.414028 567.975
## 129821 -37.25430 -8.414028 567.001
## 129822 -37.25402 -8.414028 565.509
## 129823 -37.25375 -8.414028 564.343
## 129824 -37.25347 -8.414028 563.614
## 129825 -37.25319 -8.414028 563.723
## 129826 -37.25291 -8.414028 564.271
## 129827 -37.25263 -8.414028 565.326
## 129828 -37.25236 -8.414028 566.781
## 129829 -37.25208 -8.414028 568.080
## 129830 -37.25180 -8.414028 568.606
## 129831 -37.25152 -8.414028 567.965
## 129832 -37.25125 -8.414028 567.066
## 129833 -37.25097 -8.414028 566.179
## 129834 -37.25069 -8.414028 566.021
## 129835 -37.25041 -8.414028 565.896
## 129836 -37.25013 -8.414028 565.991
## 129837 -37.24986 -8.414028 566.052
## 129838 -37.24958 -8.414028 566.166
## 129839 -37.24930 -8.414028 566.497
## 129840 -37.24902 -8.414028 567.140
## 129841 -37.24875 -8.414028 567.941
## 129842 -37.24847 -8.414028 568.670
## 129843 -37.24819 -8.414028 569.423
## 129844 -37.24791 -8.414028 570.238
## 129845 -37.24763 -8.414028 570.991
## 129846 -37.24736 -8.414028 571.690
## 129847 -37.24708 -8.414028 572.381
## 129848 -37.24680 -8.414028 573.463
## 129849 -37.24652 -8.414028 575.115
## 129850 -37.24625 -8.414028 576.633
## 129851 -37.24597 -8.414028 577.709
## 129852 -37.24569 -8.414028 578.052
## 129853 -37.24541 -8.414028 578.404
## 129854 -37.24513 -8.414028 578.838
## 129855 -37.24486 -8.414028 579.637
## 129856 -37.24458 -8.414028 580.806
## 129857 -37.24430 -8.414028 581.928
## 129858 -37.24402 -8.414028 583.528
## 129859 -37.24375 -8.414028 585.168
## 129860 -37.24347 -8.414028 586.286
## 129861 -37.24319 -8.414028 586.602
## 129862 -37.24291 -8.414028 586.876
## 129863 -37.24263 -8.414028 587.667
## 129864 -37.24236 -8.414028 589.716
## 129865 -37.24208 -8.414028 591.779
## 129866 -37.24180 -8.414028 593.640
## 129867 -37.24152 -8.414028 594.762
## 129868 -37.24125 -8.414028 595.731
## 129869 -37.24097 -8.414028 596.627
## 129870 -37.24069 -8.414028 597.396
## 129871 -37.24041 -8.414028 597.927
## 129872 -37.24013 -8.414028 598.030
## 129873 -37.23986 -8.414028 597.513
## 129874 -37.23958 -8.414028 596.917
## 129875 -37.23930 -8.414028 596.479
## 129876 -37.23902 -8.414028 596.774
## 129877 -37.23875 -8.414028 597.123
## 129878 -37.23847 -8.414028 597.176
## 129879 -37.23819 -8.414028 596.290
## 129880 -37.23791 -8.414028 595.083
## 129881 -37.23763 -8.414028 593.822
## 129882 -37.23736 -8.414028 592.946
## 129883 -37.23708 -8.414028 591.924
## 129884 -37.23680 -8.414028 590.731
## 129885 -37.23652 -8.414028 588.971
## 129886 -37.23625 -8.414028 587.193
## 129887 -37.23597 -8.414028 585.050
## 129888 -37.23569 -8.414028 583.566
## 129889 -37.23541 -8.414028 582.275
## 129890 -37.23513 -8.414028 581.270
## 129891 -37.23486 -8.414028 580.312
## 129892 -37.23458 -8.414028 579.117
## 129893 -37.23430 -8.414028 578.464
## 129894 -37.23402 -8.414028 577.468
## 129895 -37.23375 -8.414028 576.401
## 129896 -37.23347 -8.414028 576.114
## 129897 -37.23319 -8.414028 577.401
## 129898 -37.23291 -8.414028 578.987
## 129899 -37.23263 -8.414028 580.379
## 129900 -37.23236 -8.414028 579.616
## 129901 -37.23208 -8.414028 578.675
## 129902 -37.23180 -8.414028 578.256
## 129903 -37.23152 -8.414028 579.221
## 129904 -37.23125 -8.414028 580.616
## 129905 -37.23097 -8.414028 582.050
## 129906 -37.23069 -8.414028 583.338
## 129907 -37.23041 -8.414028 584.631
## 129908 -37.23013 -8.414028 585.855
## 129909 -37.22986 -8.414028 587.192
## 129910 -37.22958 -8.414028 588.250
## 129911 -37.22930 -8.414028 589.411
## 129912 -37.22902 -8.414028 590.195
## 129913 -37.22875 -8.414028 590.622
## 129914 -37.22847 -8.414028 590.744
## 129915 -37.22819 -8.414028 590.229
## 129916 -37.22791 -8.414028 589.551
## 129917 -37.22763 -8.414028 589.041
## 129918 -37.22736 -8.414028 588.842
## 129919 -37.22708 -8.414028 588.908
## 129920 -37.22680 -8.414028 588.859
## 129921 -37.22652 -8.414028 588.930
## 129922 -37.22625 -8.414028 588.928
## 129923 -37.22597 -8.414028 588.543
## 129924 -37.22569 -8.414028 587.558
## 129925 -37.22541 -8.414028 586.123
## 129926 -37.22513 -8.414028 584.670
## 129927 -37.22486 -8.414028 582.939
## 129928 -37.22458 -8.414028 581.077
## 129929 -37.22430 -8.414028 579.438
## 129930 -37.22402 -8.414028 578.394
## 129931 -37.22375 -8.414028 577.474
## 129932 -37.22347 -8.414028 576.566
## 129933 -37.22319 -8.414028 575.388
## 129934 -37.22291 -8.414028 574.327
## 130715 -37.38236 -8.414306 515.948
## 130716 -37.38208 -8.414306 515.804
## 130717 -37.38180 -8.414306 516.033
## 130718 -37.38152 -8.414306 516.251
## 130719 -37.38125 -8.414306 516.484
## 130720 -37.38097 -8.414306 516.784
## 130721 -37.38069 -8.414306 516.921
## 130722 -37.38041 -8.414306 516.973
## 130723 -37.38013 -8.414306 516.377
## 130724 -37.37986 -8.414306 516.284
## 130725 -37.37958 -8.414306 516.121
## 130726 -37.37930 -8.414306 516.305
## 130771 -37.36680 -8.414306 519.468
## 130772 -37.36652 -8.414306 519.979
## 130773 -37.36625 -8.414306 520.754
## 130774 -37.36597 -8.414306 522.000
## 130775 -37.36569 -8.414306 523.492
## 130776 -37.36541 -8.414306 524.864
## 130777 -37.36513 -8.414306 525.909
## 130778 -37.36486 -8.414306 526.944
## 130779 -37.36458 -8.414306 527.762
## 130780 -37.36430 -8.414306 528.229
## 130781 -37.36402 -8.414306 528.156
## 130782 -37.36375 -8.414306 528.403
## 130783 -37.36347 -8.414306 529.018
## 130784 -37.36319 -8.414306 530.854
## 130785 -37.36291 -8.414306 533.044
## 130786 -37.36263 -8.414306 535.223
## 130787 -37.36236 -8.414306 536.754
## 130788 -37.36208 -8.414306 538.129
## 130789 -37.36180 -8.414306 539.706
## 130790 -37.36152 -8.414306 541.745
## 130791 -37.36125 -8.414306 543.661
## 130792 -37.36097 -8.414306 545.536
## 130793 -37.36069 -8.414306 546.667
## 130794 -37.36041 -8.414306 547.709
## 130795 -37.36013 -8.414306 548.516
## 130796 -37.35986 -8.414306 549.976
## 130797 -37.35958 -8.414306 551.593
## 130798 -37.35930 -8.414306 553.271
## 130799 -37.35902 -8.414306 555.121
## 130800 -37.35875 -8.414306 556.754
## 130801 -37.35847 -8.414306 558.355
## 130802 -37.35819 -8.414306 559.624
## 130803 -37.35791 -8.414306 560.607
## 130804 -37.35763 -8.414306 561.053
## 130805 -37.35736 -8.414306 561.684
## 130806 -37.35708 -8.414306 562.228
## 130807 -37.35680 -8.414306 562.402
## 130808 -37.35652 -8.414306 562.347
## 130809 -37.35625 -8.414306 562.309
## 130810 -37.35597 -8.414306 562.270
## 130811 -37.35569 -8.414306 562.476
## 130812 -37.35541 -8.414306 562.748
## 130813 -37.35513 -8.414306 563.131
## 130814 -37.35486 -8.414306 563.629
## 130815 -37.35458 -8.414306 563.928
## 130816 -37.35430 -8.414306 564.175
## 130817 -37.35402 -8.414306 563.945
## 130818 -37.35375 -8.414306 563.566
## 130819 -37.35347 -8.414306 563.283
## 130820 -37.35319 -8.414306 563.202
## 130821 -37.35291 -8.414306 563.378
## 130822 -37.35263 -8.414306 563.449
## 130823 -37.35236 -8.414306 563.492
## 130824 -37.35208 -8.414306 563.465
## 130825 -37.35180 -8.414306 563.431
## 130826 -37.35152 -8.414306 563.440
## 130827 -37.35125 -8.414306 563.297
## 130828 -37.35097 -8.414306 563.333
## 130829 -37.35069 -8.414306 563.873
## 130830 -37.35041 -8.414306 564.463
## 130831 -37.35013 -8.414306 564.778
## 130832 -37.34986 -8.414306 565.025
## 130833 -37.34958 -8.414306 565.343
## 130834 -37.34930 -8.414306 565.787
## 130835 -37.34902 -8.414306 566.721
## 130836 -37.34875 -8.414306 567.553
## 130837 -37.34847 -8.414306 568.400
## 130838 -37.34819 -8.414306 568.968
## 130839 -37.34791 -8.414306 569.143
## 130840 -37.34763 -8.414306 569.332
## 130841 -37.34736 -8.414306 569.545
## 130842 -37.34708 -8.414306 569.689
## 130843 -37.34680 -8.414306 569.525
## 130844 -37.34652 -8.414306 569.038
## 130845 -37.34625 -8.414306 568.680
## 130846 -37.34597 -8.414306 568.486
## 130847 -37.34569 -8.414306 569.414
## 130848 -37.34541 -8.414306 570.287
## 130849 -37.34513 -8.414306 571.006
## 130850 -37.34486 -8.414306 570.549
## 130851 -37.34458 -8.414306 569.861
## 130852 -37.34430 -8.414306 569.192
## 130853 -37.34402 -8.414306 569.222
## 130854 -37.34375 -8.414306 569.468
## 130855 -37.34347 -8.414306 569.714
## 130856 -37.34319 -8.414306 569.368
## 130857 -37.34291 -8.414306 569.456
## 130858 -37.34263 -8.414306 569.622
## 130859 -37.34236 -8.414306 570.059
## 130860 -37.34208 -8.414306 570.309
## 130861 -37.34180 -8.414306 570.596
## 130862 -37.34152 -8.414306 570.083
## 130863 -37.34125 -8.414306 569.321
## 130864 -37.34097 -8.414306 568.421
## 130865 -37.34069 -8.414306 567.969
## 130866 -37.34041 -8.414306 567.758
## 130867 -37.34013 -8.414306 567.658
## 130868 -37.33986 -8.414306 567.851
## 130869 -37.33958 -8.414306 568.139
## 130870 -37.33930 -8.414306 568.621
## 130871 -37.33902 -8.414306 569.219
## 130872 -37.33875 -8.414306 569.519
## 130873 -37.33847 -8.414306 569.689
## 130874 -37.33819 -8.414306 569.292
## 130875 -37.33791 -8.414306 568.787
## 130876 -37.33763 -8.414306 568.330
## 130877 -37.33736 -8.414306 568.710
## 130878 -37.33708 -8.414306 569.350
## 130879 -37.33680 -8.414306 569.844
## 130880 -37.33652 -8.414306 570.262
## 130881 -37.33625 -8.414306 570.598
## 130882 -37.33597 -8.414306 570.856
## 130883 -37.33569 -8.414306 570.827
## 130884 -37.33541 -8.414306 570.833
## 130885 -37.33513 -8.414306 571.180
## 130886 -37.33486 -8.414306 571.998
## 130887 -37.33458 -8.414306 572.779
## 130888 -37.33430 -8.414306 573.509
## 130889 -37.33402 -8.414306 573.370
## 130890 -37.33375 -8.414306 573.007
## 130891 -37.33347 -8.414306 572.252
## 130892 -37.33319 -8.414306 571.712
## 130893 -37.33291 -8.414306 571.423
## 130894 -37.33263 -8.414306 571.161
## 130895 -37.33236 -8.414306 571.283
## 130896 -37.33208 -8.414306 571.508
## 130897 -37.33180 -8.414306 571.855
## 130898 -37.33152 -8.414306 572.260
## 130899 -37.33125 -8.414306 572.411
## 130900 -37.33097 -8.414306 572.410
## 130901 -37.33069 -8.414306 571.807
## 130902 -37.33041 -8.414306 571.277
## 130903 -37.33013 -8.414306 570.708
## 130904 -37.32986 -8.414306 570.629
## 130905 -37.32958 -8.414306 570.673
## 130906 -37.32930 -8.414306 570.103
## 130907 -37.32902 -8.414306 569.096
## 130908 -37.32875 -8.414306 568.139
## 130909 -37.32847 -8.414306 567.549
## 130910 -37.32819 -8.414306 567.569
## 130911 -37.32791 -8.414306 567.776
## 130912 -37.32763 -8.414306 568.249
## 130913 -37.32736 -8.414306 568.651
## 130914 -37.32708 -8.414306 569.078
## 130915 -37.32680 -8.414306 568.993
## 130916 -37.32652 -8.414306 569.025
## 130917 -37.32625 -8.414306 569.155
## 130918 -37.32597 -8.414306 569.977
## 130919 -37.32569 -8.414306 571.942
## 130920 -37.32541 -8.414306 574.011
## 130921 -37.32513 -8.414306 575.928
## 130922 -37.32486 -8.414306 576.538
## 130923 -37.32458 -8.414306 576.728
## 130924 -37.32430 -8.414306 576.745
## 130925 -37.32402 -8.414306 576.673
## 130926 -37.32375 -8.414306 576.832
## 130927 -37.32347 -8.414306 577.176
## 130928 -37.32319 -8.414306 577.891
## 130929 -37.32291 -8.414306 578.661
## 130930 -37.32263 -8.414306 579.370
## 130931 -37.32236 -8.414306 579.366
## 130932 -37.32208 -8.414306 579.335
## 130933 -37.32180 -8.414306 579.213
## 130934 -37.32152 -8.414306 579.659
## 130935 -37.32125 -8.414306 580.200
## 130936 -37.32097 -8.414306 580.618
## 130937 -37.32069 -8.414306 580.969
## 130938 -37.32041 -8.414306 581.150
## 130939 -37.32013 -8.414306 581.663
## 130940 -37.31986 -8.414306 582.095
## 130941 -37.31958 -8.414306 582.417
## 130942 -37.31930 -8.414306 581.985
## 130943 -37.31902 -8.414306 581.264
## 130944 -37.31875 -8.414306 580.282
## 130945 -37.31847 -8.414306 579.664
## 130946 -37.31819 -8.414306 579.631
## 130947 -37.31791 -8.414306 579.804
## 130948 -37.31763 -8.414306 579.861
## 130949 -37.31736 -8.414306 579.542
## 130950 -37.31708 -8.414306 578.994
## 130951 -37.31680 -8.414306 578.559
## 130952 -37.31652 -8.414306 578.282
## 130953 -37.31625 -8.414306 578.112
## 130954 -37.31597 -8.414306 578.308
## 130955 -37.31569 -8.414306 577.875
## 130956 -37.31541 -8.414306 576.819
## 130957 -37.31513 -8.414306 575.670
## 130958 -37.31486 -8.414306 574.422
## 130959 -37.31458 -8.414306 573.425
## 130960 -37.31430 -8.414306 572.263
## 130961 -37.31402 -8.414306 571.441
## 130962 -37.31375 -8.414306 570.748
## 130963 -37.31347 -8.414306 570.264
## 130964 -37.31319 -8.414306 569.298
## 130965 -37.31291 -8.414306 568.197
## 130966 -37.31263 -8.414306 566.953
## 130967 -37.31236 -8.414306 566.188
## 130968 -37.31208 -8.414306 565.755
## 130969 -37.31180 -8.414306 566.156
## 130970 -37.31152 -8.414306 567.129
## 130971 -37.31125 -8.414306 568.277
## 130972 -37.31097 -8.414306 569.660
## 130973 -37.31069 -8.414306 570.168
## 130974 -37.31041 -8.414306 570.412
## 130975 -37.31013 -8.414306 570.409
## 130976 -37.30986 -8.414306 570.979
## 130977 -37.30958 -8.414306 571.766
## 130978 -37.30930 -8.414306 572.658
## 130979 -37.30902 -8.414306 574.152
## 130980 -37.30875 -8.414306 575.849
## 130981 -37.30847 -8.414306 578.033
## 130982 -37.30819 -8.414306 579.867
## 130983 -37.30791 -8.414306 581.616
## 130984 -37.30763 -8.414306 583.272
## 130985 -37.30736 -8.414306 584.455
## 130986 -37.30708 -8.414306 585.531
## 130987 -37.30680 -8.414306 586.148
## 130988 -37.30652 -8.414306 586.679
## 130989 -37.30625 -8.414306 587.446
## 130990 -37.30597 -8.414306 587.938
## 130991 -37.30569 -8.414306 588.011
## 130992 -37.30541 -8.414306 587.896
## 130993 -37.30513 -8.414306 587.784
## 130994 -37.30486 -8.414306 588.013
## 130995 -37.30458 -8.414306 588.116
## 130996 -37.30430 -8.414306 588.257
## 130997 -37.30402 -8.414306 587.650
## 130998 -37.30375 -8.414306 586.754
## 130999 -37.30347 -8.414306 585.681
## 131000 -37.30319 -8.414306 585.029
## 131001 -37.30291 -8.414306 584.137
## 131002 -37.30263 -8.414306 583.311
## 131003 -37.30236 -8.414306 582.260
## 131004 -37.30208 -8.414306 581.057
## 131005 -37.30180 -8.414306 579.653
## 131006 -37.30152 -8.414306 578.154
## 131007 -37.30125 -8.414306 576.626
## 131008 -37.30097 -8.414306 575.453
## 131009 -37.30069 -8.414306 575.135
## 131010 -37.30041 -8.414306 574.908
## 131011 -37.30013 -8.414306 575.254
## 131012 -37.29986 -8.414306 575.454
## 131013 -37.29958 -8.414306 575.949
## 131014 -37.29930 -8.414306 576.085
## 131015 -37.29902 -8.414306 576.741
## 131016 -37.29875 -8.414306 577.220
## 131017 -37.29847 -8.414306 577.661
## 131018 -37.29819 -8.414306 577.963
## 131019 -37.29791 -8.414306 578.161
## 131020 -37.29763 -8.414306 578.692
## 131021 -37.29736 -8.414306 578.517
## 131022 -37.29708 -8.414306 578.404
## 131023 -37.29680 -8.414306 577.863
## 131024 -37.29652 -8.414306 577.659
## 131025 -37.29625 -8.414306 577.767
## 131026 -37.29597 -8.414306 577.232
## 131027 -37.29569 -8.414306 575.897
## 131028 -37.29541 -8.414306 574.845
## 131029 -37.29513 -8.414306 574.192
## 131030 -37.29486 -8.414306 574.815
## 131031 -37.29458 -8.414306 575.539
## 131032 -37.29430 -8.414306 576.305
## 131033 -37.29402 -8.414306 575.999
## 131034 -37.29375 -8.414306 575.601
## 131035 -37.29347 -8.414306 574.773
## 131036 -37.29319 -8.414306 574.729
## 131037 -37.29291 -8.414306 574.453
## 131038 -37.29263 -8.414306 574.374
## 131039 -37.29236 -8.414306 574.839
## 131040 -37.29208 -8.414306 575.577
## 131041 -37.29180 -8.414306 576.049
## 131042 -37.29152 -8.414306 575.571
## 131043 -37.29125 -8.414306 574.529
## 131044 -37.29097 -8.414306 573.197
## 131045 -37.29069 -8.414306 572.201
## 131046 -37.29041 -8.414306 571.218
## 131047 -37.29013 -8.414306 570.189
## 131048 -37.28986 -8.414306 569.559
## 131049 -37.28958 -8.414306 568.889
## 131050 -37.28930 -8.414306 568.401
## 131051 -37.28902 -8.414306 568.100
## 131052 -37.28875 -8.414306 567.472
## 131053 -37.28847 -8.414306 566.544
## 131054 -37.28819 -8.414306 565.333
## 131055 -37.28791 -8.414306 564.390
## 131056 -37.28763 -8.414306 563.454
## 131057 -37.28736 -8.414306 563.136
## 131058 -37.28708 -8.414306 562.932
## 131059 -37.28680 -8.414306 563.270
## 131060 -37.28652 -8.414306 563.379
## 131061 -37.28625 -8.414306 563.521
## 131062 -37.28597 -8.414306 563.495
## 131063 -37.28569 -8.414306 563.727
## 131064 -37.28541 -8.414306 564.033
## 131065 -37.28513 -8.414306 564.298
## 131066 -37.28486 -8.414306 565.175
## 131067 -37.28458 -8.414306 566.189
## 131068 -37.28430 -8.414306 567.373
## 131069 -37.28402 -8.414306 568.518
## 131070 -37.28375 -8.414306 569.356
## 131071 -37.28347 -8.414306 570.427
## 131072 -37.28319 -8.414306 571.551
## 131073 -37.28291 -8.414306 572.141
## 131074 -37.28263 -8.414306 572.527
## 131075 -37.28236 -8.414306 572.238
## 131076 -37.28208 -8.414306 571.743
## 131077 -37.28180 -8.414306 570.764
## 131078 -37.28152 -8.414306 569.397
## 131079 -37.28125 -8.414306 568.050
## 131080 -37.28097 -8.414306 566.744
## 131081 -37.28069 -8.414306 565.891
## 131082 -37.28041 -8.414306 565.423
## 131083 -37.28013 -8.414306 565.132
## 131084 -37.27986 -8.414306 565.032
## 131085 -37.27958 -8.414306 565.114
## 131086 -37.27930 -8.414306 565.513
## 131087 -37.27902 -8.414306 566.193
## 131088 -37.27875 -8.414306 567.050
## 131089 -37.27847 -8.414306 567.906
## 131090 -37.27819 -8.414306 568.295
## 131091 -37.27791 -8.414306 568.871
## 131092 -37.27763 -8.414306 569.670
## 131093 -37.27736 -8.414306 570.926
## 131094 -37.27708 -8.414306 572.129
## 131095 -37.27680 -8.414306 573.265
## 131096 -37.27652 -8.414306 574.232
## 131097 -37.27625 -8.414306 575.188
## 131098 -37.27597 -8.414306 576.127
## 131099 -37.27569 -8.414306 576.797
## 131100 -37.27541 -8.414306 577.436
## 131101 -37.27513 -8.414306 577.926
## 131102 -37.27486 -8.414306 578.087
## 131103 -37.27458 -8.414306 578.154
## 131104 -37.27430 -8.414306 578.071
## 131105 -37.27402 -8.414306 578.245
## 131106 -37.27375 -8.414306 578.398
## 131107 -37.27347 -8.414306 578.382
## 131108 -37.27319 -8.414306 577.714
## 131109 -37.27291 -8.414306 576.984
## 131110 -37.27263 -8.414306 576.226
## 131111 -37.27236 -8.414306 575.836
## 131112 -37.27208 -8.414306 575.275
## 131113 -37.27180 -8.414306 574.744
## 131114 -37.27152 -8.414306 573.816
## 131115 -37.27125 -8.414306 573.049
## 131116 -37.27097 -8.414306 572.701
## 131117 -37.27069 -8.414306 572.646
## 131118 -37.27041 -8.414306 572.808
## 131119 -37.27013 -8.414306 573.014
## 131120 -37.26986 -8.414306 573.067
## 131121 -37.26958 -8.414306 573.325
## 131122 -37.26930 -8.414306 573.609
## 131123 -37.26902 -8.414306 574.301
## 131124 -37.26875 -8.414306 575.144
## 131125 -37.26847 -8.414306 576.050
## 131126 -37.26819 -8.414306 576.484
## 131127 -37.26791 -8.414306 577.028
## 131128 -37.26763 -8.414306 576.997
## 131129 -37.26736 -8.414306 576.756
## 131130 -37.26708 -8.414306 576.356
## 131131 -37.26680 -8.414306 575.967
## 131132 -37.26652 -8.414306 576.213
## 131133 -37.26625 -8.414306 576.439
## 131134 -37.26597 -8.414306 576.459
## 131135 -37.26569 -8.414306 575.667
## 131136 -37.26541 -8.414306 574.902
## 131137 -37.26513 -8.414306 574.105
## 131138 -37.26486 -8.414306 573.538
## 131139 -37.26458 -8.414306 572.905
## 131140 -37.26430 -8.414306 572.377
## 131141 -37.26402 -8.414306 571.467
## 131142 -37.26375 -8.414306 570.701
## 131143 -37.26347 -8.414306 569.762
## 131144 -37.26319 -8.414306 568.350
## 131145 -37.26291 -8.414306 567.169
## 131146 -37.26263 -8.414306 566.294
## 131147 -37.26236 -8.414306 566.428
## 131148 -37.26208 -8.414306 567.143
## 131149 -37.26180 -8.414306 568.459
## 131150 -37.26152 -8.414306 570.365
## 131151 -37.26125 -8.414306 572.355
## 131152 -37.26097 -8.414306 574.647
## 131153 -37.26069 -8.414306 575.586
## 131154 -37.26041 -8.414306 575.468
## 131155 -37.26013 -8.414306 574.346
## 131156 -37.25986 -8.414306 572.658
## 131157 -37.25958 -8.414306 570.979
## 131158 -37.25930 -8.414306 569.015
## 131159 -37.25902 -8.414306 567.908
## 131160 -37.25875 -8.414306 567.180
## 131161 -37.25847 -8.414306 567.018
## 131162 -37.25819 -8.414306 566.917
## 131163 -37.25791 -8.414306 566.653
## 131164 -37.25763 -8.414306 566.213
## 131165 -37.25736 -8.414306 565.207
## 131166 -37.25708 -8.414306 564.390
## 131167 -37.25680 -8.414306 564.237
## 131168 -37.25652 -8.414306 565.502
## 131169 -37.25625 -8.414306 567.177
## 131170 -37.25597 -8.414306 568.783
## 131171 -37.25569 -8.414306 569.191
## 131172 -37.25541 -8.414306 569.108
## 131173 -37.25513 -8.414306 568.892
## 131174 -37.25486 -8.414306 568.743
## 131175 -37.25458 -8.414306 568.436
## 131176 -37.25430 -8.414306 567.639
## 131177 -37.25402 -8.414306 566.266
## 131178 -37.25375 -8.414306 565.257
## 131179 -37.25347 -8.414306 564.658
## 131180 -37.25319 -8.414306 565.296
## 131181 -37.25291 -8.414306 566.004
## 131182 -37.25263 -8.414306 567.531
## 131183 -37.25236 -8.414306 568.549
## 131184 -37.25208 -8.414306 569.184
## 131185 -37.25180 -8.414306 569.412
## 131186 -37.25152 -8.414306 569.308
## 131187 -37.25125 -8.414306 568.866
## 131188 -37.25097 -8.414306 568.467
## 131189 -37.25069 -8.414306 568.216
## 131190 -37.25041 -8.414306 568.111
## 131191 -37.25013 -8.414306 568.153
## 131192 -37.24986 -8.414306 567.967
## 131193 -37.24958 -8.414306 567.739
## 131194 -37.24930 -8.414306 567.798
## 131195 -37.24902 -8.414306 568.019
## 131196 -37.24875 -8.414306 568.400
## 131197 -37.24847 -8.414306 568.882
## 131198 -37.24819 -8.414306 569.814
## 131199 -37.24791 -8.414306 570.904
## 131200 -37.24763 -8.414306 571.812
## 131201 -37.24736 -8.414306 572.832
## 131202 -37.24708 -8.414306 573.796
## 131203 -37.24680 -8.414306 575.247
## 131204 -37.24652 -8.414306 576.397
## 131205 -37.24625 -8.414306 577.367
## 131206 -37.24597 -8.414306 578.074
## 131207 -37.24569 -8.414306 578.655
## 131208 -37.24541 -8.414306 578.951
## 131209 -37.24513 -8.414306 579.404
## 131210 -37.24486 -8.414306 580.368
## 131211 -37.24458 -8.414306 581.606
## 131212 -37.24430 -8.414306 582.951
## 131213 -37.24402 -8.414306 584.097
## 131214 -37.24375 -8.414306 585.121
## 131215 -37.24347 -8.414306 586.059
## 131216 -37.24319 -8.414306 587.189
## 131217 -37.24291 -8.414306 587.882
## 131218 -37.24263 -8.414306 588.864
## 131219 -37.24236 -8.414306 590.339
## 131220 -37.24208 -8.414306 592.003
## 131221 -37.24180 -8.414306 593.125
## 131222 -37.24152 -8.414306 594.098
## 131223 -37.24125 -8.414306 594.818
## 131224 -37.24097 -8.414306 595.631
## 131225 -37.24069 -8.414306 596.307
## 131226 -37.24041 -8.414306 596.811
## 131227 -37.24013 -8.414306 596.856
## 131228 -37.23986 -8.414306 596.460
## 131229 -37.23958 -8.414306 596.028
## 131230 -37.23930 -8.414306 595.770
## 131231 -37.23902 -8.414306 595.967
## 131232 -37.23875 -8.414306 596.042
## 131233 -37.23847 -8.414306 596.128
## 131234 -37.23819 -8.414306 595.843
## 131235 -37.23791 -8.414306 594.926
## 131236 -37.23763 -8.414306 593.956
## 131237 -37.23736 -8.414306 592.678
## 131238 -37.23708 -8.414306 591.399
## 131239 -37.23680 -8.414306 589.831
## 131240 -37.23652 -8.414306 588.166
## 131241 -37.23625 -8.414306 586.410
## 131242 -37.23597 -8.414306 584.410
## 131243 -37.23569 -8.414306 583.001
## 131244 -37.23541 -8.414306 581.845
## 131245 -37.23513 -8.414306 580.918
## 131246 -37.23486 -8.414306 580.334
## 131247 -37.23458 -8.414306 579.761
## 131248 -37.23430 -8.414306 579.166
## 131249 -37.23402 -8.414306 578.432
## 131250 -37.23375 -8.414306 577.924
## 131251 -37.23347 -8.414306 577.839
## 131252 -37.23319 -8.414306 578.237
## 131253 -37.23291 -8.414306 579.466
## 131254 -37.23263 -8.414306 579.811
## 131255 -37.23236 -8.414306 579.806
## 131256 -37.23208 -8.414306 579.724
## 131257 -37.23180 -8.414306 579.690
## 131258 -37.23152 -8.414306 580.168
## 131259 -37.23125 -8.414306 581.168
## 131260 -37.23097 -8.414306 582.337
## 131261 -37.23069 -8.414306 583.902
## 131262 -37.23041 -8.414306 585.366
## 131263 -37.23013 -8.414306 586.632
## 131264 -37.22986 -8.414306 587.663
## 131265 -37.22958 -8.414306 588.378
## 131266 -37.22930 -8.414306 589.191
## 131267 -37.22902 -8.414306 590.086
## 131268 -37.22875 -8.414306 590.523
## 131269 -37.22847 -8.414306 590.620
## 131270 -37.22819 -8.414306 590.091
## 131271 -37.22791 -8.414306 589.458
## 131272 -37.22763 -8.414306 589.045
## 131273 -37.22736 -8.414306 588.557
## 131274 -37.22708 -8.414306 588.536
## 131275 -37.22680 -8.414306 588.226
## 131276 -37.22652 -8.414306 588.345
## 131277 -37.22625 -8.414306 588.523
## 131278 -37.22597 -8.414306 588.116
## 131279 -37.22569 -8.414306 587.067
## 131280 -37.22541 -8.414306 586.011
## 131281 -37.22513 -8.414306 584.619
## 131282 -37.22486 -8.414306 583.104
## 131283 -37.22458 -8.414306 581.606
## 131284 -37.22430 -8.414306 580.156
## 131285 -37.22402 -8.414306 579.145
## 131286 -37.22375 -8.414306 578.217
## 131287 -37.22347 -8.414306 577.331
## 131288 -37.22319 -8.414306 576.324
## 131289 -37.22291 -8.414306 575.131
## 132070 -37.38236 -8.414583 516.578
## 132071 -37.38208 -8.414583 516.614
## 132072 -37.38180 -8.414583 516.652
## 132073 -37.38152 -8.414583 516.908
## 132074 -37.38125 -8.414583 517.185
## 132075 -37.38097 -8.414583 517.411
## 132076 -37.38069 -8.414583 517.460
## 132077 -37.38041 -8.414583 517.425
## 132078 -37.38013 -8.414583 517.351
## 132079 -37.37986 -8.414583 517.351
## 132080 -37.37958 -8.414583 517.353
## 132081 -37.37930 -8.414583 517.327
## 132082 -37.37902 -8.414583 517.268
## 132083 -37.37875 -8.414583 517.175
## 132084 -37.37847 -8.414583 516.997
## 132085 -37.37819 -8.414583 517.083
## 132126 -37.36680 -8.414583 519.817
## 132127 -37.36652 -8.414583 520.475
## 132128 -37.36625 -8.414583 521.290
## 132129 -37.36597 -8.414583 522.117
## 132130 -37.36569 -8.414583 523.236
## 132131 -37.36541 -8.414583 524.266
## 132132 -37.36513 -8.414583 525.321
## 132133 -37.36486 -8.414583 526.452
## 132134 -37.36458 -8.414583 527.423
## 132135 -37.36430 -8.414583 528.043
## 132136 -37.36402 -8.414583 528.139
## 132137 -37.36375 -8.414583 528.358
## 132138 -37.36347 -8.414583 529.172
## 132139 -37.36319 -8.414583 530.878
## 132140 -37.36291 -8.414583 533.098
## 132141 -37.36263 -8.414583 535.291
## 132142 -37.36236 -8.414583 536.884
## 132143 -37.36208 -8.414583 538.363
## 132144 -37.36180 -8.414583 540.009
## 132145 -37.36152 -8.414583 542.137
## 132146 -37.36125 -8.414583 544.289
## 132147 -37.36097 -8.414583 546.247
## 132148 -37.36069 -8.414583 547.508
## 132149 -37.36041 -8.414583 548.563
## 132150 -37.36013 -8.414583 549.621
## 132151 -37.35986 -8.414583 551.010
## 132152 -37.35958 -8.414583 552.559
## 132153 -37.35930 -8.414583 554.217
## 132154 -37.35902 -8.414583 555.949
## 132155 -37.35875 -8.414583 557.598
## 132156 -37.35847 -8.414583 559.008
## 132157 -37.35819 -8.414583 560.037
## 132158 -37.35791 -8.414583 560.786
## 132159 -37.35763 -8.414583 561.391
## 132160 -37.35736 -8.414583 562.068
## 132161 -37.35708 -8.414583 562.618
## 132162 -37.35680 -8.414583 562.957
## 132163 -37.35652 -8.414583 563.028
## 132164 -37.35625 -8.414583 562.997
## 132165 -37.35597 -8.414583 562.918
## 132166 -37.35569 -8.414583 563.009
## 132167 -37.35541 -8.414583 563.135
## 132168 -37.35513 -8.414583 563.347
## 132169 -37.35486 -8.414583 563.693
## 132170 -37.35458 -8.414583 563.987
## 132171 -37.35430 -8.414583 564.111
## 132172 -37.35402 -8.414583 563.929
## 132173 -37.35375 -8.414583 563.694
## 132174 -37.35347 -8.414583 563.521
## 132175 -37.35319 -8.414583 563.666
## 132176 -37.35291 -8.414583 563.903
## 132177 -37.35263 -8.414583 564.125
## 132178 -37.35236 -8.414583 564.199
## 132179 -37.35208 -8.414583 564.190
## 132180 -37.35180 -8.414583 564.122
## 132181 -37.35152 -8.414583 563.995
## 132182 -37.35125 -8.414583 563.957
## 132183 -37.35097 -8.414583 564.102
## 132184 -37.35069 -8.414583 564.746
## 132185 -37.35041 -8.414583 565.492
## 132186 -37.35013 -8.414583 566.158
## 132187 -37.34986 -8.414583 566.457
## 132188 -37.34958 -8.414583 566.687
## 132189 -37.34930 -8.414583 567.050
## 132190 -37.34902 -8.414583 567.767
## 132191 -37.34875 -8.414583 568.516
## 132192 -37.34847 -8.414583 569.068
## 132193 -37.34819 -8.414583 569.420
## 132194 -37.34791 -8.414583 569.560
## 132195 -37.34763 -8.414583 569.723
## 132196 -37.34736 -8.414583 570.095
## 132197 -37.34708 -8.414583 570.420
## 132198 -37.34680 -8.414583 570.494
## 132199 -37.34652 -8.414583 570.119
## 132200 -37.34625 -8.414583 569.785
## 132201 -37.34597 -8.414583 569.811
## 132202 -37.34569 -8.414583 570.655
## 132203 -37.34541 -8.414583 571.616
## 132204 -37.34513 -8.414583 572.137
## 132205 -37.34486 -8.414583 571.501
## 132206 -37.34458 -8.414583 570.563
## 132207 -37.34430 -8.414583 569.840
## 132208 -37.34402 -8.414583 569.867
## 132209 -37.34375 -8.414583 570.153
## 132210 -37.34347 -8.414583 570.463
## 132211 -37.34319 -8.414583 570.448
## 132212 -37.34291 -8.414583 570.376
## 132213 -37.34263 -8.414583 570.411
## 132214 -37.34236 -8.414583 570.805
## 132215 -37.34208 -8.414583 571.156
## 132216 -37.34180 -8.414583 571.220
## 132217 -37.34152 -8.414583 570.727
## 132218 -37.34125 -8.414583 570.058
## 132219 -37.34097 -8.414583 569.377
## 132220 -37.34069 -8.414583 569.003
## 132221 -37.34041 -8.414583 568.825
## 132222 -37.34013 -8.414583 568.859
## 132223 -37.33986 -8.414583 569.143
## 132224 -37.33958 -8.414583 569.550
## 132225 -37.33930 -8.414583 569.995
## 132226 -37.33902 -8.414583 570.406
## 132227 -37.33875 -8.414583 570.655
## 132228 -37.33847 -8.414583 570.641
## 132229 -37.33819 -8.414583 570.148
## 132230 -37.33791 -8.414583 569.602
## 132231 -37.33763 -8.414583 569.325
## 132232 -37.33736 -8.414583 569.749
## 132233 -37.33708 -8.414583 570.439
## 132234 -37.33680 -8.414583 571.164
## 132235 -37.33652 -8.414583 571.695
## 132236 -37.33625 -8.414583 572.033
## 132237 -37.33597 -8.414583 572.144
## 132238 -37.33569 -8.414583 571.799
## 132239 -37.33541 -8.414583 571.460
## 132240 -37.33513 -8.414583 571.394
## 132241 -37.33486 -8.414583 571.998
## 132242 -37.33458 -8.414583 572.750
## 132243 -37.33430 -8.414583 573.341
## 132244 -37.33402 -8.414583 573.452
## 132245 -37.33375 -8.414583 573.338
## 132246 -37.33347 -8.414583 573.073
## 132247 -37.33319 -8.414583 572.860
## 132248 -37.33291 -8.414583 572.711
## 132249 -37.33263 -8.414583 572.706
## 132250 -37.33236 -8.414583 572.962
## 132251 -37.33208 -8.414583 573.355
## 132252 -37.33180 -8.414583 573.780
## 132253 -37.33152 -8.414583 574.130
## 132254 -37.33125 -8.414583 574.270
## 132255 -37.33097 -8.414583 574.111
## 132256 -37.33069 -8.414583 573.460
## 132257 -37.33041 -8.414583 572.700
## 132258 -37.33013 -8.414583 572.130
## 132259 -37.32986 -8.414583 572.156
## 132260 -37.32958 -8.414583 572.287
## 132261 -37.32930 -8.414583 572.157
## 132262 -37.32902 -8.414583 571.432
## 132263 -37.32875 -8.414583 570.625
## 132264 -37.32847 -8.414583 569.984
## 132265 -37.32819 -8.414583 569.977
## 132266 -37.32791 -8.414583 570.204
## 132267 -37.32763 -8.414583 570.515
## 132268 -37.32736 -8.414583 570.707
## 132269 -37.32708 -8.414583 570.843
## 132270 -37.32680 -8.414583 570.875
## 132271 -37.32652 -8.414583 570.779
## 132272 -37.32625 -8.414583 570.945
## 132273 -37.32597 -8.414583 571.596
## 132274 -37.32569 -8.414583 573.355
## 132275 -37.32541 -8.414583 575.292
## 132276 -37.32513 -8.414583 576.917
## 132277 -37.32486 -8.414583 577.508
## 132278 -37.32458 -8.414583 577.638
## 132279 -37.32430 -8.414583 577.511
## 132280 -37.32402 -8.414583 577.445
## 132281 -37.32375 -8.414583 577.476
## 132282 -37.32347 -8.414583 577.671
## 132283 -37.32319 -8.414583 578.254
## 132284 -37.32291 -8.414583 578.904
## 132285 -37.32263 -8.414583 579.456
## 132286 -37.32236 -8.414583 579.655
## 132287 -37.32208 -8.414583 579.786
## 132288 -37.32180 -8.414583 580.001
## 132289 -37.32152 -8.414583 580.463
## 132290 -37.32125 -8.414583 580.987
## 132291 -37.32097 -8.414583 581.479
## 132292 -37.32069 -8.414583 581.808
## 132293 -37.32041 -8.414583 582.048
## 132294 -37.32013 -8.414583 582.245
## 132295 -37.31986 -8.414583 582.446
## 132296 -37.31958 -8.414583 582.481
## 132297 -37.31930 -8.414583 582.187
## 132298 -37.31902 -8.414583 581.432
## 132299 -37.31875 -8.414583 580.634
## 132300 -37.31847 -8.414583 580.020
## 132301 -37.31819 -8.414583 580.049
## 132302 -37.31791 -8.414583 580.251
## 132303 -37.31763 -8.414583 580.393
## 132304 -37.31736 -8.414583 580.091
## 132305 -37.31708 -8.414583 579.646
## 132306 -37.31680 -8.414583 579.166
## 132307 -37.31652 -8.414583 578.912
## 132308 -37.31625 -8.414583 578.653
## 132309 -37.31597 -8.414583 578.282
## 132310 -37.31569 -8.414583 577.615
## 132311 -37.31541 -8.414583 576.768
## 132312 -37.31513 -8.414583 575.781
## 132313 -37.31486 -8.414583 574.718
## 132314 -37.31458 -8.414583 573.673
## 132315 -37.31430 -8.414583 572.735
## 132316 -37.31402 -8.414583 572.012
## 132317 -37.31375 -8.414583 571.338
## 132318 -37.31347 -8.414583 570.637
## 132319 -37.31319 -8.414583 569.680
## 132320 -37.31291 -8.414583 568.723
## 132321 -37.31263 -8.414583 567.874
## 132322 -37.31236 -8.414583 567.268
## 132323 -37.31208 -8.414583 567.030
## 132324 -37.31180 -8.414583 567.343
## 132325 -37.31152 -8.414583 568.321
## 132326 -37.31125 -8.414583 569.488
## 132327 -37.31097 -8.414583 570.549
## 132328 -37.31069 -8.414583 570.897
## 132329 -37.31041 -8.414583 571.067
## 132330 -37.31013 -8.414583 571.267
## 132331 -37.30986 -8.414583 571.786
## 132332 -37.30958 -8.414583 572.596
## 132333 -37.30930 -8.414583 573.764
## 132334 -37.30902 -8.414583 575.337
## 132335 -37.30875 -8.414583 577.115
## 132336 -37.30847 -8.414583 578.977
## 132337 -37.30819 -8.414583 580.692
## 132338 -37.30791 -8.414583 582.287
## 132339 -37.30763 -8.414583 583.731
## 132340 -37.30736 -8.414583 585.042
## 132341 -37.30708 -8.414583 586.205
## 132342 -37.30680 -8.414583 587.229
## 132343 -37.30652 -8.414583 588.147
## 132344 -37.30625 -8.414583 588.878
## 132345 -37.30597 -8.414583 589.353
## 132346 -37.30569 -8.414583 589.362
## 132347 -37.30541 -8.414583 589.234
## 132348 -37.30513 -8.414583 589.173
## 132349 -37.30486 -8.414583 589.489
## 132350 -37.30458 -8.414583 589.766
## 132351 -37.30430 -8.414583 589.916
## 132352 -37.30402 -8.414583 589.208
## 132353 -37.30375 -8.414583 588.345
## 132354 -37.30347 -8.414583 587.455
## 132355 -37.30319 -8.414583 586.926
## 132356 -37.30291 -8.414583 586.400
## 132357 -37.30263 -8.414583 585.720
## 132358 -37.30236 -8.414583 584.756
## 132359 -37.30208 -8.414583 583.512
## 132360 -37.30180 -8.414583 581.950
## 132361 -37.30152 -8.414583 580.034
## 132362 -37.30125 -8.414583 578.187
## 132363 -37.30097 -8.414583 576.654
## 132364 -37.30069 -8.414583 575.928
## 132365 -37.30041 -8.414583 575.611
## 132366 -37.30013 -8.414583 575.586
## 132367 -37.29986 -8.414583 575.606
## 132368 -37.29958 -8.414583 575.844
## 132369 -37.29930 -8.414583 576.319
## 132370 -37.29902 -8.414583 577.067
## 132371 -37.29875 -8.414583 577.827
## 132372 -37.29847 -8.414583 578.446
## 132373 -37.29819 -8.414583 578.729
## 132374 -37.29791 -8.414583 578.798
## 132375 -37.29763 -8.414583 578.706
## 132376 -37.29736 -8.414583 578.421
## 132377 -37.29708 -8.414583 578.168
## 132378 -37.29680 -8.414583 577.983
## 132379 -37.29652 -8.414583 578.359
## 132380 -37.29625 -8.414583 578.640
## 132381 -37.29597 -8.414583 578.570
## 132382 -37.29569 -8.414583 577.574
## 132383 -37.29541 -8.414583 576.457
## 132384 -37.29513 -8.414583 575.727
## 132385 -37.29486 -8.414583 576.052
## 132386 -37.29458 -8.414583 576.620
## 132387 -37.29430 -8.414583 576.906
## 132388 -37.29402 -8.414583 576.367
## 132389 -37.29375 -8.414583 575.668
## 132390 -37.29347 -8.414583 575.072
## 132391 -37.29319 -8.414583 575.075
## 132392 -37.29291 -8.414583 575.354
## 132393 -37.29263 -8.414583 575.835
## 132394 -37.29236 -8.414583 576.502
## 132395 -37.29208 -8.414583 577.020
## 132396 -37.29180 -8.414583 577.083
## 132397 -37.29152 -8.414583 576.388
## 132398 -37.29125 -8.414583 575.337
## 132399 -37.29097 -8.414583 574.108
## 132400 -37.29069 -8.414583 572.987
## 132401 -37.29041 -8.414583 571.946
## 132402 -37.29013 -8.414583 571.057
## 132403 -37.28986 -8.414583 570.470
## 132404 -37.28958 -8.414583 569.992
## 132405 -37.28930 -8.414583 569.589
## 132406 -37.28902 -8.414583 569.133
## 132407 -37.28875 -8.414583 568.585
## 132408 -37.28847 -8.414583 567.830
## 132409 -37.28819 -8.414583 566.593
## 132410 -37.28791 -8.414583 565.328
## 132411 -37.28763 -8.414583 564.286
## 132412 -37.28736 -8.414583 563.785
## 132413 -37.28708 -8.414583 563.540
## 132414 -37.28680 -8.414583 563.406
## 132415 -37.28652 -8.414583 563.204
## 132416 -37.28625 -8.414583 563.114
## 132417 -37.28597 -8.414583 563.180
## 132418 -37.28569 -8.414583 563.592
## 132419 -37.28541 -8.414583 564.202
## 132420 -37.28513 -8.414583 564.978
## 132421 -37.28486 -8.414583 565.896
## 132422 -37.28458 -8.414583 566.851
## 132423 -37.28430 -8.414583 567.706
## 132424 -37.28402 -8.414583 568.300
## 132425 -37.28375 -8.414583 568.830
## 132426 -37.28347 -8.414583 569.382
## 132427 -37.28319 -8.414583 570.191
## 132428 -37.28291 -8.414583 570.894
## 132429 -37.28263 -8.414583 571.331
## 132430 -37.28236 -8.414583 571.340
## 132431 -37.28208 -8.414583 570.971
## 132432 -37.28180 -8.414583 570.193
## 132433 -37.28152 -8.414583 569.024
## 132434 -37.28125 -8.414583 567.770
## 132435 -37.28097 -8.414583 566.637
## 132436 -37.28069 -8.414583 565.888
## 132437 -37.28041 -8.414583 565.452
## 132438 -37.28013 -8.414583 565.333
## 132439 -37.27986 -8.414583 565.573
## 132440 -37.27958 -8.414583 566.058
## 132441 -37.27930 -8.414583 566.738
## 132442 -37.27902 -8.414583 567.554
## 132443 -37.27875 -8.414583 568.346
## 132444 -37.27847 -8.414583 568.984
## 132445 -37.27819 -8.414583 569.126
## 132446 -37.27791 -8.414583 569.263
## 132447 -37.27763 -8.414583 569.665
## 132448 -37.27736 -8.414583 570.664
## 132449 -37.27708 -8.414583 571.882
## 132450 -37.27680 -8.414583 573.125
## 132451 -37.27652 -8.414583 574.218
## 132452 -37.27625 -8.414583 575.195
## 132453 -37.27597 -8.414583 576.032
## 132454 -37.27569 -8.414583 576.684
## 132455 -37.27541 -8.414583 577.189
## 132456 -37.27513 -8.414583 577.571
## 132457 -37.27486 -8.414583 577.880
## 132458 -37.27458 -8.414583 578.119
## 132459 -37.27430 -8.414583 578.334
## 132460 -37.27402 -8.414583 578.548
## 132461 -37.27375 -8.414583 578.587
## 132462 -37.27347 -8.414583 578.315
## 132463 -37.27319 -8.414583 577.484
## 132464 -37.27291 -8.414583 576.485
## 132465 -37.27263 -8.414583 575.560
## 132466 -37.27236 -8.414583 574.999
## 132467 -37.27208 -8.414583 574.517
## 132468 -37.27180 -8.414583 573.935
## 132469 -37.27152 -8.414583 573.140
## 132470 -37.27125 -8.414583 572.428
## 132471 -37.27097 -8.414583 571.977
## 132472 -37.27069 -8.414583 572.026
## 132473 -37.27041 -8.414583 572.371
## 132474 -37.27013 -8.414583 572.895
## 132475 -37.26986 -8.414583 573.495
## 132476 -37.26958 -8.414583 574.175
## 132477 -37.26930 -8.414583 574.859
## 132478 -37.26902 -8.414583 575.797
## 132479 -37.26875 -8.414583 576.630
## 132480 -37.26847 -8.414583 577.295
## 132481 -37.26819 -8.414583 577.557
## 132482 -37.26791 -8.414583 577.576
## 132483 -37.26763 -8.414583 577.380
## 132484 -37.26736 -8.414583 576.976
## 132485 -37.26708 -8.414583 576.593
## 132486 -37.26680 -8.414583 576.489
## 132487 -37.26652 -8.414583 576.867
## 132488 -37.26625 -8.414583 577.218
## 132489 -37.26597 -8.414583 577.276
## 132490 -37.26569 -8.414583 576.536
## 132491 -37.26541 -8.414583 575.564
## 132492 -37.26513 -8.414583 574.641
## 132493 -37.26486 -8.414583 574.137
## 132494 -37.26458 -8.414583 573.701
## 132495 -37.26430 -8.414583 573.178
## 132496 -37.26402 -8.414583 572.430
## 132497 -37.26375 -8.414583 571.536
## 132498 -37.26347 -8.414583 570.508
## 132499 -37.26319 -8.414583 569.251
## 132500 -37.26291 -8.414583 568.192
## 132501 -37.26263 -8.414583 567.578
## 132502 -37.26236 -8.414583 567.642
## 132503 -37.26208 -8.414583 568.308
## 132504 -37.26180 -8.414583 569.440
## 132505 -37.26152 -8.414583 571.256
## 132506 -37.26125 -8.414583 573.057
## 132507 -37.26097 -8.414583 574.537
## 132508 -37.26069 -8.414583 575.249
## 132509 -37.26041 -8.414583 575.236
## 132510 -37.26013 -8.414583 574.445
## 132511 -37.25986 -8.414583 572.887
## 132512 -37.25958 -8.414583 571.075
## 132513 -37.25930 -8.414583 569.463
## 132514 -37.25902 -8.414583 568.508
## 132515 -37.25875 -8.414583 567.903
## 132516 -37.25847 -8.414583 567.557
## 132517 -37.25819 -8.414583 567.299
## 132518 -37.25791 -8.414583 567.020
## 132519 -37.25763 -8.414583 566.552
## 132520 -37.25736 -8.414583 565.678
## 132521 -37.25708 -8.414583 565.035
## 132522 -37.25680 -8.414583 565.130
## 132523 -37.25652 -8.414583 566.334
## 132524 -37.25625 -8.414583 567.858
## 132525 -37.25597 -8.414583 569.229
## 132526 -37.25569 -8.414583 569.606
## 132527 -37.25541 -8.414583 569.544
## 132528 -37.25513 -8.414583 569.243
## 132529 -37.25486 -8.414583 569.048
## 132530 -37.25458 -8.414583 568.670
## 132531 -37.25430 -8.414583 568.039
## 132532 -37.25402 -8.414583 567.116
## 132533 -37.25375 -8.414583 566.319
## 132534 -37.25347 -8.414583 566.056
## 132535 -37.25319 -8.414583 566.811
## 132536 -37.25291 -8.414583 568.014
## 132537 -37.25263 -8.414583 569.281
## 132538 -37.25236 -8.414583 570.116
## 132539 -37.25208 -8.414583 570.662
## 132540 -37.25180 -8.414583 570.940
## 132541 -37.25152 -8.414583 571.010
## 132542 -37.25125 -8.414583 570.912
## 132543 -37.25097 -8.414583 570.744
## 132544 -37.25069 -8.414583 570.642
## 132545 -37.25041 -8.414583 570.483
## 132546 -37.25013 -8.414583 570.186
## 132547 -37.24986 -8.414583 569.626
## 132548 -37.24958 -8.414583 569.051
## 132549 -37.24930 -8.414583 568.619
## 132550 -37.24902 -8.414583 568.450
## 132551 -37.24875 -8.414583 568.604
## 132552 -37.24847 -8.414583 569.114
## 132553 -37.24819 -8.414583 570.092
## 132554 -37.24791 -8.414583 571.294
## 132555 -37.24763 -8.414583 572.579
## 132556 -37.24736 -8.414583 573.848
## 132557 -37.24708 -8.414583 575.034
## 132558 -37.24680 -8.414583 576.050
## 132559 -37.24652 -8.414583 576.816
## 132560 -37.24625 -8.414583 577.447
## 132561 -37.24597 -8.414583 577.987
## 132562 -37.24569 -8.414583 578.441
## 132563 -37.24541 -8.414583 578.988
## 132564 -37.24513 -8.414583 579.770
## 132565 -37.24486 -8.414583 580.990
## 132566 -37.24458 -8.414583 582.323
## 132567 -37.24430 -8.414583 583.558
## 132568 -37.24402 -8.414583 584.529
## 132569 -37.24375 -8.414583 585.418
## 132570 -37.24347 -8.414583 586.312
## 132571 -37.24319 -8.414583 587.397
## 132572 -37.24291 -8.414583 588.538
## 132573 -37.24263 -8.414583 589.697
## 132574 -37.24236 -8.414583 590.815
## 132575 -37.24208 -8.414583 591.855
## 132576 -37.24180 -8.414583 592.728
## 132577 -37.24152 -8.414583 593.347
## 132578 -37.24125 -8.414583 593.835
## 132579 -37.24097 -8.414583 594.263
## 132580 -37.24069 -8.414583 594.808
## 132581 -37.24041 -8.414583 595.218
## 132582 -37.24013 -8.414583 595.387
## 132583 -37.23986 -8.414583 595.156
## 132584 -37.23958 -8.414583 594.874
## 132585 -37.23930 -8.414583 594.754
## 132586 -37.23902 -8.414583 594.928
## 132587 -37.23875 -8.414583 595.111
## 132588 -37.23847 -8.414583 595.126
## 132589 -37.23819 -8.414583 594.768
## 132590 -37.23791 -8.414583 594.106
## 132591 -37.23763 -8.414583 593.161
## 132592 -37.23736 -8.414583 591.938
## 132593 -37.23708 -8.414583 590.522
## 132594 -37.23680 -8.414583 588.949
## 132595 -37.23652 -8.414583 587.276
## 132596 -37.23625 -8.414583 585.627
## 132597 -37.23597 -8.414583 584.115
## 132598 -37.23569 -8.414583 582.924
## 132599 -37.23541 -8.414583 581.933
## 132600 -37.23513 -8.414583 581.118
## 132601 -37.23486 -8.414583 580.505
## 132602 -37.23458 -8.414583 579.974
## 132603 -37.23430 -8.414583 579.238
## 132604 -37.23402 -8.414583 578.927
## 132605 -37.23375 -8.414583 578.545
## 132606 -37.23347 -8.414583 578.504
## 132607 -37.23319 -8.414583 578.885
## 132608 -37.23291 -8.414583 579.398
## 132609 -37.23263 -8.414583 579.802
## 132610 -37.23236 -8.414583 579.945
## 132611 -37.23208 -8.414583 580.024
## 132612 -37.23180 -8.414583 580.275
## 132613 -37.23152 -8.414583 580.906
## 132614 -37.23125 -8.414583 581.871
## 132615 -37.23097 -8.414583 583.110
## 132616 -37.23069 -8.414583 584.594
## 132617 -37.23041 -8.414583 586.060
## 132618 -37.23013 -8.414583 587.295
## 132619 -37.22986 -8.414583 588.055
## 132620 -37.22958 -8.414583 588.583
## 132621 -37.22930 -8.414583 589.059
## 132622 -37.22902 -8.414583 589.599
## 132623 -37.22875 -8.414583 589.944
## 132624 -37.22847 -8.414583 589.983
## 132625 -37.22819 -8.414583 589.500
## 132626 -37.22791 -8.414583 588.851
## 132627 -37.22763 -8.414583 588.228
## 132628 -37.22736 -8.414583 587.812
## 132629 -37.22708 -8.414583 587.610
## 132630 -37.22680 -8.414583 587.661
## 132631 -37.22652 -8.414583 587.927
## 132632 -37.22625 -8.414583 588.170
## 132633 -37.22597 -8.414583 588.088
## 132634 -37.22569 -8.414583 587.431
## 132635 -37.22541 -8.414583 586.386
## 132636 -37.22513 -8.414583 585.097
## 132637 -37.22486 -8.414583 583.736
## 132638 -37.22458 -8.414583 582.373
## 132639 -37.22430 -8.414583 581.118
## 132640 -37.22402 -8.414583 580.029
## 132641 -37.22375 -8.414583 579.008
## 132642 -37.22347 -8.414583 577.995
## 132643 -37.22319 -8.414583 576.855
## 132644 -37.22291 -8.414583 575.768
## 132645 -37.22263 -8.414583 574.823
## 133424 -37.38263 -8.414861 516.595
## 133425 -37.38236 -8.414861 517.000
## 133426 -37.38208 -8.414861 517.305
## 133427 -37.38180 -8.414861 517.134
## 133428 -37.38152 -8.414861 517.496
## 133429 -37.38125 -8.414861 517.886
## 133430 -37.38097 -8.414861 518.057
## 133431 -37.38069 -8.414861 518.057
## 133432 -37.38041 -8.414861 517.953
## 133433 -37.38013 -8.414861 518.352
## 133434 -37.37986 -8.414861 518.532
## 133435 -37.37958 -8.414861 518.731
## 133436 -37.37930 -8.414861 518.464
## 133437 -37.37902 -8.414861 517.817
## 133438 -37.37875 -8.414861 517.579
## 133439 -37.37847 -8.414861 517.212
## 133440 -37.37819 -8.414861 517.017
## 133441 -37.37791 -8.414861 516.862
## 133442 -37.37763 -8.414861 516.949
## 133443 -37.37736 -8.414861 517.079
## 133481 -37.36680 -8.414861 520.175
## 133482 -37.36652 -8.414861 520.962
## 133483 -37.36625 -8.414861 521.712
## 133484 -37.36597 -8.414861 522.298
## 133485 -37.36569 -8.414861 522.684
## 133486 -37.36541 -8.414861 523.624
## 133487 -37.36513 -8.414861 524.559
## 133488 -37.36486 -8.414861 525.718
## 133489 -37.36458 -8.414861 526.745
## 133490 -37.36430 -8.414861 527.566
## 133491 -37.36402 -8.414861 527.856
## 133492 -37.36375 -8.414861 528.166
## 133493 -37.36347 -8.414861 529.012
## 133494 -37.36319 -8.414861 530.841
## 133495 -37.36291 -8.414861 533.087
## 133496 -37.36263 -8.414861 535.344
## 133497 -37.36236 -8.414861 536.937
## 133498 -37.36208 -8.414861 538.515
## 133499 -37.36180 -8.414861 540.201
## 133500 -37.36152 -8.414861 542.450
## 133501 -37.36125 -8.414861 544.735
## 133502 -37.36097 -8.414861 546.822
## 133503 -37.36069 -8.414861 548.190
## 133504 -37.36041 -8.414861 549.337
## 133505 -37.36013 -8.414861 550.606
## 133506 -37.35986 -8.414861 552.066
## 133507 -37.35958 -8.414861 553.560
## 133508 -37.35930 -8.414861 555.183
## 133509 -37.35902 -8.414861 556.773
## 133510 -37.35875 -8.414861 558.400
## 133511 -37.35847 -8.414861 559.698
## 133512 -37.35819 -8.414861 560.384
## 133513 -37.35791 -8.414861 561.105
## 133514 -37.35763 -8.414861 561.773
## 133515 -37.35736 -8.414861 562.561
## 133516 -37.35708 -8.414861 563.085
## 133517 -37.35680 -8.414861 563.665
## 133518 -37.35652 -8.414861 563.742
## 133519 -37.35625 -8.414861 563.707
## 133520 -37.35597 -8.414861 563.701
## 133521 -37.35569 -8.414861 563.529
## 133522 -37.35541 -8.414861 563.639
## 133523 -37.35513 -8.414861 563.666
## 133524 -37.35486 -8.414861 563.810
## 133525 -37.35458 -8.414861 563.920
## 133526 -37.35430 -8.414861 564.017
## 133527 -37.35402 -8.414861 563.801
## 133528 -37.35375 -8.414861 563.768
## 133529 -37.35347 -8.414861 563.739
## 133530 -37.35319 -8.414861 564.085
## 133531 -37.35291 -8.414861 564.354
## 133532 -37.35263 -8.414861 564.708
## 133533 -37.35236 -8.414861 564.802
## 133534 -37.35208 -8.414861 564.830
## 133535 -37.35180 -8.414861 564.722
## 133536 -37.35152 -8.414861 564.440
## 133537 -37.35125 -8.414861 564.500
## 133538 -37.35097 -8.414861 564.781
## 133539 -37.35069 -8.414861 565.523
## 133540 -37.35041 -8.414861 566.406
## 133541 -37.35013 -8.414861 567.405
## 133542 -37.34986 -8.414861 567.844
## 133543 -37.34958 -8.414861 568.050
## 133544 -37.34930 -8.414861 568.333
## 133545 -37.34902 -8.414861 568.804
## 133546 -37.34875 -8.414861 569.400
## 133547 -37.34847 -8.414861 569.739
## 133548 -37.34819 -8.414861 569.722
## 133549 -37.34791 -8.414861 569.814
## 133550 -37.34763 -8.414861 569.976
## 133551 -37.34736 -8.414861 570.511
## 133552 -37.34708 -8.414861 571.060
## 133553 -37.34680 -8.414861 571.360
## 133554 -37.34652 -8.414861 571.242
## 133555 -37.34625 -8.414861 571.013
## 133556 -37.34597 -8.414861 571.032
## 133557 -37.34569 -8.414861 572.049
## 133558 -37.34541 -8.414861 572.879
## 133559 -37.34513 -8.414861 573.229
## 133560 -37.34486 -8.414861 572.361
## 133561 -37.34458 -8.414861 571.364
## 133562 -37.34430 -8.414861 570.477
## 133563 -37.34402 -8.414861 570.550
## 133564 -37.34375 -8.414861 570.911
## 133565 -37.34347 -8.414861 571.303
## 133566 -37.34319 -8.414861 571.469
## 133567 -37.34291 -8.414861 571.359
## 133568 -37.34263 -8.414861 571.232
## 133569 -37.34236 -8.414861 571.501
## 133570 -37.34208 -8.414861 571.745
## 133571 -37.34180 -8.414861 571.751
## 133572 -37.34152 -8.414861 571.190
## 133573 -37.34125 -8.414861 570.752
## 133574 -37.34097 -8.414861 570.262
## 133575 -37.34069 -8.414861 570.132
## 133576 -37.34041 -8.414861 569.994
## 133577 -37.34013 -8.414861 570.163
## 133578 -37.33986 -8.414861 570.482
## 133579 -37.33958 -8.414861 570.911
## 133580 -37.33930 -8.414861 571.259
## 133581 -37.33902 -8.414861 571.489
## 133582 -37.33875 -8.414861 571.622
## 133583 -37.33847 -8.414861 571.589
## 133584 -37.33819 -8.414861 570.855
## 133585 -37.33791 -8.414861 570.545
## 133586 -37.33763 -8.414861 570.342
## 133587 -37.33736 -8.414861 570.870
## 133588 -37.33708 -8.414861 571.542
## 133589 -37.33680 -8.414861 572.543
## 133590 -37.33652 -8.414861 573.036
## 133591 -37.33625 -8.414861 573.343
## 133592 -37.33597 -8.414861 573.261
## 133593 -37.33569 -8.414861 572.630
## 133594 -37.33541 -8.414861 572.140
## 133595 -37.33513 -8.414861 571.604
## 133596 -37.33486 -8.414861 571.990
## 133597 -37.33458 -8.414861 572.481
## 133598 -37.33430 -8.414861 573.080
## 133599 -37.33402 -8.414861 573.312
## 133600 -37.33375 -8.414861 573.534
## 133601 -37.33347 -8.414861 573.770
## 133602 -37.33319 -8.414861 573.901
## 133603 -37.33291 -8.414861 573.855
## 133604 -37.33263 -8.414861 574.098
## 133605 -37.33236 -8.414861 574.415
## 133606 -37.33208 -8.414861 574.963
## 133607 -37.33180 -8.414861 575.520
## 133608 -37.33152 -8.414861 575.749
## 133609 -37.33125 -8.414861 575.941
## 133610 -37.33097 -8.414861 575.610
## 133611 -37.33069 -8.414861 574.956
## 133612 -37.33041 -8.414861 573.935
## 133613 -37.33013 -8.414861 573.436
## 133614 -37.32986 -8.414861 573.468
## 133615 -37.32958 -8.414861 573.639
## 133616 -37.32930 -8.414861 573.989
## 133617 -37.32902 -8.414861 573.571
## 133618 -37.32875 -8.414861 572.992
## 133619 -37.32847 -8.414861 572.319
## 133620 -37.32819 -8.414861 572.346
## 133621 -37.32791 -8.414861 572.586
## 133622 -37.32763 -8.414861 572.795
## 133623 -37.32736 -8.414861 572.730
## 133624 -37.32708 -8.414861 572.607
## 133625 -37.32680 -8.414861 572.750
## 133626 -37.32652 -8.414861 572.545
## 133627 -37.32625 -8.414861 572.977
## 133628 -37.32597 -8.414861 573.432
## 133629 -37.32569 -8.414861 574.867
## 133630 -37.32541 -8.414861 576.468
## 133631 -37.32513 -8.414861 577.852
## 133632 -37.32486 -8.414861 578.256
## 133633 -37.32458 -8.414861 578.542
## 133634 -37.32430 -8.414861 578.345
## 133635 -37.32402 -8.414861 578.291
## 133636 -37.32375 -8.414861 578.270
## 133637 -37.32347 -8.414861 578.371
## 133638 -37.32319 -8.414861 578.841
## 133639 -37.32291 -8.414861 579.171
## 133640 -37.32263 -8.414861 579.670
## 133641 -37.32236 -8.414861 579.989
## 133642 -37.32208 -8.414861 580.284
## 133643 -37.32180 -8.414861 580.774
## 133644 -37.32152 -8.414861 581.307
## 133645 -37.32125 -8.414861 581.797
## 133646 -37.32097 -8.414861 582.345
## 133647 -37.32069 -8.414861 582.600
## 133648 -37.32041 -8.414861 582.821
## 133649 -37.32013 -8.414861 582.692
## 133650 -37.31986 -8.414861 582.562
## 133651 -37.31958 -8.414861 582.297
## 133652 -37.31930 -8.414861 582.161
## 133653 -37.31902 -8.414861 581.391
## 133654 -37.31875 -8.414861 580.876
## 133655 -37.31847 -8.414861 580.337
## 133656 -37.31819 -8.414861 580.469
## 133657 -37.31791 -8.414861 580.728
## 133658 -37.31763 -8.414861 580.904
## 133659 -37.31736 -8.414861 580.774
## 133660 -37.31708 -8.414861 580.567
## 133661 -37.31680 -8.414861 580.054
## 133662 -37.31652 -8.414861 579.801
## 133663 -37.31625 -8.414861 579.407
## 133664 -37.31597 -8.414861 578.442
## 133665 -37.31569 -8.414861 577.483
## 133666 -37.31541 -8.414861 576.800
## 133667 -37.31513 -8.414861 575.953
## 133668 -37.31486 -8.414861 575.058
## 133669 -37.31458 -8.414861 573.957
## 133670 -37.31430 -8.414861 573.242
## 133671 -37.31402 -8.414861 572.552
## 133672 -37.31375 -8.414861 571.845
## 133673 -37.31347 -8.414861 570.871
## 133674 -37.31319 -8.414861 569.921
## 133675 -37.31291 -8.414861 569.218
## 133676 -37.31263 -8.414861 568.724
## 133677 -37.31236 -8.414861 568.308
## 133678 -37.31208 -8.414861 568.145
## 133679 -37.31180 -8.414861 568.401
## 133680 -37.31152 -8.414861 569.240
## 133681 -37.31125 -8.414861 570.331
## 133682 -37.31097 -8.414861 571.068
## 133683 -37.31069 -8.414861 571.246
## 133684 -37.31041 -8.414861 571.449
## 133685 -37.31013 -8.414861 571.883
## 133686 -37.30986 -8.414861 572.518
## 133687 -37.30958 -8.414861 573.417
## 133688 -37.30930 -8.414861 574.914
## 133689 -37.30902 -8.414861 576.586
## 133690 -37.30875 -8.414861 578.433
## 133691 -37.30847 -8.414861 579.903
## 133692 -37.30819 -8.414861 581.467
## 133693 -37.30791 -8.414861 582.942
## 133694 -37.30763 -8.414861 584.129
## 133695 -37.30736 -8.414861 585.443
## 133696 -37.30708 -8.414861 586.508
## 133697 -37.30680 -8.414861 588.027
## 133698 -37.30652 -8.414861 589.256
## 133699 -37.30625 -8.414861 589.970
## 133700 -37.30597 -8.414861 590.431
## 133701 -37.30569 -8.414861 590.480
## 133702 -37.30541 -8.414861 590.456
## 133703 -37.30513 -8.414861 590.405
## 133704 -37.30486 -8.414861 590.780
## 133705 -37.30458 -8.414861 591.134
## 133706 -37.30430 -8.414861 591.175
## 133707 -37.30402 -8.414861 590.561
## 133708 -37.30375 -8.414861 589.826
## 133709 -37.30347 -8.414861 589.111
## 133710 -37.30319 -8.414861 588.794
## 133711 -37.30291 -8.414861 588.679
## 133712 -37.30263 -8.414861 588.260
## 133713 -37.30236 -8.414861 587.279
## 133714 -37.30208 -8.414861 585.966
## 133715 -37.30180 -8.414861 584.309
## 133716 -37.30152 -8.414861 582.155
## 133717 -37.30125 -8.414861 580.190
## 133718 -37.30097 -8.414861 578.395
## 133719 -37.30069 -8.414861 577.328
## 133720 -37.30041 -8.414861 576.711
## 133721 -37.30013 -8.414861 576.262
## 133722 -37.29986 -8.414861 576.026
## 133723 -37.29958 -8.414861 576.099
## 133724 -37.29930 -8.414861 576.763
## 133725 -37.29902 -8.414861 577.572
## 133726 -37.29875 -8.414861 578.534
## 133727 -37.29847 -8.414861 579.322
## 133728 -37.29819 -8.414861 579.433
## 133729 -37.29791 -8.414861 579.294
## 133730 -37.29763 -8.414861 578.518
## 133731 -37.29736 -8.414861 578.171
## 133732 -37.29708 -8.414861 577.926
## 133733 -37.29680 -8.414861 578.171
## 133734 -37.29652 -8.414861 578.998
## 133735 -37.29625 -8.414861 579.426
## 133736 -37.29597 -8.414861 579.831
## 133737 -37.29569 -8.414861 579.144
## 133738 -37.29541 -8.414861 578.247
## 133739 -37.29513 -8.414861 577.281
## 133740 -37.29486 -8.414861 577.252
## 133741 -37.29458 -8.414861 577.447
## 133742 -37.29430 -8.414861 577.328
## 133743 -37.29402 -8.414861 576.431
## 133744 -37.29375 -8.414861 575.563
## 133745 -37.29347 -8.414861 575.131
## 133746 -37.29319 -8.414861 575.280
## 133747 -37.29291 -8.414861 576.092
## 133748 -37.29263 -8.414861 577.140
## 133749 -37.29236 -8.414861 577.796
## 133750 -37.29208 -8.414861 577.939
## 133751 -37.29180 -8.414861 577.725
## 133752 -37.29152 -8.414861 576.792
## 133753 -37.29125 -8.414861 575.867
## 133754 -37.29097 -8.414861 574.723
## 133755 -37.29069 -8.414861 573.806
## 133756 -37.29041 -8.414861 572.911
## 133757 -37.29013 -8.414861 572.094
## 133758 -37.28986 -8.414861 571.563
## 133759 -37.28958 -8.414861 571.025
## 133760 -37.28930 -8.414861 570.527
## 133761 -37.28902 -8.414861 570.021
## 133762 -37.28875 -8.414861 569.452
## 133763 -37.28847 -8.414861 568.904
## 133764 -37.28819 -8.414861 567.623
## 133765 -37.28791 -8.414861 566.341
## 133766 -37.28763 -8.414861 565.047
## 133767 -37.28736 -8.414861 564.494
## 133768 -37.28708 -8.414861 564.179
## 133769 -37.28680 -8.414861 563.585
## 133770 -37.28652 -8.414861 563.132
## 133771 -37.28625 -8.414861 562.894
## 133772 -37.28597 -8.414861 563.127
## 133773 -37.28569 -8.414861 563.732
## 133774 -37.28541 -8.414861 564.536
## 133775 -37.28513 -8.414861 565.777
## 133776 -37.28486 -8.414861 566.672
## 133777 -37.28458 -8.414861 567.580
## 133778 -37.28430 -8.414861 568.048
## 133779 -37.28402 -8.414861 568.129
## 133780 -37.28375 -8.414861 568.406
## 133781 -37.28347 -8.414861 568.415
## 133782 -37.28319 -8.414861 568.889
## 133783 -37.28291 -8.414861 569.539
## 133784 -37.28263 -8.414861 570.035
## 133785 -37.28236 -8.414861 570.150
## 133786 -37.28208 -8.414861 569.903
## 133787 -37.28180 -8.414861 569.285
## 133788 -37.28152 -8.414861 568.362
## 133789 -37.28125 -8.414861 567.278
## 133790 -37.28097 -8.414861 566.283
## 133791 -37.28069 -8.414861 565.747
## 133792 -37.28041 -8.414861 565.553
## 133793 -37.28013 -8.414861 565.659
## 133794 -37.27986 -8.414861 566.191
## 133795 -37.27958 -8.414861 566.880
## 133796 -37.27930 -8.414861 568.055
## 133797 -37.27902 -8.414861 568.867
## 133798 -37.27875 -8.414861 569.715
## 133799 -37.27847 -8.414861 570.019
## 133800 -37.27819 -8.414861 570.004
## 133801 -37.27791 -8.414861 569.926
## 133802 -37.27763 -8.414861 569.883
## 133803 -37.27736 -8.414861 570.694
## 133804 -37.27708 -8.414861 571.742
## 133805 -37.27680 -8.414861 573.201
## 133806 -37.27652 -8.414861 574.280
## 133807 -37.27625 -8.414861 575.232
## 133808 -37.27597 -8.414861 575.899
## 133809 -37.27569 -8.414861 576.518
## 133810 -37.27541 -8.414861 576.940
## 133811 -37.27513 -8.414861 577.197
## 133812 -37.27486 -8.414861 577.589
## 133813 -37.27458 -8.414861 577.875
## 133814 -37.27430 -8.414861 578.421
## 133815 -37.27402 -8.414861 578.603
## 133816 -37.27375 -8.414861 578.509
## 133817 -37.27347 -8.414861 578.006
## 133818 -37.27319 -8.414861 577.016
## 133819 -37.27291 -8.414861 575.827
## 133820 -37.27263 -8.414861 574.737
## 133821 -37.27236 -8.414861 574.047
## 133822 -37.27208 -8.414861 573.609
## 133823 -37.27180 -8.414861 573.108
## 133824 -37.27152 -8.414861 572.428
## 133825 -37.27125 -8.414861 571.782
## 133826 -37.27097 -8.414861 571.193
## 133827 -37.27069 -8.414861 571.478
## 133828 -37.27041 -8.414861 572.047
## 133829 -37.27013 -8.414861 572.875
## 133830 -37.26986 -8.414861 574.024
## 133831 -37.26958 -8.414861 575.005
## 133832 -37.26930 -8.414861 576.124
## 133833 -37.26902 -8.414861 577.195
## 133834 -37.26875 -8.414861 577.934
## 133835 -37.26847 -8.414861 578.371
## 133836 -37.26819 -8.414861 578.466
## 133837 -37.26791 -8.414861 578.165
## 133838 -37.26763 -8.414861 577.769
## 133839 -37.26736 -8.414861 577.419
## 133840 -37.26708 -8.414861 577.197
## 133841 -37.26680 -8.414861 577.311
## 133842 -37.26652 -8.414861 577.868
## 133843 -37.26625 -8.414861 578.255
## 133844 -37.26597 -8.414861 578.288
## 133845 -37.26569 -8.414861 577.492
## 133846 -37.26541 -8.414861 576.417
## 133847 -37.26513 -8.414861 575.247
## 133848 -37.26486 -8.414861 574.744
## 133849 -37.26458 -8.414861 574.239
## 133850 -37.26430 -8.414861 573.770
## 133851 -37.26402 -8.414861 573.037
## 133852 -37.26375 -8.414861 571.917
## 133853 -37.26347 -8.414861 570.909
## 133854 -37.26319 -8.414861 569.792
## 133855 -37.26291 -8.414861 568.977
## 133856 -37.26263 -8.414861 568.661
## 133857 -37.26236 -8.414861 568.914
## 133858 -37.26208 -8.414861 569.714
## 133859 -37.26180 -8.414861 570.736
## 133860 -37.26152 -8.414861 572.374
## 133861 -37.26125 -8.414861 573.881
## 133862 -37.26097 -8.414861 574.530
## 133863 -37.26069 -8.414861 574.897
## 133864 -37.26041 -8.414861 574.903
## 133865 -37.26013 -8.414861 574.441
## 133866 -37.25986 -8.414861 573.088
## 133867 -37.25958 -8.414861 571.237
## 133868 -37.25930 -8.414861 569.955
## 133869 -37.25902 -8.414861 569.190
## 133870 -37.25875 -8.414861 568.475
## 133871 -37.25847 -8.414861 568.105
## 133872 -37.25819 -8.414861 567.613
## 133873 -37.25791 -8.414861 567.241
## 133874 -37.25763 -8.414861 566.788
## 133875 -37.25736 -8.414861 566.079
## 133876 -37.25708 -8.414861 565.737
## 133877 -37.25680 -8.414861 565.999
## 133878 -37.25652 -8.414861 567.228
## 133879 -37.25625 -8.414861 568.432
## 133880 -37.25597 -8.414861 569.580
## 133881 -37.25569 -8.414861 569.975
## 133882 -37.25541 -8.414861 570.061
## 133883 -37.25513 -8.414861 569.584
## 133884 -37.25486 -8.414861 569.457
## 133885 -37.25458 -8.414861 568.821
## 133886 -37.25430 -8.414861 568.529
## 133887 -37.25402 -8.414861 567.904
## 133888 -37.25375 -8.414861 567.321
## 133889 -37.25347 -8.414861 567.389
## 133890 -37.25319 -8.414861 568.297
## 133891 -37.25291 -8.414861 569.941
## 133892 -37.25263 -8.414861 570.877
## 133893 -37.25236 -8.414861 571.636
## 133894 -37.25208 -8.414861 572.168
## 133895 -37.25180 -8.414861 572.459
## 133896 -37.25152 -8.414861 572.661
## 133897 -37.25125 -8.414861 572.795
## 133898 -37.25097 -8.414861 572.848
## 133899 -37.25069 -8.414861 572.818
## 133900 -37.25041 -8.414861 572.593
## 133901 -37.25013 -8.414861 571.993
## 133902 -37.24986 -8.414861 571.046
## 133903 -37.24958 -8.414861 570.159
## 133904 -37.24930 -8.414861 569.196
## 133905 -37.24902 -8.414861 568.748
## 133906 -37.24875 -8.414861 568.717
## 133907 -37.24847 -8.414861 569.189
## 133908 -37.24819 -8.414861 570.200
## 133909 -37.24791 -8.414861 571.475
## 133910 -37.24763 -8.414861 573.144
## 133911 -37.24736 -8.414861 574.426
## 133912 -37.24708 -8.414861 575.662
## 133913 -37.24680 -8.414861 576.354
## 133914 -37.24652 -8.414861 576.684
## 133915 -37.24625 -8.414861 577.197
## 133916 -37.24597 -8.414861 577.465
## 133917 -37.24569 -8.414861 577.927
## 133918 -37.24541 -8.414861 578.886
## 133919 -37.24513 -8.414861 579.976
## 133920 -37.24486 -8.414861 581.504
## 133921 -37.24458 -8.414861 582.811
## 133922 -37.24430 -8.414861 583.990
## 133923 -37.24402 -8.414861 584.769
## 133924 -37.24375 -8.414861 585.529
## 133925 -37.24347 -8.414861 586.400
## 133926 -37.24319 -8.414861 587.405
## 133927 -37.24291 -8.414861 588.860
## 133928 -37.24263 -8.414861 590.223
## 133929 -37.24236 -8.414861 590.893
## 133930 -37.24208 -8.414861 591.384
## 133931 -37.24180 -8.414861 591.944
## 133932 -37.24152 -8.414861 592.317
## 133933 -37.24125 -8.414861 592.651
## 133934 -37.24097 -8.414861 592.723
## 133935 -37.24069 -8.414861 593.158
## 133936 -37.24041 -8.414861 593.383
## 133937 -37.24013 -8.414861 593.739
## 133938 -37.23986 -8.414861 593.617
## 133939 -37.23958 -8.414861 593.585
## 133940 -37.23930 -8.414861 593.479
## 133941 -37.23902 -8.414861 593.783
## 133942 -37.23875 -8.414861 593.899
## 133943 -37.23847 -8.414861 594.093
## 133944 -37.23819 -8.414861 593.618
## 133945 -37.23791 -8.414861 593.055
## 133946 -37.23763 -8.414861 592.166
## 133947 -37.23736 -8.414861 591.053
## 133948 -37.23708 -8.414861 589.719
## 133949 -37.23680 -8.414861 588.071
## 133950 -37.23652 -8.414861 586.522
## 133951 -37.23625 -8.414861 585.044
## 133952 -37.23597 -8.414861 583.910
## 133953 -37.23569 -8.414861 583.089
## 133954 -37.23541 -8.414861 582.249
## 133955 -37.23513 -8.414861 581.559
## 133956 -37.23486 -8.414861 580.659
## 133957 -37.23458 -8.414861 579.834
## 133958 -37.23430 -8.414861 579.395
## 133959 -37.23402 -8.414861 578.993
## 133960 -37.23375 -8.414861 578.736
## 133961 -37.23347 -8.414861 578.658
## 133962 -37.23319 -8.414861 579.135
## 133963 -37.23291 -8.414861 579.509
## 133964 -37.23263 -8.414861 579.856
## 133965 -37.23236 -8.414861 580.156
## 133966 -37.23208 -8.414861 580.272
## 133967 -37.23180 -8.414861 580.824
## 133968 -37.23152 -8.414861 581.543
## 133969 -37.23125 -8.414861 582.514
## 133970 -37.23097 -8.414861 583.876
## 133971 -37.23069 -8.414861 585.299
## 133972 -37.23041 -8.414861 586.667
## 133973 -37.23013 -8.414861 587.717
## 133974 -37.22986 -8.414861 588.426
## 133975 -37.22958 -8.414861 588.917
## 133976 -37.22930 -8.414861 588.971
## 133977 -37.22902 -8.414861 589.206
## 133978 -37.22875 -8.414861 589.391
## 133979 -37.22847 -8.414861 589.419
## 133980 -37.22819 -8.414861 588.952
## 133981 -37.22791 -8.414861 588.337
## 133982 -37.22763 -8.414861 587.561
## 133983 -37.22736 -8.414861 587.271
## 133984 -37.22708 -8.414861 586.948
## 133985 -37.22680 -8.414861 587.299
## 133986 -37.22652 -8.414861 587.816
## 133987 -37.22625 -8.414861 588.122
## 133988 -37.22597 -8.414861 588.352
## 133989 -37.22569 -8.414861 588.032
## 133990 -37.22541 -8.414861 586.857
## 133991 -37.22513 -8.414861 585.741
## 133992 -37.22486 -8.414861 584.429
## 133993 -37.22458 -8.414861 583.160
## 133994 -37.22430 -8.414861 582.059
## 133995 -37.22402 -8.414861 580.870
## 133996 -37.22375 -8.414861 579.848
## 133997 -37.22347 -8.414861 578.578
## 133998 -37.22319 -8.414861 577.305
## 133999 -37.22291 -8.414861 576.367
## 134000 -37.22263 -8.414861 575.588
## 134779 -37.38263 -8.415139 516.251
## 134780 -37.38236 -8.415139 516.957
## 134781 -37.38208 -8.415139 517.551
## 134782 -37.38180 -8.415139 517.721
## 134783 -37.38152 -8.415139 518.125
## 134784 -37.38125 -8.415139 518.661
## 134785 -37.38097 -8.415139 518.932
## 134786 -37.38069 -8.415139 518.908
## 134787 -37.38041 -8.415139 518.730
## 134788 -37.38013 -8.415139 519.077
## 134789 -37.37986 -8.415139 519.410
## 134790 -37.37958 -8.415139 519.630
## 134791 -37.37930 -8.415139 519.513
## 134792 -37.37902 -8.415139 518.577
## 134793 -37.37875 -8.415139 517.893
## 134794 -37.37847 -8.415139 517.254
## 134795 -37.37819 -8.415139 516.977
## 134796 -37.37791 -8.415139 516.744
## 134797 -37.37763 -8.415139 516.782
## 134798 -37.37736 -8.415139 516.768
## 134799 -37.37708 -8.415139 516.891
## 134800 -37.37680 -8.415139 516.719
## 134801 -37.37652 -8.415139 516.935
## 134836 -37.36680 -8.415139 520.935
## 134837 -37.36652 -8.415139 521.376
## 134838 -37.36625 -8.415139 521.531
## 134839 -37.36597 -8.415139 521.839
## 134840 -37.36569 -8.415139 522.405
## 134841 -37.36541 -8.415139 523.281
## 134842 -37.36513 -8.415139 524.316
## 134843 -37.36486 -8.415139 525.222
## 134844 -37.36458 -8.415139 526.000
## 134845 -37.36430 -8.415139 526.869
## 134846 -37.36402 -8.415139 527.366
## 134847 -37.36375 -8.415139 528.034
## 134848 -37.36347 -8.415139 529.042
## 134849 -37.36319 -8.415139 530.804
## 134850 -37.36291 -8.415139 532.990
## 134851 -37.36263 -8.415139 535.263
## 134852 -37.36236 -8.415139 536.977
## 134853 -37.36208 -8.415139 538.565
## 134854 -37.36180 -8.415139 540.418
## 134855 -37.36152 -8.415139 542.628
## 134856 -37.36125 -8.415139 545.069
## 134857 -37.36097 -8.415139 547.226
## 134858 -37.36069 -8.415139 548.731
## 134859 -37.36041 -8.415139 550.099
## 134860 -37.36013 -8.415139 551.490
## 134861 -37.35986 -8.415139 552.927
## 134862 -37.35958 -8.415139 554.482
## 134863 -37.35930 -8.415139 555.942
## 134864 -37.35902 -8.415139 557.483
## 134865 -37.35875 -8.415139 558.899
## 134866 -37.35847 -8.415139 560.178
## 134867 -37.35819 -8.415139 561.017
## 134868 -37.35791 -8.415139 561.814
## 134869 -37.35763 -8.415139 562.615
## 134870 -37.35736 -8.415139 563.245
## 134871 -37.35708 -8.415139 563.685
## 134872 -37.35680 -8.415139 564.263
## 134873 -37.35652 -8.415139 564.324
## 134874 -37.35625 -8.415139 564.203
## 134875 -37.35597 -8.415139 564.126
## 134876 -37.35569 -8.415139 564.115
## 134877 -37.35541 -8.415139 564.350
## 134878 -37.35513 -8.415139 564.422
## 134879 -37.35486 -8.415139 564.281
## 134880 -37.35458 -8.415139 564.184
## 134881 -37.35430 -8.415139 563.970
## 134882 -37.35402 -8.415139 564.140
## 134883 -37.35375 -8.415139 564.186
## 134884 -37.35347 -8.415139 564.365
## 134885 -37.35319 -8.415139 564.639
## 134886 -37.35291 -8.415139 564.846
## 134887 -37.35263 -8.415139 565.184
## 134888 -37.35236 -8.415139 565.287
## 134889 -37.35208 -8.415139 565.296
## 134890 -37.35180 -8.415139 565.176
## 134891 -37.35152 -8.415139 564.920
## 134892 -37.35125 -8.415139 565.009
## 134893 -37.35097 -8.415139 565.366
## 134894 -37.35069 -8.415139 566.236
## 134895 -37.35041 -8.415139 567.194
## 134896 -37.35013 -8.415139 568.241
## 134897 -37.34986 -8.415139 568.775
## 134898 -37.34958 -8.415139 569.117
## 134899 -37.34930 -8.415139 569.395
## 134900 -37.34902 -8.415139 569.643
## 134901 -37.34875 -8.415139 569.854
## 134902 -37.34847 -8.415139 570.055
## 134903 -37.34819 -8.415139 569.984
## 134904 -37.34791 -8.415139 570.038
## 134905 -37.34763 -8.415139 570.201
## 134906 -37.34736 -8.415139 570.979
## 134907 -37.34708 -8.415139 571.841
## 134908 -37.34680 -8.415139 572.454
## 134909 -37.34652 -8.415139 572.460
## 134910 -37.34625 -8.415139 572.520
## 134911 -37.34597 -8.415139 572.608
## 134912 -37.34569 -8.415139 573.397
## 134913 -37.34541 -8.415139 573.853
## 134914 -37.34513 -8.415139 573.933
## 134915 -37.34486 -8.415139 573.200
## 134916 -37.34458 -8.415139 572.248
## 134917 -37.34430 -8.415139 571.515
## 134918 -37.34402 -8.415139 571.495
## 134919 -37.34375 -8.415139 571.752
## 134920 -37.34347 -8.415139 572.139
## 134921 -37.34319 -8.415139 572.426
## 134922 -37.34291 -8.415139 572.503
## 134923 -37.34263 -8.415139 572.473
## 134924 -37.34236 -8.415139 572.395
## 134925 -37.34208 -8.415139 572.390
## 134926 -37.34180 -8.415139 572.055
## 134927 -37.34152 -8.415139 572.035
## 134928 -37.34125 -8.415139 571.778
## 134929 -37.34097 -8.415139 571.556
## 134930 -37.34069 -8.415139 571.397
## 134931 -37.34041 -8.415139 571.303
## 134932 -37.34013 -8.415139 571.474
## 134933 -37.33986 -8.415139 571.737
## 134934 -37.33958 -8.415139 572.034
## 134935 -37.33930 -8.415139 572.395
## 134936 -37.33902 -8.415139 572.480
## 134937 -37.33875 -8.415139 572.272
## 134938 -37.33847 -8.415139 572.055
## 134939 -37.33819 -8.415139 571.744
## 134940 -37.33791 -8.415139 571.613
## 134941 -37.33763 -8.415139 571.835
## 134942 -37.33736 -8.415139 572.134
## 134943 -37.33708 -8.415139 572.573
## 134944 -37.33680 -8.415139 573.485
## 134945 -37.33652 -8.415139 574.053
## 134946 -37.33625 -8.415139 574.280
## 134947 -37.33597 -8.415139 574.058
## 134948 -37.33569 -8.415139 573.559
## 134949 -37.33541 -8.415139 573.139
## 134950 -37.33513 -8.415139 572.653
## 134951 -37.33486 -8.415139 572.561
## 134952 -37.33458 -8.415139 572.703
## 134953 -37.33430 -8.415139 572.901
## 134954 -37.33402 -8.415139 573.685
## 134955 -37.33375 -8.415139 574.089
## 134956 -37.33347 -8.415139 574.662
## 134957 -37.33319 -8.415139 574.758
## 134958 -37.33291 -8.415139 574.711
## 134959 -37.33263 -8.415139 575.023
## 134960 -37.33236 -8.415139 575.382
## 134961 -37.33208 -8.415139 576.014
## 134962 -37.33180 -8.415139 576.425
## 134963 -37.33152 -8.415139 576.943
## 134964 -37.33125 -8.415139 577.524
## 134965 -37.33097 -8.415139 577.480
## 134966 -37.33069 -8.415139 576.560
## 134967 -37.33041 -8.415139 575.409
## 134968 -37.33013 -8.415139 574.678
## 134969 -37.32986 -8.415139 574.730
## 134970 -37.32958 -8.415139 574.878
## 134971 -37.32930 -8.415139 575.302
## 134972 -37.32902 -8.415139 575.209
## 134973 -37.32875 -8.415139 575.052
## 134974 -37.32847 -8.415139 574.663
## 134975 -37.32819 -8.415139 574.666
## 134976 -37.32791 -8.415139 574.800
## 134977 -37.32763 -8.415139 574.997
## 134978 -37.32736 -8.415139 574.760
## 134979 -37.32708 -8.415139 574.538
## 134980 -37.32680 -8.415139 574.306
## 134981 -37.32652 -8.415139 574.959
## 134982 -37.32625 -8.415139 575.487
## 134983 -37.32597 -8.415139 576.282
## 134984 -37.32569 -8.415139 576.879
## 134985 -37.32541 -8.415139 577.391
## 134986 -37.32513 -8.415139 578.208
## 134987 -37.32486 -8.415139 578.831
## 134988 -37.32458 -8.415139 579.136
## 134989 -37.32430 -8.415139 579.436
## 134990 -37.32402 -8.415139 579.377
## 134991 -37.32375 -8.415139 579.533
## 134992 -37.32347 -8.415139 579.667
## 134993 -37.32319 -8.415139 579.767
## 134994 -37.32291 -8.415139 579.977
## 134995 -37.32263 -8.415139 580.110
## 134996 -37.32236 -8.415139 580.565
## 134997 -37.32208 -8.415139 581.118
## 134998 -37.32180 -8.415139 581.658
## 134999 -37.32152 -8.415139 582.231
## 135000 -37.32125 -8.415139 582.718
## 135001 -37.32097 -8.415139 583.166
## 135002 -37.32069 -8.415139 583.384
## 135003 -37.32041 -8.415139 583.456
## 135004 -37.32013 -8.415139 583.217
## 135005 -37.31986 -8.415139 582.812
## 135006 -37.31958 -8.415139 582.350
## 135007 -37.31930 -8.415139 581.861
## 135008 -37.31902 -8.415139 581.670
## 135009 -37.31875 -8.415139 581.355
## 135010 -37.31847 -8.415139 581.214
## 135011 -37.31819 -8.415139 581.137
## 135012 -37.31791 -8.415139 581.172
## 135013 -37.31763 -8.415139 581.243
## 135014 -37.31736 -8.415139 581.442
## 135015 -37.31708 -8.415139 581.521
## 135016 -37.31680 -8.415139 581.491
## 135017 -37.31652 -8.415139 580.977
## 135018 -37.31625 -8.415139 580.052
## 135019 -37.31597 -8.415139 578.913
## 135020 -37.31569 -8.415139 578.158
## 135021 -37.31541 -8.415139 577.286
## 135022 -37.31513 -8.415139 576.574
## 135023 -37.31486 -8.415139 575.602
## 135024 -37.31458 -8.415139 574.481
## 135025 -37.31430 -8.415139 573.728
## 135026 -37.31402 -8.415139 572.836
## 135027 -37.31375 -8.415139 571.787
## 135028 -37.31347 -8.415139 570.694
## 135029 -37.31319 -8.415139 570.098
## 135030 -37.31291 -8.415139 569.626
## 135031 -37.31263 -8.415139 569.332
## 135032 -37.31236 -8.415139 568.936
## 135033 -37.31208 -8.415139 568.759
## 135034 -37.31180 -8.415139 569.044
## 135035 -37.31152 -8.415139 569.689
## 135036 -37.31125 -8.415139 570.359
## 135037 -37.31097 -8.415139 570.936
## 135038 -37.31069 -8.415139 571.268
## 135039 -37.31041 -8.415139 571.601
## 135040 -37.31013 -8.415139 572.113
## 135041 -37.30986 -8.415139 572.927
## 135042 -37.30958 -8.415139 574.132
## 135043 -37.30930 -8.415139 575.761
## 135044 -37.30902 -8.415139 577.621
## 135045 -37.30875 -8.415139 579.567
## 135046 -37.30847 -8.415139 581.141
## 135047 -37.30819 -8.415139 582.547
## 135048 -37.30791 -8.415139 583.788
## 135049 -37.30763 -8.415139 584.889
## 135050 -37.30736 -8.415139 585.957
## 135051 -37.30708 -8.415139 586.797
## 135052 -37.30680 -8.415139 588.218
## 135053 -37.30652 -8.415139 589.615
## 135054 -37.30625 -8.415139 590.490
## 135055 -37.30597 -8.415139 591.017
## 135056 -37.30569 -8.415139 591.196
## 135057 -37.30541 -8.415139 591.396
## 135058 -37.30513 -8.415139 591.522
## 135059 -37.30486 -8.415139 591.878
## 135060 -37.30458 -8.415139 592.242
## 135061 -37.30430 -8.415139 592.218
## 135062 -37.30402 -8.415139 591.758
## 135063 -37.30375 -8.415139 591.108
## 135064 -37.30347 -8.415139 590.540
## 135065 -37.30319 -8.415139 590.689
## 135066 -37.30291 -8.415139 590.739
## 135067 -37.30263 -8.415139 590.798
## 135068 -37.30236 -8.415139 589.537
## 135069 -37.30208 -8.415139 587.782
## 135070 -37.30180 -8.415139 585.833
## 135071 -37.30152 -8.415139 584.152
## 135072 -37.30125 -8.415139 582.650
## 135073 -37.30097 -8.415139 581.010
## 135074 -37.30069 -8.415139 579.466
## 135075 -37.30041 -8.415139 578.205
## 135076 -37.30013 -8.415139 577.426
## 135077 -37.29986 -8.415139 577.117
## 135078 -37.29958 -8.415139 577.098
## 135079 -37.29930 -8.415139 577.670
## 135080 -37.29902 -8.415139 578.764
## 135081 -37.29875 -8.415139 579.715
## 135082 -37.29847 -8.415139 580.656
## 135083 -37.29819 -8.415139 580.312
## 135084 -37.29791 -8.415139 579.599
## 135085 -37.29763 -8.415139 578.509
## 135086 -37.29736 -8.415139 578.204
## 135087 -37.29708 -8.415139 578.106
## 135088 -37.29680 -8.415139 578.617
## 135089 -37.29652 -8.415139 579.552
## 135090 -37.29625 -8.415139 580.191
## 135091 -37.29597 -8.415139 580.604
## 135092 -37.29569 -8.415139 580.318
## 135093 -37.29541 -8.415139 579.659
## 135094 -37.29513 -8.415139 579.195
## 135095 -37.29486 -8.415139 578.552
## 135096 -37.29458 -8.415139 577.777
## 135097 -37.29430 -8.415139 577.142
## 135098 -37.29402 -8.415139 576.514
## 135099 -37.29375 -8.415139 576.001
## 135100 -37.29347 -8.415139 575.585
## 135101 -37.29319 -8.415139 576.326
## 135102 -37.29291 -8.415139 577.254
## 135103 -37.29263 -8.415139 578.594
## 135104 -37.29236 -8.415139 578.670
## 135105 -37.29208 -8.415139 578.370
## 135106 -37.29180 -8.415139 577.419
## 135107 -37.29152 -8.415139 576.879
## 135108 -37.29125 -8.415139 576.075
## 135109 -37.29097 -8.415139 575.073
## 135110 -37.29069 -8.415139 574.344
## 135111 -37.29041 -8.415139 573.778
## 135112 -37.29013 -8.415139 573.256
## 135113 -37.28986 -8.415139 572.565
## 135114 -37.28958 -8.415139 571.832
## 135115 -37.28930 -8.415139 571.144
## 135116 -37.28902 -8.415139 570.557
## 135117 -37.28875 -8.415139 569.811
## 135118 -37.28847 -8.415139 569.079
## 135119 -37.28819 -8.415139 567.982
## 135120 -37.28791 -8.415139 566.860
## 135121 -37.28763 -8.415139 565.774
## 135122 -37.28736 -8.415139 565.206
## 135123 -37.28708 -8.415139 564.802
## 135124 -37.28680 -8.415139 564.104
## 135125 -37.28652 -8.415139 563.435
## 135126 -37.28625 -8.415139 563.070
## 135127 -37.28597 -8.415139 563.237
## 135128 -37.28569 -8.415139 563.969
## 135129 -37.28541 -8.415139 564.811
## 135130 -37.28513 -8.415139 566.073
## 135131 -37.28486 -8.415139 566.907
## 135132 -37.28458 -8.415139 567.715
## 135133 -37.28430 -8.415139 567.766
## 135134 -37.28402 -8.415139 567.836
## 135135 -37.28375 -8.415139 567.948
## 135136 -37.28347 -8.415139 567.905
## 135137 -37.28319 -8.415139 568.162
## 135138 -37.28291 -8.415139 568.380
## 135139 -37.28263 -8.415139 568.805
## 135140 -37.28236 -8.415139 568.964
## 135141 -37.28208 -8.415139 568.714
## 135142 -37.28180 -8.415139 568.340
## 135143 -37.28152 -8.415139 567.501
## 135144 -37.28125 -8.415139 566.555
## 135145 -37.28097 -8.415139 565.758
## 135146 -37.28069 -8.415139 565.567
## 135147 -37.28041 -8.415139 565.802
## 135148 -37.28013 -8.415139 566.301
## 135149 -37.27986 -8.415139 566.793
## 135150 -37.27958 -8.415139 567.415
## 135151 -37.27930 -8.415139 568.609
## 135152 -37.27902 -8.415139 569.728
## 135153 -37.27875 -8.415139 570.533
## 135154 -37.27847 -8.415139 570.900
## 135155 -37.27819 -8.415139 570.791
## 135156 -37.27791 -8.415139 570.772
## 135157 -37.27763 -8.415139 570.683
## 135158 -37.27736 -8.415139 571.258
## 135159 -37.27708 -8.415139 572.124
## 135160 -37.27680 -8.415139 573.373
## 135161 -37.27652 -8.415139 574.492
## 135162 -37.27625 -8.415139 575.456
## 135163 -37.27597 -8.415139 576.061
## 135164 -37.27569 -8.415139 576.535
## 135165 -37.27541 -8.415139 576.874
## 135166 -37.27513 -8.415139 577.136
## 135167 -37.27486 -8.415139 577.446
## 135168 -37.27458 -8.415139 577.581
## 135169 -37.27430 -8.415139 578.066
## 135170 -37.27402 -8.415139 578.299
## 135171 -37.27375 -8.415139 578.175
## 135172 -37.27347 -8.415139 577.554
## 135173 -37.27319 -8.415139 576.292
## 135174 -37.27291 -8.415139 575.053
## 135175 -37.27263 -8.415139 573.816
## 135176 -37.27236 -8.415139 573.281
## 135177 -37.27208 -8.415139 572.996
## 135178 -37.27180 -8.415139 572.699
## 135179 -37.27152 -8.415139 572.071
## 135180 -37.27125 -8.415139 571.473
## 135181 -37.27097 -8.415139 570.993
## 135182 -37.27069 -8.415139 571.547
## 135183 -37.27041 -8.415139 572.464
## 135184 -37.27013 -8.415139 573.648
## 135185 -37.26986 -8.415139 574.889
## 135186 -37.26958 -8.415139 576.035
## 135187 -37.26930 -8.415139 577.283
## 135188 -37.26902 -8.415139 578.327
## 135189 -37.26875 -8.415139 578.839
## 135190 -37.26847 -8.415139 579.067
## 135191 -37.26819 -8.415139 578.802
## 135192 -37.26791 -8.415139 578.572
## 135193 -37.26763 -8.415139 577.960
## 135194 -37.26736 -8.415139 578.003
## 135195 -37.26708 -8.415139 578.413
## 135196 -37.26680 -8.415139 578.812
## 135197 -37.26652 -8.415139 579.232
## 135198 -37.26625 -8.415139 579.381
## 135199 -37.26597 -8.415139 579.252
## 135200 -37.26569 -8.415139 578.467
## 135201 -37.26541 -8.415139 577.426
## 135202 -37.26513 -8.415139 576.152
## 135203 -37.26486 -8.415139 575.390
## 135204 -37.26458 -8.415139 574.592
## 135205 -37.26430 -8.415139 573.901
## 135206 -37.26402 -8.415139 572.800
## 135207 -37.26375 -8.415139 571.580
## 135208 -37.26347 -8.415139 570.534
## 135209 -37.26319 -8.415139 569.724
## 135210 -37.26291 -8.415139 569.326
## 135211 -37.26263 -8.415139 569.242
## 135212 -37.26236 -8.415139 569.886
## 135213 -37.26208 -8.415139 571.014
## 135214 -37.26180 -8.415139 572.368
## 135215 -37.26152 -8.415139 573.601
## 135216 -37.26125 -8.415139 574.420
## 135217 -37.26097 -8.415139 574.821
## 135218 -37.26069 -8.415139 575.093
## 135219 -37.26041 -8.415139 574.760
## 135220 -37.26013 -8.415139 574.294
## 135221 -37.25986 -8.415139 573.061
## 135222 -37.25958 -8.415139 571.511
## 135223 -37.25930 -8.415139 570.341
## 135224 -37.25902 -8.415139 569.416
## 135225 -37.25875 -8.415139 568.717
## 135226 -37.25847 -8.415139 568.059
## 135227 -37.25819 -8.415139 567.456
## 135228 -37.25791 -8.415139 566.948
## 135229 -37.25763 -8.415139 566.518
## 135230 -37.25736 -8.415139 566.200
## 135231 -37.25708 -8.415139 566.065
## 135232 -37.25680 -8.415139 566.816
## 135233 -37.25652 -8.415139 567.394
## 135234 -37.25625 -8.415139 568.620
## 135235 -37.25597 -8.415139 569.474
## 135236 -37.25569 -8.415139 570.295
## 135237 -37.25541 -8.415139 570.953
## 135238 -37.25513 -8.415139 570.710
## 135239 -37.25486 -8.415139 570.293
## 135240 -37.25458 -8.415139 569.759
## 135241 -37.25430 -8.415139 568.911
## 135242 -37.25402 -8.415139 568.484
## 135243 -37.25375 -8.415139 568.049
## 135244 -37.25347 -8.415139 568.227
## 135245 -37.25319 -8.415139 569.560
## 135246 -37.25291 -8.415139 571.330
## 135247 -37.25263 -8.415139 572.431
## 135248 -37.25236 -8.415139 573.124
## 135249 -37.25208 -8.415139 573.607
## 135250 -37.25180 -8.415139 573.926
## 135251 -37.25152 -8.415139 574.024
## 135252 -37.25125 -8.415139 573.955
## 135253 -37.25097 -8.415139 574.044
## 135254 -37.25069 -8.415139 574.180
## 135255 -37.25041 -8.415139 573.997
## 135256 -37.25013 -8.415139 573.323
## 135257 -37.24986 -8.415139 572.154
## 135258 -37.24958 -8.415139 570.984
## 135259 -37.24930 -8.415139 569.677
## 135260 -37.24902 -8.415139 569.087
## 135261 -37.24875 -8.415139 568.909
## 135262 -37.24847 -8.415139 569.277
## 135263 -37.24819 -8.415139 570.252
## 135264 -37.24791 -8.415139 571.481
## 135265 -37.24763 -8.415139 573.195
## 135266 -37.24736 -8.415139 574.302
## 135267 -37.24708 -8.415139 575.245
## 135268 -37.24680 -8.415139 575.769
## 135269 -37.24652 -8.415139 576.088
## 135270 -37.24625 -8.415139 576.363
## 135271 -37.24597 -8.415139 576.801
## 135272 -37.24569 -8.415139 577.792
## 135273 -37.24541 -8.415139 579.154
## 135274 -37.24513 -8.415139 580.564
## 135275 -37.24486 -8.415139 581.990
## 135276 -37.24458 -8.415139 583.266
## 135277 -37.24430 -8.415139 584.277
## 135278 -37.24402 -8.415139 584.764
## 135279 -37.24375 -8.415139 585.121
## 135280 -37.24347 -8.415139 585.778
## 135281 -37.24319 -8.415139 587.250
## 135282 -37.24291 -8.415139 588.721
## 135283 -37.24263 -8.415139 590.011
## 135284 -37.24236 -8.415139 590.283
## 135285 -37.24208 -8.415139 590.472
## 135286 -37.24180 -8.415139 590.316
## 135287 -37.24152 -8.415139 590.785
## 135288 -37.24125 -8.415139 591.364
## 135289 -37.24097 -8.415139 591.543
## 135290 -37.24069 -8.415139 591.479
## 135291 -37.24041 -8.415139 591.321
## 135292 -37.24013 -8.415139 591.540
## 135293 -37.23986 -8.415139 591.798
## 135294 -37.23958 -8.415139 591.995
## 135295 -37.23930 -8.415139 592.257
## 135296 -37.23902 -8.415139 592.602
## 135297 -37.23875 -8.415139 592.939
## 135298 -37.23847 -8.415139 593.063
## 135299 -37.23819 -8.415139 592.647
## 135300 -37.23791 -8.415139 591.946
## 135301 -37.23763 -8.415139 591.152
## 135302 -37.23736 -8.415139 590.199
## 135303 -37.23708 -8.415139 589.057
## 135304 -37.23680 -8.415139 587.623
## 135305 -37.23652 -8.415139 586.203
## 135306 -37.23625 -8.415139 584.864
## 135307 -37.23597 -8.415139 583.842
## 135308 -37.23569 -8.415139 583.255
## 135309 -37.23541 -8.415139 582.712
## 135310 -37.23513 -8.415139 582.054
## 135311 -37.23486 -8.415139 580.836
## 135312 -37.23458 -8.415139 579.678
## 135313 -37.23430 -8.415139 578.680
## 135314 -37.23402 -8.415139 578.535
## 135315 -37.23375 -8.415139 578.553
## 135316 -37.23347 -8.415139 578.691
## 135317 -37.23319 -8.415139 579.360
## 135318 -37.23291 -8.415139 580.198
## 135319 -37.23263 -8.415139 580.755
## 135320 -37.23236 -8.415139 580.693
## 135321 -37.23208 -8.415139 580.719
## 135322 -37.23180 -8.415139 581.232
## 135323 -37.23152 -8.415139 582.029
## 135324 -37.23125 -8.415139 583.100
## 135325 -37.23097 -8.415139 584.374
## 135326 -37.23069 -8.415139 585.678
## 135327 -37.23041 -8.415139 586.964
## 135328 -37.23013 -8.415139 588.050
## 135329 -37.22986 -8.415139 588.718
## 135330 -37.22958 -8.415139 589.259
## 135331 -37.22930 -8.415139 589.341
## 135332 -37.22902 -8.415139 589.343
## 135333 -37.22875 -8.415139 589.243
## 135334 -37.22847 -8.415139 589.147
## 135335 -37.22819 -8.415139 588.894
## 135336 -37.22791 -8.415139 588.539
## 135337 -37.22763 -8.415139 587.967
## 135338 -37.22736 -8.415139 587.578
## 135339 -37.22708 -8.415139 587.278
## 135340 -37.22680 -8.415139 587.403
## 135341 -37.22652 -8.415139 588.127
## 135342 -37.22625 -8.415139 588.791
## 135343 -37.22597 -8.415139 589.055
## 135344 -37.22569 -8.415139 588.367
## 135345 -37.22541 -8.415139 587.252
## 135346 -37.22513 -8.415139 585.950
## 135347 -37.22486 -8.415139 584.827
## 135348 -37.22458 -8.415139 583.720
## 135349 -37.22430 -8.415139 582.603
## 135350 -37.22402 -8.415139 581.478
## 135351 -37.22375 -8.415139 580.285
## 135352 -37.22347 -8.415139 579.062
## 135353 -37.22319 -8.415139 578.038
## 135354 -37.22291 -8.415139 577.107
## 135355 -37.22263 -8.415139 576.231
## 135356 -37.22236 -8.415139 575.044
## 136134 -37.38263 -8.415417 515.578
## 136135 -37.38236 -8.415417 516.570
## 136136 -37.38208 -8.415417 517.469
## 136137 -37.38180 -8.415417 518.521
## 136138 -37.38152 -8.415417 519.018
## 136139 -37.38125 -8.415417 519.589
## 136140 -37.38097 -8.415417 519.768
## 136141 -37.38069 -8.415417 520.002
## 136142 -37.38041 -8.415417 519.920
## 136143 -37.38013 -8.415417 519.753
## 136144 -37.37986 -8.415417 519.987
## 136145 -37.37958 -8.415417 520.068
## 136146 -37.37930 -8.415417 519.967
## 136147 -37.37902 -8.415417 519.371
## 136148 -37.37875 -8.415417 518.568
## 136149 -37.37847 -8.415417 517.773
## 136150 -37.37819 -8.415417 517.086
## 136151 -37.37791 -8.415417 516.629
## 136152 -37.37763 -8.415417 516.330
## 136153 -37.37736 -8.415417 516.351
## 136154 -37.37708 -8.415417 516.495
## 136155 -37.37680 -8.415417 516.804
## 136156 -37.37652 -8.415417 517.068
## 136157 -37.37625 -8.415417 517.417
## 136158 -37.37597 -8.415417 517.766
## 136159 -37.37569 -8.415417 518.186
## 136160 -37.37541 -8.415417 518.582
## 136190 -37.36708 -8.415417 519.727
## 136191 -37.36680 -8.415417 520.625
## 136192 -37.36652 -8.415417 521.161
## 136193 -37.36625 -8.415417 521.450
## 136194 -37.36597 -8.415417 521.960
## 136195 -37.36569 -8.415417 522.548
## 136196 -37.36541 -8.415417 523.413
## 136197 -37.36513 -8.415417 524.339
## 136198 -37.36486 -8.415417 525.099
## 136199 -37.36458 -8.415417 525.828
## 136200 -37.36430 -8.415417 526.387
## 136201 -37.36402 -8.415417 527.010
## 136202 -37.36375 -8.415417 527.761
## 136203 -37.36347 -8.415417 528.857
## 136204 -37.36319 -8.415417 530.785
## 136205 -37.36291 -8.415417 532.970
## 136206 -37.36263 -8.415417 535.136
## 136207 -37.36236 -8.415417 537.055
## 136208 -37.36208 -8.415417 538.875
## 136209 -37.36180 -8.415417 540.865
## 136210 -37.36152 -8.415417 543.115
## 136211 -37.36125 -8.415417 545.412
## 136212 -37.36097 -8.415417 547.508
## 136213 -37.36069 -8.415417 549.266
## 136214 -37.36041 -8.415417 550.754
## 136215 -37.36013 -8.415417 552.076
## 136216 -37.35986 -8.415417 553.480
## 136217 -37.35958 -8.415417 554.865
## 136218 -37.35930 -8.415417 556.356
## 136219 -37.35902 -8.415417 557.897
## 136220 -37.35875 -8.415417 559.459
## 136221 -37.35847 -8.415417 560.916
## 136222 -37.35819 -8.415417 561.987
## 136223 -37.35791 -8.415417 562.859
## 136224 -37.35763 -8.415417 563.574
## 136225 -37.35736 -8.415417 564.063
## 136226 -37.35708 -8.415417 564.437
## 136227 -37.35680 -8.415417 564.562
## 136228 -37.35652 -8.415417 564.607
## 136229 -37.35625 -8.415417 564.543
## 136230 -37.35597 -8.415417 564.548
## 136231 -37.35569 -8.415417 564.741
## 136232 -37.35541 -8.415417 564.971
## 136233 -37.35513 -8.415417 565.172
## 136234 -37.35486 -8.415417 564.915
## 136235 -37.35458 -8.415417 564.682
## 136236 -37.35430 -8.415417 564.487
## 136237 -37.35402 -8.415417 564.623
## 136238 -37.35375 -8.415417 564.820
## 136239 -37.35347 -8.415417 565.116
## 136240 -37.35319 -8.415417 565.301
## 136241 -37.35291 -8.415417 565.489
## 136242 -37.35263 -8.415417 565.552
## 136243 -37.35236 -8.415417 565.615
## 136244 -37.35208 -8.415417 565.570
## 136245 -37.35180 -8.415417 565.540
## 136246 -37.35152 -8.415417 565.474
## 136247 -37.35125 -8.415417 565.589
## 136248 -37.35097 -8.415417 565.983
## 136249 -37.35069 -8.415417 566.827
## 136250 -37.35041 -8.415417 567.816
## 136251 -37.35013 -8.415417 568.743
## 136252 -37.34986 -8.415417 569.207
## 136253 -37.34958 -8.415417 569.515
## 136254 -37.34930 -8.415417 569.787
## 136255 -37.34902 -8.415417 569.979
## 136256 -37.34875 -8.415417 570.184
## 136257 -37.34847 -8.415417 570.440
## 136258 -37.34819 -8.415417 570.333
## 136259 -37.34791 -8.415417 570.438
## 136260 -37.34763 -8.415417 570.902
## 136261 -37.34736 -8.415417 571.779
## 136262 -37.34708 -8.415417 572.825
## 136263 -37.34680 -8.415417 573.597
## 136264 -37.34652 -8.415417 573.871
## 136265 -37.34625 -8.415417 573.940
## 136266 -37.34597 -8.415417 574.001
## 136267 -37.34569 -8.415417 574.496
## 136268 -37.34541 -8.415417 574.877
## 136269 -37.34513 -8.415417 574.965
## 136270 -37.34486 -8.415417 574.205
## 136271 -37.34458 -8.415417 573.353
## 136272 -37.34430 -8.415417 572.730
## 136273 -37.34402 -8.415417 572.748
## 136274 -37.34375 -8.415417 573.021
## 136275 -37.34347 -8.415417 573.360
## 136276 -37.34319 -8.415417 573.512
## 136277 -37.34291 -8.415417 573.536
## 136278 -37.34263 -8.415417 573.528
## 136279 -37.34236 -8.415417 573.254
## 136280 -37.34208 -8.415417 573.039
## 136281 -37.34180 -8.415417 572.868
## 136282 -37.34152 -8.415417 572.890
## 136283 -37.34125 -8.415417 572.919
## 136284 -37.34097 -8.415417 572.908
## 136285 -37.34069 -8.415417 572.797
## 136286 -37.34041 -8.415417 572.677
## 136287 -37.34013 -8.415417 572.589
## 136288 -37.33986 -8.415417 572.774
## 136289 -37.33958 -8.415417 572.966
## 136290 -37.33930 -8.415417 573.144
## 136291 -37.33902 -8.415417 573.120
## 136292 -37.33875 -8.415417 573.014
## 136293 -37.33847 -8.415417 572.966
## 136294 -37.33819 -8.415417 572.845
## 136295 -37.33791 -8.415417 572.888
## 136296 -37.33763 -8.415417 573.052
## 136297 -37.33736 -8.415417 573.333
## 136298 -37.33708 -8.415417 573.724
## 136299 -37.33680 -8.415417 574.137
## 136300 -37.33652 -8.415417 574.635
## 136301 -37.33625 -8.415417 574.951
## 136302 -37.33597 -8.415417 575.194
## 136303 -37.33569 -8.415417 574.716
## 136304 -37.33541 -8.415417 574.264
## 136305 -37.33513 -8.415417 573.833
## 136306 -37.33486 -8.415417 573.587
## 136307 -37.33458 -8.415417 573.544
## 136308 -37.33430 -8.415417 573.614
## 136309 -37.33402 -8.415417 574.281
## 136310 -37.33375 -8.415417 574.842
## 136311 -37.33347 -8.415417 575.128
## 136312 -37.33319 -8.415417 575.377
## 136313 -37.33291 -8.415417 575.370
## 136314 -37.33263 -8.415417 575.514
## 136315 -37.33236 -8.415417 575.732
## 136316 -37.33208 -8.415417 576.242
## 136317 -37.33180 -8.415417 576.921
## 136318 -37.33152 -8.415417 577.945
## 136319 -37.33125 -8.415417 578.779
## 136320 -37.33097 -8.415417 579.169
## 136321 -37.33069 -8.415417 578.308
## 136322 -37.33041 -8.415417 577.178
## 136323 -37.33013 -8.415417 576.242
## 136324 -37.32986 -8.415417 576.036
## 136325 -37.32958 -8.415417 576.185
## 136326 -37.32930 -8.415417 576.400
## 136327 -37.32902 -8.415417 576.472
## 136328 -37.32875 -8.415417 576.515
## 136329 -37.32847 -8.415417 576.691
## 136330 -37.32819 -8.415417 576.778
## 136331 -37.32791 -8.415417 576.933
## 136332 -37.32763 -8.415417 576.916
## 136333 -37.32736 -8.415417 576.631
## 136334 -37.32708 -8.415417 576.351
## 136335 -37.32680 -8.415417 576.410
## 136336 -37.32652 -8.415417 576.957
## 136337 -37.32625 -8.415417 577.733
## 136338 -37.32597 -8.415417 578.527
## 136339 -37.32569 -8.415417 578.794
## 136340 -37.32541 -8.415417 578.994
## 136341 -37.32513 -8.415417 579.147
## 136342 -37.32486 -8.415417 579.698
## 136343 -37.32458 -8.415417 580.189
## 136344 -37.32430 -8.415417 580.601
## 136345 -37.32402 -8.415417 580.927
## 136346 -37.32375 -8.415417 581.107
## 136347 -37.32347 -8.415417 581.177
## 136348 -37.32319 -8.415417 581.104
## 136349 -37.32291 -8.415417 581.065
## 136350 -37.32263 -8.415417 581.181
## 136351 -37.32236 -8.415417 581.639
## 136352 -37.32208 -8.415417 582.217
## 136353 -37.32180 -8.415417 582.760
## 136354 -37.32152 -8.415417 583.279
## 136355 -37.32125 -8.415417 583.652
## 136356 -37.32097 -8.415417 583.928
## 136357 -37.32069 -8.415417 584.057
## 136358 -37.32041 -8.415417 584.025
## 136359 -37.32013 -8.415417 583.766
## 136360 -37.31986 -8.415417 583.208
## 136361 -37.31958 -8.415417 582.574
## 136362 -37.31930 -8.415417 581.994
## 136363 -37.31902 -8.415417 581.823
## 136364 -37.31875 -8.415417 581.769
## 136365 -37.31847 -8.415417 581.881
## 136366 -37.31819 -8.415417 581.887
## 136367 -37.31791 -8.415417 581.989
## 136368 -37.31763 -8.415417 582.173
## 136369 -37.31736 -8.415417 582.460
## 136370 -37.31708 -8.415417 582.643
## 136371 -37.31680 -8.415417 582.446
## 136372 -37.31652 -8.415417 582.015
## 136373 -37.31625 -8.415417 581.189
## 136374 -37.31597 -8.415417 580.292
## 136375 -37.31569 -8.415417 579.434
## 136376 -37.31541 -8.415417 578.570
## 136377 -37.31513 -8.415417 577.374
## 136378 -37.31486 -8.415417 576.486
## 136379 -37.31458 -8.415417 575.263
## 136380 -37.31430 -8.415417 573.910
## 136381 -37.31402 -8.415417 572.664
## 136382 -37.31375 -8.415417 571.460
## 136383 -37.31347 -8.415417 570.539
## 136384 -37.31319 -8.415417 569.875
## 136385 -37.31291 -8.415417 569.501
## 136386 -37.31263 -8.415417 569.243
## 136387 -37.31236 -8.415417 568.938
## 136388 -37.31208 -8.415417 568.800
## 136389 -37.31180 -8.415417 568.939
## 136390 -37.31152 -8.415417 569.377
## 136391 -37.31125 -8.415417 569.966
## 136392 -37.31097 -8.415417 570.549
## 136393 -37.31069 -8.415417 570.981
## 136394 -37.31041 -8.415417 571.435
## 136395 -37.31013 -8.415417 572.062
## 136396 -37.30986 -8.415417 573.036
## 136397 -37.30958 -8.415417 574.369
## 136398 -37.30930 -8.415417 576.214
## 136399 -37.30902 -8.415417 578.300
## 136400 -37.30875 -8.415417 580.549
## 136401 -37.30847 -8.415417 582.715
## 136402 -37.30819 -8.415417 584.029
## 136403 -37.30791 -8.415417 585.107
## 136404 -37.30763 -8.415417 585.932
## 136405 -37.30736 -8.415417 586.659
## 136406 -37.30708 -8.415417 587.356
## 136407 -37.30680 -8.415417 588.076
## 136408 -37.30652 -8.415417 589.202
## 136409 -37.30625 -8.415417 590.226
## 136410 -37.30597 -8.415417 591.247
## 136411 -37.30569 -8.415417 591.577
## 136412 -37.30541 -8.415417 591.902
## 136413 -37.30513 -8.415417 592.199
## 136414 -37.30486 -8.415417 592.646
## 136415 -37.30458 -8.415417 593.006
## 136416 -37.30430 -8.415417 593.187
## 136417 -37.30402 -8.415417 592.830
## 136418 -37.30375 -8.415417 592.377
## 136419 -37.30347 -8.415417 591.954
## 136420 -37.30319 -8.415417 592.298
## 136421 -37.30291 -8.415417 592.486
## 136422 -37.30263 -8.415417 592.184
## 136423 -37.30236 -8.415417 590.939
## 136424 -37.30208 -8.415417 589.267
## 136425 -37.30180 -8.415417 587.637
## 136426 -37.30152 -8.415417 586.197
## 136427 -37.30125 -8.415417 584.905
## 136428 -37.30097 -8.415417 583.733
## 136429 -37.30069 -8.415417 582.100
## 136430 -37.30041 -8.415417 580.724
## 136431 -37.30013 -8.415417 579.670
## 136432 -37.29986 -8.415417 579.130
## 136433 -37.29958 -8.415417 579.045
## 136434 -37.29930 -8.415417 579.373
## 136435 -37.29902 -8.415417 580.348
## 136436 -37.29875 -8.415417 581.209
## 136437 -37.29847 -8.415417 581.715
## 136438 -37.29819 -8.415417 581.158
## 136439 -37.29791 -8.415417 580.285
## 136440 -37.29763 -8.415417 579.419
## 136441 -37.29736 -8.415417 579.043
## 136442 -37.29708 -8.415417 579.003
## 136443 -37.29680 -8.415417 579.208
## 136444 -37.29652 -8.415417 580.027
## 136445 -37.29625 -8.415417 580.803
## 136446 -37.29597 -8.415417 581.397
## 136447 -37.29569 -8.415417 581.288
## 136448 -37.29541 -8.415417 580.851
## 136449 -37.29513 -8.415417 580.124
## 136450 -37.29486 -8.415417 579.351
## 136451 -37.29458 -8.415417 578.501
## 136452 -37.29430 -8.415417 577.782
## 136453 -37.29402 -8.415417 577.000
## 136454 -37.29375 -8.415417 576.630
## 136455 -37.29347 -8.415417 576.554
## 136456 -37.29319 -8.415417 577.622
## 136457 -37.29291 -8.415417 578.590
## 136458 -37.29263 -8.415417 579.147
## 136459 -37.29236 -8.415417 578.695
## 136460 -37.29208 -8.415417 577.824
## 136461 -37.29180 -8.415417 576.915
## 136462 -37.29152 -8.415417 576.185
## 136463 -37.29125 -8.415417 575.605
## 136464 -37.29097 -8.415417 575.198
## 136465 -37.29069 -8.415417 574.693
## 136466 -37.29041 -8.415417 574.270
## 136467 -37.29013 -8.415417 573.765
## 136468 -37.28986 -8.415417 573.055
## 136469 -37.28958 -8.415417 572.246
## 136470 -37.28930 -8.415417 571.397
## 136471 -37.28902 -8.415417 570.481
## 136472 -37.28875 -8.415417 569.587
## 136473 -37.28847 -8.415417 568.654
## 136474 -37.28819 -8.415417 567.837
## 136475 -37.28791 -8.415417 567.034
## 136476 -37.28763 -8.415417 566.563
## 136477 -37.28736 -8.415417 565.858
## 136478 -37.28708 -8.415417 565.408
## 136479 -37.28680 -8.415417 564.895
## 136480 -37.28652 -8.415417 564.156
## 136481 -37.28625 -8.415417 563.618
## 136482 -37.28597 -8.415417 563.157
## 136483 -37.28569 -8.415417 563.976
## 136484 -37.28541 -8.415417 564.783
## 136485 -37.28513 -8.415417 565.645
## 136486 -37.28486 -8.415417 566.288
## 136487 -37.28458 -8.415417 566.801
## 136488 -37.28430 -8.415417 567.374
## 136489 -37.28402 -8.415417 567.422
## 136490 -37.28375 -8.415417 567.604
## 136491 -37.28347 -8.415417 567.750
## 136492 -37.28319 -8.415417 567.900
## 136493 -37.28291 -8.415417 568.013
## 136494 -37.28263 -8.415417 568.069
## 136495 -37.28236 -8.415417 568.072
## 136496 -37.28208 -8.415417 567.886
## 136497 -37.28180 -8.415417 567.502
## 136498 -37.28152 -8.415417 566.672
## 136499 -37.28125 -8.415417 565.909
## 136500 -37.28097 -8.415417 565.454
## 136501 -37.28069 -8.415417 565.378
## 136502 -37.28041 -8.415417 565.752
## 136503 -37.28013 -8.415417 566.387
## 136504 -37.27986 -8.415417 567.079
## 136505 -37.27958 -8.415417 567.924
## 136506 -37.27930 -8.415417 568.801
## 136507 -37.27902 -8.415417 569.989
## 136508 -37.27875 -8.415417 570.922
## 136509 -37.27847 -8.415417 571.753
## 136510 -37.27819 -8.415417 571.667
## 136511 -37.27791 -8.415417 571.651
## 136512 -37.27763 -8.415417 571.770
## 136513 -37.27736 -8.415417 572.333
## 136514 -37.27708 -8.415417 573.112
## 136515 -37.27680 -8.415417 574.008
## 136516 -37.27652 -8.415417 574.939
## 136517 -37.27625 -8.415417 575.793
## 136518 -37.27597 -8.415417 576.480
## 136519 -37.27569 -8.415417 576.897
## 136520 -37.27541 -8.415417 577.159
## 136521 -37.27513 -8.415417 577.352
## 136522 -37.27486 -8.415417 577.555
## 136523 -37.27458 -8.415417 577.691
## 136524 -37.27430 -8.415417 577.676
## 136525 -37.27402 -8.415417 577.726
## 136526 -37.27375 -8.415417 577.449
## 136527 -37.27347 -8.415417 576.975
## 136528 -37.27319 -8.415417 575.685
## 136529 -37.27291 -8.415417 574.453
## 136530 -37.27263 -8.415417 573.438
## 136531 -37.27236 -8.415417 573.008
## 136532 -37.27208 -8.415417 572.798
## 136533 -37.27180 -8.415417 572.656
## 136534 -37.27152 -8.415417 572.158
## 136535 -37.27125 -8.415417 571.889
## 136536 -37.27097 -8.415417 571.980
## 136537 -37.27069 -8.415417 572.640
## 136538 -37.27041 -8.415417 573.678
## 136539 -37.27013 -8.415417 574.932
## 136540 -37.26986 -8.415417 576.243
## 136541 -37.26958 -8.415417 577.461
## 136542 -37.26930 -8.415417 578.391
## 136543 -37.26902 -8.415417 578.999
## 136544 -37.26875 -8.415417 579.215
## 136545 -37.26847 -8.415417 579.278
## 136546 -37.26819 -8.415417 578.828
## 136547 -37.26791 -8.415417 578.534
## 136548 -37.26763 -8.415417 578.619
## 136549 -37.26736 -8.415417 578.980
## 136550 -37.26708 -8.415417 579.641
## 136551 -37.26680 -8.415417 580.315
## 136552 -37.26652 -8.415417 580.637
## 136553 -37.26625 -8.415417 580.697
## 136554 -37.26597 -8.415417 580.278
## 136555 -37.26569 -8.415417 579.479
## 136556 -37.26541 -8.415417 578.318
## 136557 -37.26513 -8.415417 577.059
## 136558 -37.26486 -8.415417 575.939
## 136559 -37.26458 -8.415417 574.782
## 136560 -37.26430 -8.415417 573.355
## 136561 -37.26402 -8.415417 572.059
## 136562 -37.26375 -8.415417 570.725
## 136563 -37.26347 -8.415417 569.659
## 136564 -37.26319 -8.415417 569.130
## 136565 -37.26291 -8.415417 569.082
## 136566 -37.26263 -8.415417 569.589
## 136567 -37.26236 -8.415417 570.709
## 136568 -37.26208 -8.415417 572.088
## 136569 -37.26180 -8.415417 573.420
## 136570 -37.26152 -8.415417 574.491
## 136571 -37.26125 -8.415417 575.190
## 136572 -37.26097 -8.415417 575.592
## 136573 -37.26069 -8.415417 575.599
## 136574 -37.26041 -8.415417 575.210
## 136575 -37.26013 -8.415417 574.103
## 136576 -37.25986 -8.415417 572.967
## 136577 -37.25958 -8.415417 571.406
## 136578 -37.25930 -8.415417 569.922
## 136579 -37.25902 -8.415417 568.820
## 136580 -37.25875 -8.415417 567.950
## 136581 -37.25847 -8.415417 567.330
## 136582 -37.25819 -8.415417 566.697
## 136583 -37.25791 -8.415417 566.304
## 136584 -37.25763 -8.415417 566.132
## 136585 -37.25736 -8.415417 566.207
## 136586 -37.25708 -8.415417 566.539
## 136587 -37.25680 -8.415417 567.157
## 136588 -37.25652 -8.415417 567.961
## 136589 -37.25625 -8.415417 568.926
## 136590 -37.25597 -8.415417 570.060
## 136591 -37.25569 -8.415417 570.969
## 136592 -37.25541 -8.415417 571.703
## 136593 -37.25513 -8.415417 571.915
## 136594 -37.25486 -8.415417 571.395
## 136595 -37.25458 -8.415417 570.530
## 136596 -37.25430 -8.415417 569.575
## 136597 -37.25402 -8.415417 568.800
## 136598 -37.25375 -8.415417 568.481
## 136599 -37.25347 -8.415417 568.903
## 136600 -37.25319 -8.415417 570.340
## 136601 -37.25291 -8.415417 572.142
## 136602 -37.25263 -8.415417 573.887
## 136603 -37.25236 -8.415417 574.571
## 136604 -37.25208 -8.415417 574.944
## 136605 -37.25180 -8.415417 574.801
## 136606 -37.25152 -8.415417 574.947
## 136607 -37.25125 -8.415417 574.788
## 136608 -37.25097 -8.415417 574.627
## 136609 -37.25069 -8.415417 574.614
## 136610 -37.25041 -8.415417 574.450
## 136611 -37.25013 -8.415417 573.940
## 136612 -37.24986 -8.415417 572.873
## 136613 -37.24958 -8.415417 571.632
## 136614 -37.24930 -8.415417 570.544
## 136615 -37.24902 -8.415417 569.680
## 136616 -37.24875 -8.415417 569.287
## 136617 -37.24847 -8.415417 569.263
## 136618 -37.24819 -8.415417 570.148
## 136619 -37.24791 -8.415417 571.216
## 136620 -37.24763 -8.415417 572.363
## 136621 -37.24736 -8.415417 573.305
## 136622 -37.24708 -8.415417 574.110
## 136623 -37.24680 -8.415417 574.902
## 136624 -37.24652 -8.415417 575.166
## 136625 -37.24625 -8.415417 575.680
## 136626 -37.24597 -8.415417 576.586
## 136627 -37.24569 -8.415417 577.842
## 136628 -37.24541 -8.415417 579.427
## 136629 -37.24513 -8.415417 581.013
## 136630 -37.24486 -8.415417 582.386
## 136631 -37.24458 -8.415417 583.488
## 136632 -37.24430 -8.415417 584.027
## 136633 -37.24402 -8.415417 584.301
## 136634 -37.24375 -8.415417 584.444
## 136635 -37.24347 -8.415417 584.754
## 136636 -37.24319 -8.415417 586.245
## 136637 -37.24291 -8.415417 587.642
## 136638 -37.24263 -8.415417 588.623
## 136639 -37.24236 -8.415417 588.653
## 136640 -37.24208 -8.415417 588.426
## 136641 -37.24180 -8.415417 588.481
## 136642 -37.24152 -8.415417 588.961
## 136643 -37.24125 -8.415417 589.609
## 136644 -37.24097 -8.415417 590.149
## 136645 -37.24069 -8.415417 590.021
## 136646 -37.24041 -8.415417 589.818
## 136647 -37.24013 -8.415417 589.732
## 136648 -37.23986 -8.415417 590.024
## 136649 -37.23958 -8.415417 590.470
## 136650 -37.23930 -8.415417 591.166
## 136651 -37.23902 -8.415417 591.476
## 136652 -37.23875 -8.415417 591.829
## 136653 -37.23847 -8.415417 591.948
## 136654 -37.23819 -8.415417 591.644
## 136655 -37.23791 -8.415417 591.099
## 136656 -37.23763 -8.415417 590.375
## 136657 -37.23736 -8.415417 589.562
## 136658 -37.23708 -8.415417 588.612
## 136659 -37.23680 -8.415417 587.527
## 136660 -37.23652 -8.415417 586.254
## 136661 -37.23625 -8.415417 585.044
## 136662 -37.23597 -8.415417 583.919
## 136663 -37.23569 -8.415417 583.430
## 136664 -37.23541 -8.415417 582.861
## 136665 -37.23513 -8.415417 582.025
## 136666 -37.23486 -8.415417 580.550
## 136667 -37.23458 -8.415417 579.094
## 136668 -37.23430 -8.415417 578.116
## 136669 -37.23402 -8.415417 577.786
## 136670 -37.23375 -8.415417 578.164
## 136671 -37.23347 -8.415417 579.186
## 136672 -37.23319 -8.415417 580.065
## 136673 -37.23291 -8.415417 581.120
## 136674 -37.23263 -8.415417 581.748
## 136675 -37.23236 -8.415417 581.920
## 136676 -37.23208 -8.415417 581.827
## 136677 -37.23180 -8.415417 581.750
## 136678 -37.23152 -8.415417 582.463
## 136679 -37.23125 -8.415417 583.328
## 136680 -37.23097 -8.415417 584.477
## 136681 -37.23069 -8.415417 585.716
## 136682 -37.23041 -8.415417 587.000
## 136683 -37.23013 -8.415417 588.152
## 136684 -37.22986 -8.415417 589.040
## 136685 -37.22958 -8.415417 589.668
## 136686 -37.22930 -8.415417 590.177
## 136687 -37.22902 -8.415417 590.091
## 136688 -37.22875 -8.415417 589.992
## 136689 -37.22847 -8.415417 589.759
## 136690 -37.22819 -8.415417 589.633
## 136691 -37.22791 -8.415417 589.443
## 136692 -37.22763 -8.415417 589.204
## 136693 -37.22736 -8.415417 588.852
## 136694 -37.22708 -8.415417 588.614
## 136695 -37.22680 -8.415417 588.622
## 136696 -37.22652 -8.415417 589.088
## 136697 -37.22625 -8.415417 589.526
## 136698 -37.22597 -8.415417 589.483
## 136699 -37.22569 -8.415417 588.604
## 136700 -37.22541 -8.415417 587.287
## 136701 -37.22513 -8.415417 585.813
## 136702 -37.22486 -8.415417 584.817
## 136703 -37.22458 -8.415417 583.814
## 136704 -37.22430 -8.415417 582.906
## 136705 -37.22402 -8.415417 581.683
## 136706 -37.22375 -8.415417 580.583
## 136707 -37.22347 -8.415417 579.584
## 136708 -37.22319 -8.415417 578.706
## 136709 -37.22291 -8.415417 577.824
## 136710 -37.22263 -8.415417 576.757
## 136711 -37.22236 -8.415417 575.345
## 137489 -37.38263 -8.415694 515.058
## 137490 -37.38236 -8.415694 516.132
## 137491 -37.38208 -8.415694 517.310
## 137492 -37.38180 -8.415694 518.768
## 137493 -37.38152 -8.415694 519.746
## 137494 -37.38125 -8.415694 520.424
## 137495 -37.38097 -8.415694 520.962
## 137496 -37.38069 -8.415694 521.093
## 137497 -37.38041 -8.415694 521.159
## 137498 -37.38013 -8.415694 520.733
## 137499 -37.37986 -8.415694 520.631
## 137500 -37.37958 -8.415694 520.607
## 137501 -37.37930 -8.415694 520.444
## 137502 -37.37902 -8.415694 520.243
## 137503 -37.37875 -8.415694 519.361
## 137504 -37.37847 -8.415694 518.321
## 137505 -37.37819 -8.415694 517.397
## 137506 -37.37791 -8.415694 516.719
## 137507 -37.37763 -8.415694 516.274
## 137508 -37.37736 -8.415694 516.111
## 137509 -37.37708 -8.415694 516.347
## 137510 -37.37680 -8.415694 517.022
## 137511 -37.37652 -8.415694 517.335
## 137512 -37.37625 -8.415694 517.566
## 137513 -37.37597 -8.415694 517.722
## 137514 -37.37569 -8.415694 517.886
## 137515 -37.37541 -8.415694 518.240
## 137516 -37.37513 -8.415694 518.432
## 137517 -37.37486 -8.415694 518.600
## 137518 -37.37458 -8.415694 518.811
## 137545 -37.36708 -8.415694 519.400
## 137546 -37.36680 -8.415694 520.324
## 137547 -37.36652 -8.415694 520.750
## 137548 -37.36625 -8.415694 521.261
## 137549 -37.36597 -8.415694 521.884
## 137550 -37.36569 -8.415694 522.931
## 137551 -37.36541 -8.415694 523.761
## 137552 -37.36513 -8.415694 524.500
## 137553 -37.36486 -8.415694 525.222
## 137554 -37.36458 -8.415694 525.859
## 137555 -37.36430 -8.415694 526.369
## 137556 -37.36402 -8.415694 526.789
## 137557 -37.36375 -8.415694 527.583
## 137558 -37.36347 -8.415694 528.772
## 137559 -37.36319 -8.415694 530.809
## 137560 -37.36291 -8.415694 532.970
## 137561 -37.36263 -8.415694 535.242
## 137562 -37.36236 -8.415694 537.186
## 137563 -37.36208 -8.415694 539.189
## 137564 -37.36180 -8.415694 541.287
## 137565 -37.36152 -8.415694 543.492
## 137566 -37.36125 -8.415694 545.716
## 137567 -37.36097 -8.415694 547.929
## 137568 -37.36069 -8.415694 549.710
## 137569 -37.36041 -8.415694 551.347
## 137570 -37.36013 -8.415694 552.676
## 137571 -37.35986 -8.415694 553.994
## 137572 -37.35958 -8.415694 555.327
## 137573 -37.35930 -8.415694 556.651
## 137574 -37.35902 -8.415694 558.287
## 137575 -37.35875 -8.415694 559.939
## 137576 -37.35847 -8.415694 561.631
## 137577 -37.35819 -8.415694 562.980
## 137578 -37.35791 -8.415694 563.827
## 137579 -37.35763 -8.415694 564.387
## 137580 -37.35736 -8.415694 564.884
## 137581 -37.35708 -8.415694 565.062
## 137582 -37.35680 -8.415694 564.972
## 137583 -37.35652 -8.415694 564.780
## 137584 -37.35625 -8.415694 564.759
## 137585 -37.35597 -8.415694 564.836
## 137586 -37.35569 -8.415694 565.279
## 137587 -37.35541 -8.415694 565.472
## 137588 -37.35513 -8.415694 565.583
## 137589 -37.35486 -8.415694 565.435
## 137590 -37.35458 -8.415694 565.182
## 137591 -37.35430 -8.415694 565.015
## 137592 -37.35402 -8.415694 565.132
## 137593 -37.35375 -8.415694 565.355
## 137594 -37.35347 -8.415694 565.601
## 137595 -37.35319 -8.415694 565.832
## 137596 -37.35291 -8.415694 565.997
## 137597 -37.35263 -8.415694 565.951
## 137598 -37.35236 -8.415694 565.841
## 137599 -37.35208 -8.415694 565.812
## 137600 -37.35180 -8.415694 565.810
## 137601 -37.35152 -8.415694 565.994
## 137602 -37.35125 -8.415694 566.142
## 137603 -37.35097 -8.415694 566.487
## 137604 -37.35069 -8.415694 567.342
## 137605 -37.35041 -8.415694 568.299
## 137606 -37.35013 -8.415694 569.079
## 137607 -37.34986 -8.415694 569.431
## 137608 -37.34958 -8.415694 569.696
## 137609 -37.34930 -8.415694 569.922
## 137610 -37.34902 -8.415694 570.226
## 137611 -37.34875 -8.415694 570.508
## 137612 -37.34847 -8.415694 570.776
## 137613 -37.34819 -8.415694 570.854
## 137614 -37.34791 -8.415694 571.040
## 137615 -37.34763 -8.415694 571.527
## 137616 -37.34736 -8.415694 572.660
## 137617 -37.34708 -8.415694 573.757
## 137618 -37.34680 -8.415694 574.836
## 137619 -37.34652 -8.415694 575.130
## 137620 -37.34625 -8.415694 575.268
## 137621 -37.34597 -8.415694 575.187
## 137622 -37.34569 -8.415694 575.493
## 137623 -37.34541 -8.415694 575.831
## 137624 -37.34513 -8.415694 575.887
## 137625 -37.34486 -8.415694 575.232
## 137626 -37.34458 -8.415694 574.424
## 137627 -37.34430 -8.415694 573.947
## 137628 -37.34402 -8.415694 574.082
## 137629 -37.34375 -8.415694 574.358
## 137630 -37.34347 -8.415694 574.636
## 137631 -37.34319 -8.415694 574.584
## 137632 -37.34291 -8.415694 574.527
## 137633 -37.34263 -8.415694 574.327
## 137634 -37.34236 -8.415694 574.088
## 137635 -37.34208 -8.415694 573.840
## 137636 -37.34180 -8.415694 573.712
## 137637 -37.34152 -8.415694 573.904
## 137638 -37.34125 -8.415694 574.056
## 137639 -37.34097 -8.415694 574.213
## 137640 -37.34069 -8.415694 574.096
## 137641 -37.34041 -8.415694 573.885
## 137642 -37.34013 -8.415694 573.635
## 137643 -37.33986 -8.415694 573.576
## 137644 -37.33958 -8.415694 573.658
## 137645 -37.33930 -8.415694 573.754
## 137646 -37.33902 -8.415694 573.632
## 137647 -37.33875 -8.415694 573.645
## 137648 -37.33847 -8.415694 573.694
## 137649 -37.33819 -8.415694 573.946
## 137650 -37.33791 -8.415694 573.988
## 137651 -37.33763 -8.415694 574.181
## 137652 -37.33736 -8.415694 574.399
## 137653 -37.33708 -8.415694 574.740
## 137654 -37.33680 -8.415694 574.790
## 137655 -37.33652 -8.415694 575.100
## 137656 -37.33625 -8.415694 575.445
## 137657 -37.33597 -8.415694 575.958
## 137658 -37.33569 -8.415694 575.801
## 137659 -37.33541 -8.415694 575.366
## 137660 -37.33513 -8.415694 574.963
## 137661 -37.33486 -8.415694 574.743
## 137662 -37.33458 -8.415694 574.702
## 137663 -37.33430 -8.415694 574.867
## 137664 -37.33402 -8.415694 575.263
## 137665 -37.33375 -8.415694 575.768
## 137666 -37.33347 -8.415694 576.168
## 137667 -37.33319 -8.415694 576.079
## 137668 -37.33291 -8.415694 576.083
## 137669 -37.33263 -8.415694 575.867
## 137670 -37.33236 -8.415694 576.072
## 137671 -37.33208 -8.415694 576.541
## 137672 -37.33180 -8.415694 577.317
## 137673 -37.33152 -8.415694 578.789
## 137674 -37.33125 -8.415694 579.812
## 137675 -37.33097 -8.415694 580.545
## 137676 -37.33069 -8.415694 579.926
## 137677 -37.33041 -8.415694 578.888
## 137678 -37.33013 -8.415694 577.717
## 137679 -37.32986 -8.415694 577.417
## 137680 -37.32958 -8.415694 577.520
## 137681 -37.32930 -8.415694 577.614
## 137682 -37.32902 -8.415694 577.629
## 137683 -37.32875 -8.415694 577.772
## 137684 -37.32847 -8.415694 578.303
## 137685 -37.32819 -8.415694 578.661
## 137686 -37.32791 -8.415694 578.872
## 137687 -37.32763 -8.415694 578.754
## 137688 -37.32736 -8.415694 578.442
## 137689 -37.32708 -8.415694 578.261
## 137690 -37.32680 -8.415694 578.466
## 137691 -37.32652 -8.415694 579.158
## 137692 -37.32625 -8.415694 579.850
## 137693 -37.32597 -8.415694 580.552
## 137694 -37.32569 -8.415694 580.653
## 137695 -37.32541 -8.415694 580.694
## 137696 -37.32513 -8.415694 580.471
## 137697 -37.32486 -8.415694 580.805
## 137698 -37.32458 -8.415694 581.325
## 137699 -37.32430 -8.415694 581.931
## 137700 -37.32402 -8.415694 582.662
## 137701 -37.32375 -8.415694 582.862
## 137702 -37.32347 -8.415694 582.878
## 137703 -37.32319 -8.415694 582.639
## 137704 -37.32291 -8.415694 582.503
## 137705 -37.32263 -8.415694 582.560
## 137706 -37.32236 -8.415694 582.955
## 137707 -37.32208 -8.415694 583.543
## 137708 -37.32180 -8.415694 584.103
## 137709 -37.32152 -8.415694 584.456
## 137710 -37.32125 -8.415694 584.687
## 137711 -37.32097 -8.415694 584.711
## 137712 -37.32069 -8.415694 584.764
## 137713 -37.32041 -8.415694 584.661
## 137714 -37.32013 -8.415694 584.403
## 137715 -37.31986 -8.415694 583.805
## 137716 -37.31958 -8.415694 583.138
## 137717 -37.31930 -8.415694 582.530
## 137718 -37.31902 -8.415694 582.325
## 137719 -37.31875 -8.415694 582.337
## 137720 -37.31847 -8.415694 582.663
## 137721 -37.31819 -8.415694 582.797
## 137722 -37.31791 -8.415694 583.049
## 137723 -37.31763 -8.415694 583.200
## 137724 -37.31736 -8.415694 583.608
## 137725 -37.31708 -8.415694 583.715
## 137726 -37.31680 -8.415694 583.587
## 137727 -37.31652 -8.415694 582.977
## 137728 -37.31625 -8.415694 582.252
## 137729 -37.31597 -8.415694 581.643
## 137730 -37.31569 -8.415694 580.867
## 137731 -37.31541 -8.415694 579.918
## 137732 -37.31513 -8.415694 578.893
## 137733 -37.31486 -8.415694 577.514
## 137734 -37.31458 -8.415694 576.176
## 137735 -37.31430 -8.415694 574.370
## 137736 -37.31402 -8.415694 572.601
## 137737 -37.31375 -8.415694 571.152
## 137738 -37.31347 -8.415694 570.293
## 137739 -37.31319 -8.415694 569.574
## 137740 -37.31291 -8.415694 569.181
## 137741 -37.31263 -8.415694 568.939
## 137742 -37.31236 -8.415694 568.617
## 137743 -37.31208 -8.415694 568.513
## 137744 -37.31180 -8.415694 568.490
## 137745 -37.31152 -8.415694 568.840
## 137746 -37.31125 -8.415694 569.418
## 137747 -37.31097 -8.415694 570.086
## 137748 -37.31069 -8.415694 570.699
## 137749 -37.31041 -8.415694 571.299
## 137750 -37.31013 -8.415694 572.012
## 137751 -37.30986 -8.415694 573.123
## 137752 -37.30958 -8.415694 574.549
## 137753 -37.30930 -8.415694 576.387
## 137754 -37.30902 -8.415694 578.816
## 137755 -37.30875 -8.415694 581.294
## 137756 -37.30847 -8.415694 583.924
## 137757 -37.30819 -8.415694 585.432
## 137758 -37.30791 -8.415694 586.435
## 137759 -37.30763 -8.415694 587.000
## 137760 -37.30736 -8.415694 587.452
## 137761 -37.30708 -8.415694 587.981
## 137762 -37.30680 -8.415694 588.177
## 137763 -37.30652 -8.415694 588.958
## 137764 -37.30625 -8.415694 589.914
## 137765 -37.30597 -8.415694 591.095
## 137766 -37.30569 -8.415694 591.816
## 137767 -37.30541 -8.415694 592.239
## 137768 -37.30513 -8.415694 592.594
## 137769 -37.30486 -8.415694 593.200
## 137770 -37.30458 -8.415694 593.650
## 137771 -37.30430 -8.415694 593.984
## 137772 -37.30402 -8.415694 593.700
## 137773 -37.30375 -8.415694 593.410
## 137774 -37.30347 -8.415694 593.370
## 137775 -37.30319 -8.415694 593.635
## 137776 -37.30291 -8.415694 593.805
## 137777 -37.30263 -8.415694 593.356
## 137778 -37.30236 -8.415694 592.002
## 137779 -37.30208 -8.415694 590.555
## 137780 -37.30180 -8.415694 589.188
## 137781 -37.30152 -8.415694 588.232
## 137782 -37.30125 -8.415694 587.183
## 137783 -37.30097 -8.415694 586.319
## 137784 -37.30069 -8.415694 584.977
## 137785 -37.30041 -8.415694 583.627
## 137786 -37.30013 -8.415694 582.387
## 137787 -37.29986 -8.415694 581.689
## 137788 -37.29958 -8.415694 581.461
## 137789 -37.29930 -8.415694 581.773
## 137790 -37.29902 -8.415694 582.380
## 137791 -37.29875 -8.415694 582.969
## 137792 -37.29847 -8.415694 583.080
## 137793 -37.29819 -8.415694 582.253
## 137794 -37.29791 -8.415694 581.314
## 137795 -37.29763 -8.415694 580.561
## 137796 -37.29736 -8.415694 580.209
## 137797 -37.29708 -8.415694 579.934
## 137798 -37.29680 -8.415694 579.971
## 137799 -37.29652 -8.415694 580.428
## 137800 -37.29625 -8.415694 581.199
## 137801 -37.29597 -8.415694 581.885
## 137802 -37.29569 -8.415694 581.845
## 137803 -37.29541 -8.415694 581.437
## 137804 -37.29513 -8.415694 580.711
## 137805 -37.29486 -8.415694 579.946
## 137806 -37.29458 -8.415694 579.169
## 137807 -37.29430 -8.415694 578.317
## 137808 -37.29402 -8.415694 577.646
## 137809 -37.29375 -8.415694 577.329
## 137810 -37.29347 -8.415694 578.037
## 137811 -37.29319 -8.415694 578.968
## 137812 -37.29291 -8.415694 579.812
## 137813 -37.29263 -8.415694 579.677
## 137814 -37.29236 -8.415694 578.552
## 137815 -37.29208 -8.415694 577.401
## 137816 -37.29180 -8.415694 576.146
## 137817 -37.29152 -8.415694 575.498
## 137818 -37.29125 -8.415694 575.060
## 137819 -37.29097 -8.415694 574.970
## 137820 -37.29069 -8.415694 574.819
## 137821 -37.29041 -8.415694 574.446
## 137822 -37.29013 -8.415694 573.944
## 137823 -37.28986 -8.415694 573.174
## 137824 -37.28958 -8.415694 572.317
## 137825 -37.28930 -8.415694 571.327
## 137826 -37.28902 -8.415694 570.131
## 137827 -37.28875 -8.415694 569.172
## 137828 -37.28847 -8.415694 568.122
## 137829 -37.28819 -8.415694 567.573
## 137830 -37.28791 -8.415694 567.093
## 137831 -37.28763 -8.415694 566.681
## 137832 -37.28736 -8.415694 566.487
## 137833 -37.28708 -8.415694 565.936
## 137834 -37.28680 -8.415694 565.577
## 137835 -37.28652 -8.415694 564.813
## 137836 -37.28625 -8.415694 564.194
## 137837 -37.28597 -8.415694 563.648
## 137838 -37.28569 -8.415694 564.011
## 137839 -37.28541 -8.415694 564.753
## 137840 -37.28513 -8.415694 565.232
## 137841 -37.28486 -8.415694 565.622
## 137842 -37.28458 -8.415694 566.009
## 137843 -37.28430 -8.415694 566.594
## 137844 -37.28402 -8.415694 567.068
## 137845 -37.28375 -8.415694 567.339
## 137846 -37.28347 -8.415694 567.797
## 137847 -37.28319 -8.415694 568.016
## 137848 -37.28291 -8.415694 568.065
## 137849 -37.28263 -8.415694 567.840
## 137850 -37.28236 -8.415694 567.651
## 137851 -37.28208 -8.415694 567.466
## 137852 -37.28180 -8.415694 566.948
## 137853 -37.28152 -8.415694 566.183
## 137854 -37.28125 -8.415694 565.421
## 137855 -37.28097 -8.415694 565.212
## 137856 -37.28069 -8.415694 565.173
## 137857 -37.28041 -8.415694 565.529
## 137858 -37.28013 -8.415694 566.328
## 137859 -37.27986 -8.415694 567.122
## 137860 -37.27958 -8.415694 568.191
## 137861 -37.27930 -8.415694 569.024
## 137862 -37.27902 -8.415694 570.124
## 137863 -37.27875 -8.415694 571.191
## 137864 -37.27847 -8.415694 572.151
## 137865 -37.27819 -8.415694 572.542
## 137866 -37.27791 -8.415694 572.640
## 137867 -37.27763 -8.415694 572.903
## 137868 -37.27736 -8.415694 573.611
## 137869 -37.27708 -8.415694 574.306
## 137870 -37.27680 -8.415694 574.834
## 137871 -37.27652 -8.415694 575.461
## 137872 -37.27625 -8.415694 576.159
## 137873 -37.27597 -8.415694 576.993
## 137874 -37.27569 -8.415694 577.302
## 137875 -37.27541 -8.415694 577.551
## 137876 -37.27513 -8.415694 577.744
## 137877 -37.27486 -8.415694 577.874
## 137878 -37.27458 -8.415694 577.971
## 137879 -37.27430 -8.415694 577.662
## 137880 -37.27402 -8.415694 577.361
## 137881 -37.27375 -8.415694 576.935
## 137882 -37.27347 -8.415694 576.292
## 137883 -37.27319 -8.415694 575.341
## 137884 -37.27291 -8.415694 574.234
## 137885 -37.27263 -8.415694 573.316
## 137886 -37.27236 -8.415694 573.134
## 137887 -37.27208 -8.415694 572.993
## 137888 -37.27180 -8.415694 572.790
## 137889 -37.27152 -8.415694 572.708
## 137890 -37.27125 -8.415694 572.748
## 137891 -37.27097 -8.415694 573.187
## 137892 -37.27069 -8.415694 574.126
## 137893 -37.27041 -8.415694 575.170
## 137894 -37.27013 -8.415694 576.478
## 137895 -37.26986 -8.415694 577.662
## 137896 -37.26958 -8.415694 578.810
## 137897 -37.26930 -8.415694 579.525
## 137898 -37.26902 -8.415694 579.532
## 137899 -37.26875 -8.415694 579.483
## 137900 -37.26847 -8.415694 579.062
## 137901 -37.26819 -8.415694 578.751
## 137902 -37.26791 -8.415694 578.551
## 137903 -37.26763 -8.415694 578.948
## 137904 -37.26736 -8.415694 579.902
## 137905 -37.26708 -8.415694 580.726
## 137906 -37.26680 -8.415694 581.370
## 137907 -37.26652 -8.415694 581.719
## 137908 -37.26625 -8.415694 581.648
## 137909 -37.26597 -8.415694 581.073
## 137910 -37.26569 -8.415694 580.100
## 137911 -37.26541 -8.415694 578.880
## 137912 -37.26513 -8.415694 577.524
## 137913 -37.26486 -8.415694 576.190
## 137914 -37.26458 -8.415694 574.650
## 137915 -37.26430 -8.415694 572.839
## 137916 -37.26402 -8.415694 570.996
## 137917 -37.26375 -8.415694 569.638
## 137918 -37.26347 -8.415694 568.743
## 137919 -37.26319 -8.415694 568.454
## 137920 -37.26291 -8.415694 568.821
## 137921 -37.26263 -8.415694 569.909
## 137922 -37.26236 -8.415694 571.472
## 137923 -37.26208 -8.415694 573.026
## 137924 -37.26180 -8.415694 574.446
## 137925 -37.26152 -8.415694 575.248
## 137926 -37.26125 -8.415694 575.779
## 137927 -37.26097 -8.415694 576.122
## 137928 -37.26069 -8.415694 576.062
## 137929 -37.26041 -8.415694 575.479
## 137930 -37.26013 -8.415694 574.383
## 137931 -37.25986 -8.415694 572.745
## 137932 -37.25958 -8.415694 571.077
## 137933 -37.25930 -8.415694 569.349
## 137934 -37.25902 -8.415694 567.936
## 137935 -37.25875 -8.415694 566.918
## 137936 -37.25847 -8.415694 566.255
## 137937 -37.25819 -8.415694 565.733
## 137938 -37.25791 -8.415694 565.511
## 137939 -37.25763 -8.415694 565.723
## 137940 -37.25736 -8.415694 566.161
## 137941 -37.25708 -8.415694 566.775
## 137942 -37.25680 -8.415694 567.420
## 137943 -37.25652 -8.415694 568.277
## 137944 -37.25625 -8.415694 569.314
## 137945 -37.25597 -8.415694 570.479
## 137946 -37.25569 -8.415694 571.686
## 137947 -37.25541 -8.415694 572.449
## 137948 -37.25513 -8.415694 572.928
## 137949 -37.25486 -8.415694 572.421
## 137950 -37.25458 -8.415694 571.464
## 137951 -37.25430 -8.415694 570.289
## 137952 -37.25402 -8.415694 569.116
## 137953 -37.25375 -8.415694 568.981
## 137954 -37.25347 -8.415694 569.509
## 137955 -37.25319 -8.415694 571.142
## 137956 -37.25291 -8.415694 572.995
## 137957 -37.25263 -8.415694 574.958
## 137958 -37.25236 -8.415694 575.783
## 137959 -37.25208 -8.415694 576.155
## 137960 -37.25180 -8.415694 575.959
## 137961 -37.25152 -8.415694 575.735
## 137962 -37.25125 -8.415694 575.531
## 137963 -37.25097 -8.415694 575.057
## 137964 -37.25069 -8.415694 574.918
## 137965 -37.25041 -8.415694 574.714
## 137966 -37.25013 -8.415694 574.434
## 137967 -37.24986 -8.415694 573.550
## 137968 -37.24958 -8.415694 572.393
## 137969 -37.24930 -8.415694 571.287
## 137970 -37.24902 -8.415694 570.432
## 137971 -37.24875 -8.415694 569.783
## 137972 -37.24847 -8.415694 569.672
## 137973 -37.24819 -8.415694 570.059
## 137974 -37.24791 -8.415694 570.877
## 137975 -37.24763 -8.415694 571.549
## 137976 -37.24736 -8.415694 572.210
## 137977 -37.24708 -8.415694 573.000
## 137978 -37.24680 -8.415694 573.693
## 137979 -37.24652 -8.415694 574.318
## 137980 -37.24625 -8.415694 574.976
## 137981 -37.24597 -8.415694 576.192
## 137982 -37.24569 -8.415694 577.906
## 137983 -37.24541 -8.415694 579.566
## 137984 -37.24513 -8.415694 581.163
## 137985 -37.24486 -8.415694 582.393
## 137986 -37.24458 -8.415694 583.276
## 137987 -37.24430 -8.415694 583.678
## 137988 -37.24402 -8.415694 583.438
## 137989 -37.24375 -8.415694 583.446
## 137990 -37.24347 -8.415694 583.710
## 137991 -37.24319 -8.415694 584.928
## 137992 -37.24291 -8.415694 586.166
## 137993 -37.24263 -8.415694 586.928
## 137994 -37.24236 -8.415694 586.691
## 137995 -37.24208 -8.415694 586.359
## 137996 -37.24180 -8.415694 586.319
## 137997 -37.24152 -8.415694 587.072
## 137998 -37.24125 -8.415694 587.817
## 137999 -37.24097 -8.415694 588.717
## 138000 -37.24069 -8.415694 588.736
## 138001 -37.24041 -8.415694 588.634
## 138002 -37.24013 -8.415694 588.333
## 138003 -37.23986 -8.415694 588.634
## 138004 -37.23958 -8.415694 589.222
## 138005 -37.23930 -8.415694 589.975
## 138006 -37.23902 -8.415694 590.559
## 138007 -37.23875 -8.415694 590.857
## 138008 -37.23847 -8.415694 590.935
## 138009 -37.23819 -8.415694 590.743
## 138010 -37.23791 -8.415694 590.329
## 138011 -37.23763 -8.415694 589.729
## 138012 -37.23736 -8.415694 589.029
## 138013 -37.23708 -8.415694 588.234
## 138014 -37.23680 -8.415694 587.510
## 138015 -37.23652 -8.415694 586.386
## 138016 -37.23625 -8.415694 585.233
## 138017 -37.23597 -8.415694 584.166
## 138018 -37.23569 -8.415694 583.450
## 138019 -37.23541 -8.415694 582.780
## 138020 -37.23513 -8.415694 581.815
## 138021 -37.23486 -8.415694 580.190
## 138022 -37.23458 -8.415694 578.622
## 138023 -37.23430 -8.415694 577.366
## 138024 -37.23402 -8.415694 577.143
## 138025 -37.23375 -8.415694 577.796
## 138026 -37.23347 -8.415694 579.391
## 138027 -37.23319 -8.415694 580.861
## 138028 -37.23291 -8.415694 582.088
## 138029 -37.23263 -8.415694 582.943
## 138030 -37.23236 -8.415694 583.146
## 138031 -37.23208 -8.415694 583.057
## 138032 -37.23180 -8.415694 582.841
## 138033 -37.23152 -8.415694 583.015
## 138034 -37.23125 -8.415694 583.720
## 138035 -37.23097 -8.415694 584.580
## 138036 -37.23069 -8.415694 585.826
## 138037 -37.23041 -8.415694 587.080
## 138038 -37.23013 -8.415694 588.298
## 138039 -37.22986 -8.415694 589.370
## 138040 -37.22958 -8.415694 590.050
## 138041 -37.22930 -8.415694 590.699
## 138042 -37.22902 -8.415694 590.898
## 138043 -37.22875 -8.415694 590.847
## 138044 -37.22847 -8.415694 590.585
## 138045 -37.22819 -8.415694 590.519
## 138046 -37.22791 -8.415694 590.489
## 138047 -37.22763 -8.415694 590.631
## 138048 -37.22736 -8.415694 590.349
## 138049 -37.22708 -8.415694 590.147
## 138050 -37.22680 -8.415694 589.959
## 138051 -37.22652 -8.415694 590.231
## 138052 -37.22625 -8.415694 590.392
## 138053 -37.22597 -8.415694 590.032
## 138054 -37.22569 -8.415694 588.705
## 138055 -37.22541 -8.415694 587.221
## 138056 -37.22513 -8.415694 585.752
## 138057 -37.22486 -8.415694 584.668
## 138058 -37.22458 -8.415694 583.753
## 138059 -37.22430 -8.415694 582.772
## 138060 -37.22402 -8.415694 581.727
## 138061 -37.22375 -8.415694 580.659
## 138062 -37.22347 -8.415694 579.942
## 138063 -37.22319 -8.415694 579.237
## 138064 -37.22291 -8.415694 578.424
## 138065 -37.22263 -8.415694 577.246
## 138066 -37.22236 -8.415694 575.684
## 138067 -37.22208 -8.415694 574.544
## 138844 -37.38263 -8.415972 514.725
## 138845 -37.38236 -8.415972 515.937
## 138846 -37.38208 -8.415972 517.307
## 138847 -37.38180 -8.415972 518.962
## 138848 -37.38152 -8.415972 520.110
## 138849 -37.38125 -8.415972 520.971
## 138850 -37.38097 -8.415972 521.665
## 138851 -37.38069 -8.415972 521.978
## 138852 -37.38041 -8.415972 522.237
## 138853 -37.38013 -8.415972 521.986
## 138854 -37.37986 -8.415972 521.730
## 138855 -37.37958 -8.415972 521.537
## 138856 -37.37930 -8.415972 521.243
## 138857 -37.37902 -8.415972 521.128
## 138858 -37.37875 -8.415972 520.438
## 138859 -37.37847 -8.415972 519.562
## 138860 -37.37819 -8.415972 518.148
## 138861 -37.37791 -8.415972 516.835
## 138862 -37.37763 -8.415972 515.815
## 138863 -37.37736 -8.415972 516.153
## 138864 -37.37708 -8.415972 516.905
## 138865 -37.37680 -8.415972 517.760
## 138866 -37.37652 -8.415972 517.914
## 138867 -37.37625 -8.415972 517.940
## 138868 -37.37597 -8.415972 517.930
## 138869 -37.37569 -8.415972 518.033
## 138870 -37.37541 -8.415972 518.102
## 138871 -37.37513 -8.415972 518.209
## 138872 -37.37486 -8.415972 518.519
## 138873 -37.37458 -8.415972 518.848
## 138874 -37.37430 -8.415972 519.054
## 138875 -37.37402 -8.415972 519.145
## 138876 -37.37375 -8.415972 519.037
## 138900 -37.36708 -8.415972 518.705
## 138901 -37.36680 -8.415972 519.288
## 138902 -37.36652 -8.415972 520.160
## 138903 -37.36625 -8.415972 521.412
## 138904 -37.36597 -8.415972 522.499
## 138905 -37.36569 -8.415972 523.498
## 138906 -37.36541 -8.415972 524.391
## 138907 -37.36513 -8.415972 525.289
## 138908 -37.36486 -8.415972 525.625
## 138909 -37.36458 -8.415972 525.818
## 138910 -37.36430 -8.415972 525.962
## 138911 -37.36402 -8.415972 526.716
## 138912 -37.36375 -8.415972 527.709
## 138913 -37.36347 -8.415972 529.142
## 138914 -37.36319 -8.415972 530.917
## 138915 -37.36291 -8.415972 532.850
## 138916 -37.36263 -8.415972 534.841
## 138917 -37.36236 -8.415972 537.296
## 138918 -37.36208 -8.415972 539.817
## 138919 -37.36180 -8.415972 542.139
## 138920 -37.36152 -8.415972 544.075
## 138921 -37.36125 -8.415972 545.827
## 138922 -37.36097 -8.415972 547.667
## 138923 -37.36069 -8.415972 549.920
## 138924 -37.36041 -8.415972 551.993
## 138925 -37.36013 -8.415972 553.682
## 138926 -37.35986 -8.415972 554.745
## 138927 -37.35958 -8.415972 555.828
## 138928 -37.35930 -8.415972 557.031
## 138929 -37.35902 -8.415972 558.773
## 138930 -37.35875 -8.415972 560.614
## 138931 -37.35847 -8.415972 562.314
## 138932 -37.35819 -8.415972 563.711
## 138933 -37.35791 -8.415972 564.585
## 138934 -37.35763 -8.415972 565.251
## 138935 -37.35736 -8.415972 565.296
## 138936 -37.35708 -8.415972 565.192
## 138937 -37.35680 -8.415972 564.802
## 138938 -37.35652 -8.415972 564.886
## 138939 -37.35625 -8.415972 565.097
## 138940 -37.35597 -8.415972 565.326
## 138941 -37.35569 -8.415972 565.622
## 138942 -37.35541 -8.415972 565.681
## 138943 -37.35513 -8.415972 565.729
## 138944 -37.35486 -8.415972 565.508
## 138945 -37.35458 -8.415972 565.210
## 138946 -37.35430 -8.415972 565.009
## 138947 -37.35402 -8.415972 565.172
## 138948 -37.35375 -8.415972 565.494
## 138949 -37.35347 -8.415972 565.879
## 138950 -37.35319 -8.415972 566.016
## 138951 -37.35291 -8.415972 566.038
## 138952 -37.35263 -8.415972 565.982
## 138953 -37.35236 -8.415972 565.951
## 138954 -37.35208 -8.415972 566.013
## 138955 -37.35180 -8.415972 566.067
## 138956 -37.35152 -8.415972 566.354
## 138957 -37.35125 -8.415972 566.683
## 138958 -37.35097 -8.415972 567.127
## 138959 -37.35069 -8.415972 567.863
## 138960 -37.35041 -8.415972 568.644
## 138961 -37.35013 -8.415972 569.354
## 138962 -37.34986 -8.415972 569.675
## 138963 -37.34958 -8.415972 569.940
## 138964 -37.34930 -8.415972 570.098
## 138965 -37.34902 -8.415972 570.593
## 138966 -37.34875 -8.415972 571.139
## 138967 -37.34847 -8.415972 571.548
## 138968 -37.34819 -8.415972 571.701
## 138969 -37.34791 -8.415972 572.025
## 138970 -37.34763 -8.415972 572.711
## 138971 -37.34736 -8.415972 573.575
## 138972 -37.34708 -8.415972 574.347
## 138973 -37.34680 -8.415972 575.179
## 138974 -37.34652 -8.415972 575.851
## 138975 -37.34625 -8.415972 576.224
## 138976 -37.34597 -8.415972 576.534
## 138977 -37.34569 -8.415972 576.490
## 138978 -37.34541 -8.415972 576.623
## 138979 -37.34513 -8.415972 576.494
## 138980 -37.34486 -8.415972 576.155
## 138981 -37.34458 -8.415972 575.659
## 138982 -37.34430 -8.415972 575.403
## 138983 -37.34402 -8.415972 575.362
## 138984 -37.34375 -8.415972 575.404
## 138985 -37.34347 -8.415972 575.579
## 138986 -37.34319 -8.415972 575.537
## 138987 -37.34291 -8.415972 575.464
## 138988 -37.34263 -8.415972 575.319
## 138989 -37.34236 -8.415972 574.861
## 138990 -37.34208 -8.415972 574.483
## 138991 -37.34180 -8.415972 574.293
## 138992 -37.34152 -8.415972 574.698
## 138993 -37.34125 -8.415972 575.151
## 138994 -37.34097 -8.415972 575.546
## 138995 -37.34069 -8.415972 575.164
## 138996 -37.34041 -8.415972 574.628
## 138997 -37.34013 -8.415972 574.246
## 138998 -37.33986 -8.415972 574.069
## 138999 -37.33958 -8.415972 574.004
## 139000 -37.33930 -8.415972 574.007
## 139001 -37.33902 -8.415972 574.064
## 139002 -37.33875 -8.415972 574.306
## 139003 -37.33847 -8.415972 574.753
## 139004 -37.33819 -8.415972 574.927
## 139005 -37.33791 -8.415972 575.075
## 139006 -37.33763 -8.415972 575.050
## 139007 -37.33736 -8.415972 575.201
## 139008 -37.33708 -8.415972 575.276
## 139009 -37.33680 -8.415972 575.373
## 139010 -37.33652 -8.415972 575.670
## 139011 -37.33625 -8.415972 576.054
## 139012 -37.33597 -8.415972 576.620
## 139013 -37.33569 -8.415972 576.553
## 139014 -37.33541 -8.415972 576.288
## 139015 -37.33513 -8.415972 575.994
## 139016 -37.33486 -8.415972 575.732
## 139017 -37.33458 -8.415972 575.703
## 139018 -37.33430 -8.415972 575.860
## 139019 -37.33402 -8.415972 576.301
## 139020 -37.33375 -8.415972 576.814
## 139021 -37.33347 -8.415972 577.156
## 139022 -37.33319 -8.415972 577.148
## 139023 -37.33291 -8.415972 577.078
## 139024 -37.33263 -8.415972 576.842
## 139025 -37.33236 -8.415972 576.941
## 139026 -37.33208 -8.415972 577.283
## 139027 -37.33180 -8.415972 578.011
## 139028 -37.33152 -8.415972 579.540
## 139029 -37.33125 -8.415972 580.655
## 139030 -37.33097 -8.415972 581.424
## 139031 -37.33069 -8.415972 581.123
## 139032 -37.33041 -8.415972 580.537
## 139033 -37.33013 -8.415972 579.720
## 139034 -37.32986 -8.415972 579.104
## 139035 -37.32958 -8.415972 578.825
## 139036 -37.32930 -8.415972 578.721
## 139037 -37.32902 -8.415972 578.930
## 139038 -37.32875 -8.415972 579.187
## 139039 -37.32847 -8.415972 579.819
## 139040 -37.32819 -8.415972 580.237
## 139041 -37.32791 -8.415972 580.601
## 139042 -37.32763 -8.415972 580.464
## 139043 -37.32736 -8.415972 580.274
## 139044 -37.32708 -8.415972 580.215
## 139045 -37.32680 -8.415972 580.541
## 139046 -37.32652 -8.415972 581.132
## 139047 -37.32625 -8.415972 581.698
## 139048 -37.32597 -8.415972 582.298
## 139049 -37.32569 -8.415972 582.295
## 139050 -37.32541 -8.415972 582.289
## 139051 -37.32513 -8.415972 581.985
## 139052 -37.32486 -8.415972 582.320
## 139053 -37.32458 -8.415972 582.888
## 139054 -37.32430 -8.415972 583.542
## 139055 -37.32402 -8.415972 584.366
## 139056 -37.32375 -8.415972 584.610
## 139057 -37.32347 -8.415972 584.644
## 139058 -37.32319 -8.415972 584.229
## 139059 -37.32291 -8.415972 583.896
## 139060 -37.32263 -8.415972 583.686
## 139061 -37.32236 -8.415972 584.338
## 139062 -37.32208 -8.415972 585.189
## 139063 -37.32180 -8.415972 585.921
## 139064 -37.32152 -8.415972 585.873
## 139065 -37.32125 -8.415972 585.677
## 139066 -37.32097 -8.415972 585.453
## 139067 -37.32069 -8.415972 585.545
## 139068 -37.32041 -8.415972 585.532
## 139069 -37.32013 -8.415972 585.258
## 139070 -37.31986 -8.415972 584.676
## 139071 -37.31958 -8.415972 584.039
## 139072 -37.31930 -8.415972 583.531
## 139073 -37.31902 -8.415972 583.195
## 139074 -37.31875 -8.415972 583.046
## 139075 -37.31847 -8.415972 583.047
## 139076 -37.31819 -8.415972 583.753
## 139077 -37.31791 -8.415972 584.428
## 139078 -37.31763 -8.415972 585.317
## 139079 -37.31736 -8.415972 585.040
## 139080 -37.31708 -8.415972 584.680
## 139081 -37.31680 -8.415972 583.948
## 139082 -37.31652 -8.415972 583.652
## 139083 -37.31625 -8.415972 583.282
## 139084 -37.31597 -8.415972 582.854
## 139085 -37.31569 -8.415972 582.038
## 139086 -37.31541 -8.415972 581.022
## 139087 -37.31513 -8.415972 579.880
## 139088 -37.31486 -8.415972 578.524
## 139089 -37.31458 -8.415972 576.888
## 139090 -37.31430 -8.415972 575.114
## 139091 -37.31402 -8.415972 573.113
## 139092 -37.31375 -8.415972 571.375
## 139093 -37.31347 -8.415972 570.309
## 139094 -37.31319 -8.415972 569.456
## 139095 -37.31291 -8.415972 568.746
## 139096 -37.31263 -8.415972 568.371
## 139097 -37.31236 -8.415972 568.078
## 139098 -37.31208 -8.415972 567.996
## 139099 -37.31180 -8.415972 568.055
## 139100 -37.31152 -8.415972 568.412
## 139101 -37.31125 -8.415972 569.142
## 139102 -37.31097 -8.415972 569.901
## 139103 -37.31069 -8.415972 570.692
## 139104 -37.31041 -8.415972 571.495
## 139105 -37.31013 -8.415972 572.555
## 139106 -37.30986 -8.415972 573.490
## 139107 -37.30958 -8.415972 574.846
## 139108 -37.30930 -8.415972 576.569
## 139109 -37.30902 -8.415972 579.234
## 139110 -37.30875 -8.415972 581.973
## 139111 -37.30847 -8.415972 584.724
## 139112 -37.30819 -8.415972 586.368
## 139113 -37.30791 -8.415972 587.533
## 139114 -37.30763 -8.415972 588.189
## 139115 -37.30736 -8.415972 588.376
## 139116 -37.30708 -8.415972 588.572
## 139117 -37.30680 -8.415972 588.536
## 139118 -37.30652 -8.415972 589.281
## 139119 -37.30625 -8.415972 590.136
## 139120 -37.30597 -8.415972 591.306
## 139121 -37.30569 -8.415972 592.078
## 139122 -37.30541 -8.415972 592.608
## 139123 -37.30513 -8.415972 593.153
## 139124 -37.30486 -8.415972 593.609
## 139125 -37.30458 -8.415972 593.942
## 139126 -37.30430 -8.415972 594.255
## 139127 -37.30402 -8.415972 594.254
## 139128 -37.30375 -8.415972 594.425
## 139129 -37.30347 -8.415972 594.704
## 139130 -37.30319 -8.415972 594.723
## 139131 -37.30291 -8.415972 594.512
## 139132 -37.30263 -8.415972 593.880
## 139133 -37.30236 -8.415972 592.937
## 139134 -37.30208 -8.415972 591.928
## 139135 -37.30180 -8.415972 590.912
## 139136 -37.30152 -8.415972 590.265
## 139137 -37.30125 -8.415972 589.613
## 139138 -37.30097 -8.415972 589.030
## 139139 -37.30069 -8.415972 587.814
## 139140 -37.30041 -8.415972 586.479
## 139141 -37.30013 -8.415972 585.309
## 139142 -37.29986 -8.415972 584.617
## 139143 -37.29958 -8.415972 584.292
## 139144 -37.29930 -8.415972 584.452
## 139145 -37.29902 -8.415972 584.714
## 139146 -37.29875 -8.415972 584.744
## 139147 -37.29847 -8.415972 584.290
## 139148 -37.29819 -8.415972 583.682
## 139149 -37.29791 -8.415972 582.939
## 139150 -37.29763 -8.415972 582.166
## 139151 -37.29736 -8.415972 581.527
## 139152 -37.29708 -8.415972 580.936
## 139153 -37.29680 -8.415972 580.754
## 139154 -37.29652 -8.415972 580.821
## 139155 -37.29625 -8.415972 580.854
## 139156 -37.29597 -8.415972 581.408
## 139157 -37.29569 -8.415972 581.698
## 139158 -37.29541 -8.415972 581.788
## 139159 -37.29513 -8.415972 581.530
## 139160 -37.29486 -8.415972 580.482
## 139161 -37.29458 -8.415972 579.563
## 139162 -37.29430 -8.415972 578.541
## 139163 -37.29402 -8.415972 578.368
## 139164 -37.29375 -8.415972 578.531
## 139165 -37.29347 -8.415972 579.430
## 139166 -37.29319 -8.415972 580.096
## 139167 -37.29291 -8.415972 580.459
## 139168 -37.29263 -8.415972 580.037
## 139169 -37.29236 -8.415972 578.704
## 139170 -37.29208 -8.415972 577.234
## 139171 -37.29180 -8.415972 575.770
## 139172 -37.29152 -8.415972 575.303
## 139173 -37.29125 -8.415972 574.998
## 139174 -37.29097 -8.415972 575.126
## 139175 -37.29069 -8.415972 574.721
## 139176 -37.29041 -8.415972 574.198
## 139177 -37.29013 -8.415972 573.569
## 139178 -37.28986 -8.415972 572.868
## 139179 -37.28958 -8.415972 572.058
## 139180 -37.28930 -8.415972 571.143
## 139181 -37.28902 -8.415972 569.804
## 139182 -37.28875 -8.415972 568.566
## 139183 -37.28847 -8.415972 567.394
## 139184 -37.28819 -8.415972 567.435
## 139185 -37.28791 -8.415972 567.746
## 139186 -37.28763 -8.415972 567.957
## 139187 -37.28736 -8.415972 567.220
## 139188 -37.28708 -8.415972 566.245
## 139189 -37.28680 -8.415972 565.593
## 139190 -37.28652 -8.415972 564.973
## 139191 -37.28625 -8.415972 564.420
## 139192 -37.28597 -8.415972 563.833
## 139193 -37.28569 -8.415972 564.222
## 139194 -37.28541 -8.415972 564.945
## 139195 -37.28513 -8.415972 565.523
## 139196 -37.28486 -8.415972 565.568
## 139197 -37.28458 -8.415972 565.595
## 139198 -37.28430 -8.415972 565.978
## 139199 -37.28402 -8.415972 566.809
## 139200 -37.28375 -8.415972 567.486
## 139201 -37.28347 -8.415972 568.161
## 139202 -37.28319 -8.415972 568.300
## 139203 -37.28291 -8.415972 568.418
## 139204 -37.28263 -8.415972 568.146
## 139205 -37.28236 -8.415972 567.996
## 139206 -37.28208 -8.415972 567.829
## 139207 -37.28180 -8.415972 567.227
## 139208 -37.28152 -8.415972 566.441
## 139209 -37.28125 -8.415972 565.548
## 139210 -37.28097 -8.415972 565.326
## 139211 -37.28069 -8.415972 564.975
## 139212 -37.28041 -8.415972 564.871
## 139213 -37.28013 -8.415972 565.364
## 139214 -37.27986 -8.415972 566.750
## 139215 -37.27958 -8.415972 568.437
## 139216 -37.27930 -8.415972 569.729
## 139217 -37.27902 -8.415972 570.609
## 139218 -37.27875 -8.415972 571.604
## 139219 -37.27847 -8.415972 572.596
## 139220 -37.27819 -8.415972 573.373
## 139221 -37.27791 -8.415972 573.985
## 139222 -37.27763 -8.415972 574.534
## 139223 -37.27736 -8.415972 574.944
## 139224 -37.27708 -8.415972 575.342
## 139225 -37.27680 -8.415972 575.686
## 139226 -37.27652 -8.415972 576.059
## 139227 -37.27625 -8.415972 576.381
## 139228 -37.27597 -8.415972 576.987
## 139229 -37.27569 -8.415972 577.466
## 139230 -37.27541 -8.415972 577.953
## 139231 -37.27513 -8.415972 578.209
## 139232 -37.27486 -8.415972 578.418
## 139233 -37.27458 -8.415972 578.604
## 139234 -37.27430 -8.415972 578.451
## 139235 -37.27402 -8.415972 577.710
## 139236 -37.27375 -8.415972 576.832
## [ reached 'max' / getOption("max.print") -- omitted 630149 rows ]
O primeiro passo na transformação dos dados foi recortar a área de
interesse. O raster carregado não estava com a área desejada. Para isso,
utilizando a função mask()
, e em seguida a função
crop()
, ambas para o shapefile do Parque Nacional do
Catimbau, foi delimitada a área de interesse. O próximo passo foi
transformar o raster em um dataframe. Para isso, foi usada a função
as.data.frame()
, com o comando xy=TRUE
, para
indicar que a longitude iria para a variável x
, a latitude
para a variável y
e seria cria uma nova variável para os
dados correspondentes aos valores de altitude. Em seguida, apenas a
variável com os dados de altitude foi renomeada, com a função
colnames()
.
ggplot()+
geom_raster(data=topo_catimbau_df,aes(x,y,fill=altitude))+
labs(x=NULL,
y=NULL,
fill="altitude (m)")+
tema
Tendo agora o dataframe, é possível criar o mapa raster. Cotude, vale a pena a se atentar a um detalhe importante: arquivos raster são compostos de pixels, o que os tornam imagens, então uma resolução maiore irá exigir pixels menores e uma quantidade maior deles, o que torna o arquivo, muitas vezes, exponencialmente maior. Isso tudo consome informação e memória, não só do R, mas do próprio dispositivo. Então, ao escolher a resolução do arquivo raster, sempre é importante avaliar se vale a pena uma resolução alta ou se pode diminuir, sem perder informação e qualidade.
Mais ainda, é possível alterar a paleta de cor do gradiente.
ggplot()+
geom_raster(data=topo_catimbau_df,aes(x,y,fill=altitude))+
labs(x=NULL,
y=NULL,
fill="altitude (m)")+
scale_fill_viridis_c()+
tema
O grupo de paletas viridis
estão entre as mais
utilizadas no R. É possível escolher qual tipo de paleta do grupo é
desejado, através do comando option=
.
ggplot()+
geom_raster(data=topo_catimbau_df,aes(x,y,fill=altitude))+
labs(x=NULL,
y=NULL,
fill="altitude (m)")+
scale_fill_viridis_c(option="rocket")+
tema
ggplot()+
geom_raster(data=topo_catimbau_df,aes(x,y,fill=altitude))+
labs(x=NULL,
y=NULL,
fill="altitude (m)")+
scale_fill_viridis_c(option="inferno")+
tema
ggplot()+
geom_raster(data=topo_catimbau_df,aes(x,y,fill=altitude))+
labs(x=NULL,
y=NULL,
fill="altitude (m)")+
scale_fill_viridis_c(option="cividis")+
tema
ggplot()+
geom_raster(data=topo_catimbau_df,aes(x,y,fill=altitude))+
labs(x=NULL,
y=NULL,
fill="altitude (m)")+
scale_fill_viridis_c(option="mako")+
tema
ggplot()+
geom_raster(data=topo_catimbau_df,aes(x,y,fill=altitude))+
labs(x=NULL,
y=NULL,
fill="altitude (m)")+
scale_fill_viridis_c(option="turbo")+
tema
O mapa, em termos técnicos, está pronto. Contudo, há também como combinar um arquivo raster e um arquivo shapefile.
ggplot()+
geom_sf(data=subset(Estados,name_region=="Nordeste"),color="black",fill="gray")+
geom_sf(data=subset(Estados,name_state=="Pernambuco"),color="black",fill="yellow")+
geom_raster(data=topo_catimbau_df,aes(x,y,fill=altitude))+
geom_sf(data=Catimbau,color="black",fill=NA,linewidth=0.8)+
labs(x=NULL,
y=NULL,
fill="altitude (m)")+
scale_fill_viridis_c(option="turbo")+
coord_sf(xlim=c(-41.15,-34.5),ylim=c(-9.5,-7.25))+
annotation_scale(location="br",height = unit(0.3,"cm"))+
annotation_north_arrow(style = north_arrow_nautical, location="tr",height = unit(1.85,"cm"),width = unit(1.85,"cm"))+
tema