Point Patterns: Hypothesis Testing
library(spatstat)
## Loading required package: mgcv
## This is mgcv 1.7-22. For overview type 'help("mgcv-package")'.
## Loading required package: deldir
## deldir 0.0-21
## spatstat 1.31-1 Type 'help(spatstat)' for an overview of spatstat
## 'latest.news()' for news on latest version 'licence.polygons()' for
## licence information on polygon calculations
This exercise is the second part of the point pattern analysis series.
The most important concept to understand in dealing with point patterns is the idea that the observed data are conceptualized as a single realization of an underlying intensity surface. When you flip a coin there is some probability of getting heads. Imagine a landscape filled with magic coins that flip themselves when you say, “flip” and magically land the exact same spot whenever flipped. The coins are evenly spaced 1m apart and fill the land. When you say “flip” a map of heads emerges (also magically) in your computer, the map shows you the locations of the heads but not the tails. Each time you say “flip” there will be a different outcome and a different map. All magic coins are equal so heads are equally likely in all places.
When working with a point pattern we often assume that our data is like a single flipping of the magic coins. That is our data is a single realization from some spatially extensive probability surface. On that surface a positive outcome, or an “event,” is equally likely at all locations. If heads are equally likely in all places than the number of heads we'd expect in any given region is proportion to the area of the region. Two randomly selected regions of the same size should have roughly the same number of heads.
We can ruin the fun of being in this magical land by stating these rules formally. The number of points falling in any region B is a Poisson random variable. For each realization of a Poisson random variable we get a discrete (integer) value. A Poisson distribution is controlled by a single parameter λ, which controls both the mean and variance. The fact that the mean and the variance of a Poisson variable are equal is important to remember, we'll exploit this property of Poisson variables in statistical tests.
## Simulate 10 realizations of a Poisson random variable
for (i in 1:10) {
print(rpois(n = 1, lambda = 5))
}
## [1] 4
## [1] 7
## [1] 4
## [1] 5
## [1] 7
## [1] 3
## [1] 1
## [1] 5
## [1] 9
## [1] 4
Assuming λ does not vary spatially the expected number of points in a region B is simply λ∗area(B). In addition, as long as regions don't overlap the number of points in B1 is completely independent from the number of points in B2. Finally, the location of points within each region is completely random, the location of the first point has no effect of the location of the second point. If all of these rules hold, and they do in the magical example, a point pattern is said to be a uniform Poisson Point Process or sometimes CSR (complete spatial randomness).
In point pattern analysis λ is called intensity and it is typically estimated from data. In the magical world a 10 by 10 meter area would contain 100 coins and roughly 50 heads. The simplest estimate of λ would be the number of heads divided by the area λ=50/100. This estimate assumes that lambda is homogenous, that is, it remains constant within a study area.
If a magical Unicorn (or a Leprechaun) blessed some of the coins so that they were more likely to yield heads our process would no longer be CSR. Places with blessed coins would have more dots on the map. Alternatively, if some of the coins were removed we might expect more heads in areas where coins remained. These two perturbations of our coins might be difficult to distinguish using only a map of heads that result from a single flip.
Simple hypothesis tests with point patterns compare an observed distribution of points (i.e. your data) to simulated distributions of points based on an assumption of CSR. One of the nice things about CSR is that its fairly easy so simulate. With one line of R code we can simulate the land of magical coins (minus the Unicorn and the Leprechaun):
library(spatstat)
magicLand <- rpoispp(lambda = 0.5, win = owin(c(0, 10), c(0, 10)))
plot(magicLand)
# Note: One departure from the scenario is that with rpoispp() possible
# locations are not fixed.
The corny scenario has served its purpose and we can leave it behind, if you run the line below multiple times you should get a different map each time. Each of the maps will be a single realization of complete spatial randomness (CSR).
plot(rpoispp(lambda = 0.5, win = owin(c(0, 10), c(0, 10))))
One last thing, note that the intensity does not exactly equal .5:
# window area and number of points
summary(magicLand)
## Planar point pattern: 46 points
## Average intensity 0.46 points per square unit
##
## Coordinates are given to 7 decimal places
##
## Window: rectangle = [0, 10] x [0, 10] units
## Window area = 100 square units
# your number of points might be slightly different.
magicLand$n/100 #this is the intensity of the simulated map
## [1] 0.46
Conceptually, simple hypothesis testing for point patterns involves comparisons of observed patterns (data) to many simulated realizations of CSR. One of the cool things about this approach is that its possible to think of many different point generating processes, we can use the same simulation framework to compare our data to any number of hypothetical point generating processes. THe methods used to test CSR are generalizable to non-uniform maps of λ.
The most basic hypothesis test for point patterns is called the Quadrat Test. The study region is divided into n×n grid. For each of the m cells in the n×n grid the number of observed points is counted and the mean of each quadrat is calculated. For each of the m quadrats the variance is calculated s2=∑(xi−xˉ)2 where xi is the sum of the points in quadrat i. If the data are generated by a Poisson distribution the variance to mean ratio (VMR), s2xˉ, should equal 1 (because the mean and the variance should both be λ). The VMR follows a χ2 distribution with m−1 degrees of freedom. This VMR approach works when m>6 and (ˉx)>1. Spatstst uses a slightly different procedure for the quadrat test. Then a χ2 test is preformed which is simply:
χ2=∑1m(observed−expected)2expected If there are m quadrats the results can be evaluated using a χ2 distribution with m−1 degrees of freedom. The function quadrat.tests does most of the work for us:
# create a random map in a 10 by 10 window
ranMap <- rpoispp(lambda = 10, win = owin(c(0, 10), c(0, 10)))
# divide the window into six quadrants calculate chi-square
qTest <- quadrat.test(ranMap, nx = 3, ny = 3)
# visualize the result which shows observed count, expected count and SD.
plot(qTest)
Because the map was randomly generated using CSR the quadrat test should return a high p-value, indicating that the data is not significantly different from CSR:
qTest
##
## Chi-squared test of CSR using quadrat counts
##
## data: ranMap
## X-squared = 6.018, df = 8, p-value = 0.7095
## alternative hypothesis: two.sided
##
## Quadrats: 3 by 3 grid of tiles
We could repeat this test with real data. The data set bei includes data on several thousand Beilschmiedia tree locations in a tropical study site. In this data the location of points is clearly non-random. Thus we hope a quadrat test on bei would reject the null hypothesis of CSR.
data(bei) #see ?bei for details
plot.ppp(bei)
qTest <- quadrat.test(bei, nx = 10, ny = 4)
qTest
##
## Chi-squared test of CSR using quadrat counts
##
## data: bei
## X-squared = 2388, df = 39, p-value < 2.2e-16
## alternative hypothesis: two.sided
##
## Quadrats: 10 by 4 grid of tiles
It works! The small p-value suggests the this data set was not generated under CSR.
The bei data set also includes data for elevation and slope. Visually, its hard to tell if either of these variables explain the distribution of trees:
# extract raster images
bei.elev <- bei.extra$elev
bei.slope <- bei.extra$grad
# plot raster images
plot(bei.slope)
plot(bei, add = T, pch = 16, cex = 0.2)
Distance Tests
Complete spatial randomness suggests that the number of points is proportional to the area of a sub region; this property of CSR explicitly tested by the quadrant test. However, CSR also suggests that the locations of points are independent from each other. Two important violations of independence are:
Clustering: Points are clumped. Points are closer together than expected under CSR. In the generating process points “attract” each other. For example, if the trees in bei have seeds that are not very mobile there is reason to suspect that trees would cluster. Dispersion: Points are farther apart than expected. This can happen when, in the generating process, points repel each other. There are a variety of statistical tests which examine inter-point distances. Two commonly used tests are the nearest neighbor distance test (sometimes called the G-function) and the reduced second moment measure (usually called the K-function).
The G-function is the cumulative distribution of points as a function of the distance between each point and its nearest neighbor. For example, a G-function would tell us that 100% of points have a neighbor within 100m, 80% have a neighbor within 90m, 50% have a neighbor within 30m and so on. If we plotted the G-function the left would start at zero and the right would end at 1. The G-function for bei is:
plot(Gest(bei))
## lty col key label meaning
## km 1 1 km hat(G)[km](r) Kaplan-Meier estimate of G(r)
## rs 2 2 rs hat(G)[bord](r) border corrected estimate of G(r)
## han 3 3 han hat(G)[han](r) Hanisch estimate of G(r)
## theo 4 4 theo G[pois](r) theoretical Poisson G(r)
In the above figure the blue line is what one would expect from CSR and the other line(s) is what we observe in the bei data. This plot indicates clustering, a greater proportion of trees have nearest neighbors at each distance than expected under CSR.
The weakness of the G-function is that it only looks at nearest neighbors. The K-function is a “second order” test in that it looks at the spatial dependence among points. The phrase “second order properties” is synonymous with “spatial dependence.”
If we have two locations si and sj separated by a distance h we can denotes the strength of their spatial dependence, or second order intensity as γ(si,sj). A point process is said to be stationary if γ(si,sj) depends only upon the distance h between the two points. In a stationary process the actual locations of si and sj are irrelevant, their spatial interaction is purely a function of the separation distance. Complete spatial randomness implies a constant intensity and hence stationarity.
The K-function calculates the expected number of events within h units of a randomly selected point, λK(h)=E(number of events within a distance h of an arbitrary event).
The is K-function evaluated using simulation. A function called envelope() will do most of the heavy lifting, including:
Calculating the K-function for our data. Simulating CSR and calculating the k-function for each simulated pattern.
bei.k <- envelope(bei, Kest, nsim = 99, correction = "border")
## Generating 99 simulations of CSR ...
## 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15,
## 16, 17, 18, 19, 20, 21, 22, 23, 24, 25, 26, 27, 28, 29, 30,
## 31, 32, 33, 34, 35, 36, 37, 38, 39, 40, 41, 42, 43, 44, 45,
## 46, 47, 48, 49, 50, 51, 52, 53, 54, 55, 56, 57, 58, 59, 60,
## 61, 62, 63, 64, 65, 66, 67, 68, 69, 70, 71, 72, 73, 74, 75,
## 76, 77, 78, 79, 80, 81, 82, 83, 84, 85, 86, 87, 88, 89, 90,
## 91, 92, 93, 94, 95, 96, 97, 98, 99.
##
## Done.
plot(bei.k)
## lty col key label
## obs 1 1 obs K[obs](r)
## theo 2 2 theo K[theo](r)
## hi 1 8 hi K[hi](r)
## lo 1 8 lo K[lo](r)
## meaning
## obs observed value of K(r) for data pattern
## theo theoretical value of K(r) for CSR
## hi upper pointwise envelope of K(r) from simulations
## lo lower pointwise envelope of K(r) from simulations
This plot shows the range of values obtained via simulation as a grey envelope. The observed k-function is much higher than the values obtained via simulation of CSR. This implies clustering, at all distances there are more points near each point than expected under CSR.
A black line inside of the grey envelope implies no significant difference from CSR. One cool thing about the K-function is that results can be scale specific, as scale varies a point pattern can contain no pattern, clustering, or dispersion. A map can be clustered at some scales but dispersed at others.
Another important thing to remember is that in the above simulation the envelope represents a homogeneous Poisson process. However, most interesting questions involve point pattern where CSR is not realistic, we need some new methods…
If events are not equally likely at all points within the window the process under investigation is said to be Inhomogeneous. In a homogeneous process λ is constant at all location within the window, in an inhomogenous process λ varies spatially.
Spatstat allows the use of images to estimate lambda. In the Beilschmiedia data perhaps the intensity of trees at a given location is shaped by slope and elevation.
It is possible to use the raster images of slope and elevation to create a point process model (ppm) which allows the simulation of points based on a raster images (or collections of raster images). The ppm() function uses the input images to estimate a spatially varying λ.
ppm.bei <- ppm(bei, ~sl + el, covariates = list(sl = bei.slope, el = bei.elev))
We can use the point process model to generate points:
point.sim <- simulate(ppm.bei, 1)
plot(point.sim)
We can view the predicted intensity at each location in the window:
plot(predict.ppm(ppm.bei, type = "lambda"), main = "Predicted Intensity (lambda)") #predicted intensity
Finally, we can use envelope to see if our observed data is a possible a realization from the model of lambda displayed above.
bei.k <- envelope(ppm.bei, Kest, nsim = 99, correction = "border", verbose = F)
plot(bei.k)
## lty col key label
## obs 1 1 obs K[obs](r)
## mmean 2 2 mmean bar(K)(r)
## hi 1 8 hi K[hi](r)
## lo 1 8 lo K[lo](r)
## meaning
## obs observed value of K(r) for data pattern
## mmean sample mean of K(r) from simulations
## hi upper pointwise envelope of K(r) from simulations
## lo lower pointwise envelope of K(r) from simulations
The results show significant clustering up to about 110m. Then the observed k-function enters the grey envelope. This means that at some scales the observed data is a plausible realization of the inhomogeneous intensity surface we created but at scales less than 100m it is too clustered. This simulation can be viewed as a (failed) attempt to explain the observed distribution of trees in the bei data.
Multitype Point Patterns
Another interesting type of test can be done with marked points, where each mark represents a different type of event/object. For example, the Wiki Leaks data contained different types of events that resulted in fatalities. The lansing data set describes the location of six different species of trees. We might want to examine the distribution of species of type a relative to the location of species type b.
data(lansing)
plot(split(lansing))
The “cross-K” function returns the number of points of type b within h units of a type a point. For example, we might want to know if maple trees are clustered (or dispersed) around black oak trees. We can do all of the pairwise comparisons using the alltypes function.
at <- alltypes(lansing, "Kcross", envelope = T) #this takes awhile
plot(at)
These results are interesting. Look at the first column, black oak trees. Reading down the column we see:
Black oak trees are clustered in the study area (upper left plot) Hickory trees are clustered near black oak trees Maple trees are dispersed (repulsed) from black oak trees Miscellaneous trees are also dispersed from black oaks In general, red oaks are neither clustered or dispersed from black oak trees. At large scales red oaks seem to be dispersed (the black line leaves the grey envelope). White oak trees are neither clustered or dispersed relative to black oaks. The black line stays entirely within the grey envelope. We might also want to look at the difference between two K-functions. If red oak and white oak had similar spatial distributions the difference between a K-function for red oak and a K-function for white oak should be zero at all scales. Departures from zero would indicate that one is more or less clustered than the other at that scale. I am not aware of an easy way to assess significance, other than writing your own simulation (which might be fun side project for the lab?).
Kred <- Kest(lansing[lansing$marks == "redoak", ], correction = "best")
Kwhite <- Kest(lansing[lansing$marks == "whiteoak", ], correction = "best")
plot(Kred$iso - Kwhite$iso, type = "o", ylim = c(-0.01, 0.02))
A final test is the Kdot() test, which examines one species relative to all other species. It can be run for a multi-type point pattern like lansing in the same manner as the K-cross function.
at <- alltypes(lansing, "Kdot", envelope = T)
plot(at)
These results are not interesting, it seems than none of the species has any significant pattern when compared to all other species.
Local K-Functions
The K-function can also be computed for each point in the window (its a computationally intensive process). That is, for each point how many other points are around it as a function of distance. This technique was developed by Getis and Franklin (1987) as an exploratory method to show how spatial structure changes as a function of scale.
lK <- localK(bei, verbose = F) #takes a long time!!!!
plot(lK, main = "local K functions for bei", legend = FALSE) #scale seems odd
## lty col key label
## theo 1 1 theo K[loc][","][pois](r)
## iso3604 2 2 iso3604 K[loc][","][3604](r)
## iso3603 3 3 iso3603 K[loc][","][3603](r)
## iso3602 4 4 iso3602 K[loc][","][3602](r)
## iso3601 5 5 iso3601 K[loc][","][3601](r)
## iso3600 6 6 iso3600 K[loc][","][3600](r)
## iso3599 7 7 iso3599 K[loc][","][3599](r)
## iso3598 8 8 iso3598 K[loc][","][3598](r)
## iso3597 9 9 iso3597 K[loc][","][3597](r)
## iso3596 10 10 iso3596 K[loc][","][3596](r)
## iso3595 11 11 iso3595 K[loc][","][3595](r)
## iso3594 12 12 iso3594 K[loc][","][3594](r)
## iso3593 13 13 iso3593 K[loc][","][3593](r)
## iso3592 14 14 iso3592 K[loc][","][3592](r)
## iso3591 15 15 iso3591 K[loc][","][3591](r)
## iso3590 16 16 iso3590 K[loc][","][3590](r)
## iso3589 17 17 iso3589 K[loc][","][3589](r)
## iso3588 18 18 iso3588 K[loc][","][3588](r)
## iso3587 19 19 iso3587 K[loc][","][3587](r)
## iso3586 20 20 iso3586 K[loc][","][3586](r)
## iso3585 21 21 iso3585 K[loc][","][3585](r)
## iso3584 22 22 iso3584 K[loc][","][3584](r)
## iso3583 23 23 iso3583 K[loc][","][3583](r)
## iso3582 24 24 iso3582 K[loc][","][3582](r)
## iso3581 25 25 iso3581 K[loc][","][3581](r)
## iso3580 26 26 iso3580 K[loc][","][3580](r)
## iso3579 27 27 iso3579 K[loc][","][3579](r)
## iso3578 28 28 iso3578 K[loc][","][3578](r)
## iso3577 29 29 iso3577 K[loc][","][3577](r)
## iso3576 30 30 iso3576 K[loc][","][3576](r)
## iso3575 31 31 iso3575 K[loc][","][3575](r)
## iso3574 32 32 iso3574 K[loc][","][3574](r)
## iso3573 33 33 iso3573 K[loc][","][3573](r)
## iso3572 34 34 iso3572 K[loc][","][3572](r)
## iso3571 35 35 iso3571 K[loc][","][3571](r)
## iso3570 36 36 iso3570 K[loc][","][3570](r)
## iso3569 37 37 iso3569 K[loc][","][3569](r)
## iso3568 38 38 iso3568 K[loc][","][3568](r)
## iso3567 39 39 iso3567 K[loc][","][3567](r)
## iso3566 40 40 iso3566 K[loc][","][3566](r)
## iso3565 41 41 iso3565 K[loc][","][3565](r)
## iso3564 42 42 iso3564 K[loc][","][3564](r)
## iso3563 43 43 iso3563 K[loc][","][3563](r)
## iso3562 44 44 iso3562 K[loc][","][3562](r)
## iso3561 45 45 iso3561 K[loc][","][3561](r)
## iso3560 46 46 iso3560 K[loc][","][3560](r)
## iso3559 47 47 iso3559 K[loc][","][3559](r)
## iso3558 48 48 iso3558 K[loc][","][3558](r)
## iso3557 49 49 iso3557 K[loc][","][3557](r)
## iso3556 50 50 iso3556 K[loc][","][3556](r)
## iso3555 51 51 iso3555 K[loc][","][3555](r)
## iso3554 52 52 iso3554 K[loc][","][3554](r)
## iso3553 53 53 iso3553 K[loc][","][3553](r)
## iso3552 54 54 iso3552 K[loc][","][3552](r)
## iso3551 55 55 iso3551 K[loc][","][3551](r)
## iso3550 56 56 iso3550 K[loc][","][3550](r)
## iso3549 57 57 iso3549 K[loc][","][3549](r)
## iso3548 58 58 iso3548 K[loc][","][3548](r)
## iso3547 59 59 iso3547 K[loc][","][3547](r)
## iso3546 60 60 iso3546 K[loc][","][3546](r)
## iso3545 61 61 iso3545 K[loc][","][3545](r)
## iso3544 62 62 iso3544 K[loc][","][3544](r)
## iso3543 63 63 iso3543 K[loc][","][3543](r)
## iso3542 64 64 iso3542 K[loc][","][3542](r)
## iso3541 65 65 iso3541 K[loc][","][3541](r)
## iso3540 66 66 iso3540 K[loc][","][3540](r)
## iso3539 67 67 iso3539 K[loc][","][3539](r)
## iso3538 68 68 iso3538 K[loc][","][3538](r)
## iso3537 69 69 iso3537 K[loc][","][3537](r)
## iso3536 70 70 iso3536 K[loc][","][3536](r)
## iso3535 71 71 iso3535 K[loc][","][3535](r)
## iso3534 72 72 iso3534 K[loc][","][3534](r)
## iso3533 73 73 iso3533 K[loc][","][3533](r)
## iso3532 74 74 iso3532 K[loc][","][3532](r)
## iso3531 75 75 iso3531 K[loc][","][3531](r)
## iso3530 76 76 iso3530 K[loc][","][3530](r)
## iso3529 77 77 iso3529 K[loc][","][3529](r)
## iso3528 78 78 iso3528 K[loc][","][3528](r)
## iso3527 79 79 iso3527 K[loc][","][3527](r)
## iso3526 80 80 iso3526 K[loc][","][3526](r)
## iso3525 81 81 iso3525 K[loc][","][3525](r)
## iso3524 82 82 iso3524 K[loc][","][3524](r)
## iso3523 83 83 iso3523 K[loc][","][3523](r)
## iso3522 84 84 iso3522 K[loc][","][3522](r)
## iso3521 85 85 iso3521 K[loc][","][3521](r)
## iso3520 86 86 iso3520 K[loc][","][3520](r)
## iso3519 87 87 iso3519 K[loc][","][3519](r)
## iso3518 88 88 iso3518 K[loc][","][3518](r)
## iso3517 89 89 iso3517 K[loc][","][3517](r)
## iso3516 90 90 iso3516 K[loc][","][3516](r)
## iso3515 91 91 iso3515 K[loc][","][3515](r)
## iso3514 92 92 iso3514 K[loc][","][3514](r)
## iso3513 93 93 iso3513 K[loc][","][3513](r)
## iso3512 94 94 iso3512 K[loc][","][3512](r)
## iso3511 95 95 iso3511 K[loc][","][3511](r)
## iso3510 96 96 iso3510 K[loc][","][3510](r)
## iso3509 97 97 iso3509 K[loc][","][3509](r)
## iso3508 98 98 iso3508 K[loc][","][3508](r)
## iso3507 99 99 iso3507 K[loc][","][3507](r)
## iso3506 100 100 iso3506 K[loc][","][3506](r)
## iso3505 101 101 iso3505 K[loc][","][3505](r)
## iso3504 102 102 iso3504 K[loc][","][3504](r)
## iso3503 103 103 iso3503 K[loc][","][3503](r)
## iso3502 104 104 iso3502 K[loc][","][3502](r)
## iso3501 105 105 iso3501 K[loc][","][3501](r)
## iso3500 106 106 iso3500 K[loc][","][3500](r)
## iso3499 107 107 iso3499 K[loc][","][3499](r)
## iso3498 108 108 iso3498 K[loc][","][3498](r)
## iso3497 109 109 iso3497 K[loc][","][3497](r)
## iso3496 110 110 iso3496 K[loc][","][3496](r)
## iso3495 111 111 iso3495 K[loc][","][3495](r)
## iso3494 112 112 iso3494 K[loc][","][3494](r)
## iso3493 113 113 iso3493 K[loc][","][3493](r)
## iso3492 114 114 iso3492 K[loc][","][3492](r)
## iso3491 115 115 iso3491 K[loc][","][3491](r)
## iso3490 116 116 iso3490 K[loc][","][3490](r)
## iso3489 117 117 iso3489 K[loc][","][3489](r)
## iso3488 118 118 iso3488 K[loc][","][3488](r)
## iso3487 119 119 iso3487 K[loc][","][3487](r)
## iso3486 120 120 iso3486 K[loc][","][3486](r)
## iso3485 121 121 iso3485 K[loc][","][3485](r)
## iso3484 122 122 iso3484 K[loc][","][3484](r)
## iso3483 123 123 iso3483 K[loc][","][3483](r)
## iso3482 124 124 iso3482 K[loc][","][3482](r)
## iso3481 125 125 iso3481 K[loc][","][3481](r)
## iso3480 126 126 iso3480 K[loc][","][3480](r)
## iso3479 127 127 iso3479 K[loc][","][3479](r)
## iso3478 128 128 iso3478 K[loc][","][3478](r)
## iso3477 129 129 iso3477 K[loc][","][3477](r)
## iso3476 130 130 iso3476 K[loc][","][3476](r)
## iso3475 131 131 iso3475 K[loc][","][3475](r)
## iso3474 132 132 iso3474 K[loc][","][3474](r)
## iso3473 133 133 iso3473 K[loc][","][3473](r)
## iso3472 134 134 iso3472 K[loc][","][3472](r)
## iso3471 135 135 iso3471 K[loc][","][3471](r)
## iso3470 136 136 iso3470 K[loc][","][3470](r)
## iso3469 137 137 iso3469 K[loc][","][3469](r)
## iso3468 138 138 iso3468 K[loc][","][3468](r)
## iso3467 139 139 iso3467 K[loc][","][3467](r)
## iso3466 140 140 iso3466 K[loc][","][3466](r)
## iso3465 141 141 iso3465 K[loc][","][3465](r)
## iso3464 142 142 iso3464 K[loc][","][3464](r)
## iso3463 143 143 iso3463 K[loc][","][3463](r)
## iso3462 144 144 iso3462 K[loc][","][3462](r)
## iso3461 145 145 iso3461 K[loc][","][3461](r)
## iso3460 146 146 iso3460 K[loc][","][3460](r)
## iso3459 147 147 iso3459 K[loc][","][3459](r)
## iso3458 148 148 iso3458 K[loc][","][3458](r)
## iso3457 149 149 iso3457 K[loc][","][3457](r)
## iso3456 150 150 iso3456 K[loc][","][3456](r)
## iso3455 151 151 iso3455 K[loc][","][3455](r)
## iso3454 152 152 iso3454 K[loc][","][3454](r)
## iso3453 153 153 iso3453 K[loc][","][3453](r)
## iso3452 154 154 iso3452 K[loc][","][3452](r)
## iso3451 155 155 iso3451 K[loc][","][3451](r)
## iso3450 156 156 iso3450 K[loc][","][3450](r)
## iso3449 157 157 iso3449 K[loc][","][3449](r)
## iso3448 158 158 iso3448 K[loc][","][3448](r)
## iso3447 159 159 iso3447 K[loc][","][3447](r)
## iso3446 160 160 iso3446 K[loc][","][3446](r)
## iso3445 161 161 iso3445 K[loc][","][3445](r)
## iso3444 162 162 iso3444 K[loc][","][3444](r)
## iso3443 163 163 iso3443 K[loc][","][3443](r)
## iso3442 164 164 iso3442 K[loc][","][3442](r)
## iso3441 165 165 iso3441 K[loc][","][3441](r)
## iso3440 166 166 iso3440 K[loc][","][3440](r)
## iso3439 167 167 iso3439 K[loc][","][3439](r)
## iso3438 168 168 iso3438 K[loc][","][3438](r)
## iso3437 169 169 iso3437 K[loc][","][3437](r)
## iso3436 170 170 iso3436 K[loc][","][3436](r)
## iso3435 171 171 iso3435 K[loc][","][3435](r)
## iso3434 172 172 iso3434 K[loc][","][3434](r)
## iso3433 173 173 iso3433 K[loc][","][3433](r)
## iso3432 174 174 iso3432 K[loc][","][3432](r)
## iso3431 175 175 iso3431 K[loc][","][3431](r)
## iso3430 176 176 iso3430 K[loc][","][3430](r)
## iso3429 177 177 iso3429 K[loc][","][3429](r)
## iso3428 178 178 iso3428 K[loc][","][3428](r)
## iso3427 179 179 iso3427 K[loc][","][3427](r)
## iso3426 180 180 iso3426 K[loc][","][3426](r)
## iso3425 181 181 iso3425 K[loc][","][3425](r)
## iso3424 182 182 iso3424 K[loc][","][3424](r)
## iso3423 183 183 iso3423 K[loc][","][3423](r)
## iso3422 184 184 iso3422 K[loc][","][3422](r)
## iso3421 185 185 iso3421 K[loc][","][3421](r)
## iso3420 186 186 iso3420 K[loc][","][3420](r)
## iso3419 187 187 iso3419 K[loc][","][3419](r)
## iso3418 188 188 iso3418 K[loc][","][3418](r)
## iso3417 189 189 iso3417 K[loc][","][3417](r)
## iso3416 190 190 iso3416 K[loc][","][3416](r)
## iso3415 191 191 iso3415 K[loc][","][3415](r)
## iso3414 192 192 iso3414 K[loc][","][3414](r)
## iso3413 193 193 iso3413 K[loc][","][3413](r)
## iso3412 194 194 iso3412 K[loc][","][3412](r)
## iso3411 195 195 iso3411 K[loc][","][3411](r)
## iso3410 196 196 iso3410 K[loc][","][3410](r)
## iso3409 197 197 iso3409 K[loc][","][3409](r)
## iso3408 198 198 iso3408 K[loc][","][3408](r)
## iso3407 199 199 iso3407 K[loc][","][3407](r)
## iso3406 200 200 iso3406 K[loc][","][3406](r)
## iso3405 201 201 iso3405 K[loc][","][3405](r)
## iso3404 202 202 iso3404 K[loc][","][3404](r)
## iso3403 203 203 iso3403 K[loc][","][3403](r)
## iso3402 204 204 iso3402 K[loc][","][3402](r)
## iso3401 205 205 iso3401 K[loc][","][3401](r)
## iso3400 206 206 iso3400 K[loc][","][3400](r)
## iso3399 207 207 iso3399 K[loc][","][3399](r)
## iso3398 208 208 iso3398 K[loc][","][3398](r)
## iso3397 209 209 iso3397 K[loc][","][3397](r)
## iso3396 210 210 iso3396 K[loc][","][3396](r)
## iso3395 211 211 iso3395 K[loc][","][3395](r)
## iso3394 212 212 iso3394 K[loc][","][3394](r)
## iso3393 213 213 iso3393 K[loc][","][3393](r)
## iso3392 214 214 iso3392 K[loc][","][3392](r)
## iso3391 215 215 iso3391 K[loc][","][3391](r)
## iso3390 216 216 iso3390 K[loc][","][3390](r)
## iso3389 217 217 iso3389 K[loc][","][3389](r)
## iso3388 218 218 iso3388 K[loc][","][3388](r)
## iso3387 219 219 iso3387 K[loc][","][3387](r)
## iso3386 220 220 iso3386 K[loc][","][3386](r)
## iso3385 221 221 iso3385 K[loc][","][3385](r)
## iso3384 222 222 iso3384 K[loc][","][3384](r)
## iso3383 223 223 iso3383 K[loc][","][3383](r)
## iso3382 224 224 iso3382 K[loc][","][3382](r)
## iso3381 225 225 iso3381 K[loc][","][3381](r)
## iso3380 226 226 iso3380 K[loc][","][3380](r)
## iso3379 227 227 iso3379 K[loc][","][3379](r)
## iso3378 228 228 iso3378 K[loc][","][3378](r)
## iso3377 229 229 iso3377 K[loc][","][3377](r)
## iso3376 230 230 iso3376 K[loc][","][3376](r)
## iso3375 231 231 iso3375 K[loc][","][3375](r)
## iso3374 232 232 iso3374 K[loc][","][3374](r)
## iso3373 233 233 iso3373 K[loc][","][3373](r)
## iso3372 234 234 iso3372 K[loc][","][3372](r)
## iso3371 235 235 iso3371 K[loc][","][3371](r)
## iso3370 236 236 iso3370 K[loc][","][3370](r)
## iso3369 237 237 iso3369 K[loc][","][3369](r)
## iso3368 238 238 iso3368 K[loc][","][3368](r)
## iso3367 239 239 iso3367 K[loc][","][3367](r)
## iso3366 240 240 iso3366 K[loc][","][3366](r)
## iso3365 241 241 iso3365 K[loc][","][3365](r)
## iso3364 242 242 iso3364 K[loc][","][3364](r)
## iso3363 243 243 iso3363 K[loc][","][3363](r)
## iso3362 244 244 iso3362 K[loc][","][3362](r)
## iso3361 245 245 iso3361 K[loc][","][3361](r)
## iso3360 246 246 iso3360 K[loc][","][3360](r)
## iso3359 247 247 iso3359 K[loc][","][3359](r)
## iso3358 248 248 iso3358 K[loc][","][3358](r)
## iso3357 249 249 iso3357 K[loc][","][3357](r)
## iso3356 250 250 iso3356 K[loc][","][3356](r)
## iso3355 251 251 iso3355 K[loc][","][3355](r)
## iso3354 252 252 iso3354 K[loc][","][3354](r)
## iso3353 253 253 iso3353 K[loc][","][3353](r)
## iso3352 254 254 iso3352 K[loc][","][3352](r)
## iso3351 255 255 iso3351 K[loc][","][3351](r)
## iso3350 256 256 iso3350 K[loc][","][3350](r)
## iso3349 257 257 iso3349 K[loc][","][3349](r)
## iso3348 258 258 iso3348 K[loc][","][3348](r)
## iso3347 259 259 iso3347 K[loc][","][3347](r)
## iso3346 260 260 iso3346 K[loc][","][3346](r)
## iso3345 261 261 iso3345 K[loc][","][3345](r)
## iso3344 262 262 iso3344 K[loc][","][3344](r)
## iso3343 263 263 iso3343 K[loc][","][3343](r)
## iso3342 264 264 iso3342 K[loc][","][3342](r)
## iso3341 265 265 iso3341 K[loc][","][3341](r)
## iso3340 266 266 iso3340 K[loc][","][3340](r)
## iso3339 267 267 iso3339 K[loc][","][3339](r)
## iso3338 268 268 iso3338 K[loc][","][3338](r)
## iso3337 269 269 iso3337 K[loc][","][3337](r)
## iso3336 270 270 iso3336 K[loc][","][3336](r)
## iso3335 271 271 iso3335 K[loc][","][3335](r)
## iso3334 272 272 iso3334 K[loc][","][3334](r)
## iso3333 273 273 iso3333 K[loc][","][3333](r)
## iso3332 274 274 iso3332 K[loc][","][3332](r)
## iso3331 275 275 iso3331 K[loc][","][3331](r)
## iso3330 276 276 iso3330 K[loc][","][3330](r)
## iso3329 277 277 iso3329 K[loc][","][3329](r)
## iso3328 278 278 iso3328 K[loc][","][3328](r)
## iso3327 279 279 iso3327 K[loc][","][3327](r)
## iso3326 280 280 iso3326 K[loc][","][3326](r)
## iso3325 281 281 iso3325 K[loc][","][3325](r)
## iso3324 282 282 iso3324 K[loc][","][3324](r)
## iso3323 283 283 iso3323 K[loc][","][3323](r)
## iso3322 284 284 iso3322 K[loc][","][3322](r)
## iso3321 285 285 iso3321 K[loc][","][3321](r)
## iso3320 286 286 iso3320 K[loc][","][3320](r)
## iso3319 287 287 iso3319 K[loc][","][3319](r)
## iso3318 288 288 iso3318 K[loc][","][3318](r)
## iso3317 289 289 iso3317 K[loc][","][3317](r)
## iso3316 290 290 iso3316 K[loc][","][3316](r)
## iso3315 291 291 iso3315 K[loc][","][3315](r)
## iso3314 292 292 iso3314 K[loc][","][3314](r)
## iso3313 293 293 iso3313 K[loc][","][3313](r)
## iso3312 294 294 iso3312 K[loc][","][3312](r)
## iso3311 295 295 iso3311 K[loc][","][3311](r)
## iso3310 296 296 iso3310 K[loc][","][3310](r)
## iso3309 297 297 iso3309 K[loc][","][3309](r)
## iso3308 298 298 iso3308 K[loc][","][3308](r)
## iso3307 299 299 iso3307 K[loc][","][3307](r)
## iso3306 300 300 iso3306 K[loc][","][3306](r)
## iso3305 301 301 iso3305 K[loc][","][3305](r)
## iso3304 302 302 iso3304 K[loc][","][3304](r)
## iso3303 303 303 iso3303 K[loc][","][3303](r)
## iso3302 304 304 iso3302 K[loc][","][3302](r)
## iso3301 305 305 iso3301 K[loc][","][3301](r)
## iso3300 306 306 iso3300 K[loc][","][3300](r)
## iso3299 307 307 iso3299 K[loc][","][3299](r)
## iso3298 308 308 iso3298 K[loc][","][3298](r)
## iso3297 309 309 iso3297 K[loc][","][3297](r)
## iso3296 310 310 iso3296 K[loc][","][3296](r)
## iso3295 311 311 iso3295 K[loc][","][3295](r)
## iso3294 312 312 iso3294 K[loc][","][3294](r)
## iso3293 313 313 iso3293 K[loc][","][3293](r)
## iso3292 314 314 iso3292 K[loc][","][3292](r)
## iso3291 315 315 iso3291 K[loc][","][3291](r)
## iso3290 316 316 iso3290 K[loc][","][3290](r)
## iso3289 317 317 iso3289 K[loc][","][3289](r)
## iso3288 318 318 iso3288 K[loc][","][3288](r)
## iso3287 319 319 iso3287 K[loc][","][3287](r)
## iso3286 320 320 iso3286 K[loc][","][3286](r)
## iso3285 321 321 iso3285 K[loc][","][3285](r)
## iso3284 322 322 iso3284 K[loc][","][3284](r)
## iso3283 323 323 iso3283 K[loc][","][3283](r)
## iso3282 324 324 iso3282 K[loc][","][3282](r)
## iso3281 325 325 iso3281 K[loc][","][3281](r)
## iso3280 326 326 iso3280 K[loc][","][3280](r)
## iso3279 327 327 iso3279 K[loc][","][3279](r)
## iso3278 328 328 iso3278 K[loc][","][3278](r)
## iso3277 329 329 iso3277 K[loc][","][3277](r)
## iso3276 330 330 iso3276 K[loc][","][3276](r)
## iso3275 331 331 iso3275 K[loc][","][3275](r)
## iso3274 332 332 iso3274 K[loc][","][3274](r)
## iso3273 333 333 iso3273 K[loc][","][3273](r)
## iso3272 334 334 iso3272 K[loc][","][3272](r)
## iso3271 335 335 iso3271 K[loc][","][3271](r)
## iso3270 336 336 iso3270 K[loc][","][3270](r)
## iso3269 337 337 iso3269 K[loc][","][3269](r)
## iso3268 338 338 iso3268 K[loc][","][3268](r)
## iso3267 339 339 iso3267 K[loc][","][3267](r)
## iso3266 340 340 iso3266 K[loc][","][3266](r)
## iso3265 341 341 iso3265 K[loc][","][3265](r)
## iso3264 342 342 iso3264 K[loc][","][3264](r)
## iso3263 343 343 iso3263 K[loc][","][3263](r)
## iso3262 344 344 iso3262 K[loc][","][3262](r)
## iso3261 345 345 iso3261 K[loc][","][3261](r)
## iso3260 346 346 iso3260 K[loc][","][3260](r)
## iso3259 347 347 iso3259 K[loc][","][3259](r)
## iso3258 348 348 iso3258 K[loc][","][3258](r)
## iso3257 349 349 iso3257 K[loc][","][3257](r)
## iso3256 350 350 iso3256 K[loc][","][3256](r)
## iso3255 351 351 iso3255 K[loc][","][3255](r)
## iso3254 352 352 iso3254 K[loc][","][3254](r)
## iso3253 353 353 iso3253 K[loc][","][3253](r)
## iso3252 354 354 iso3252 K[loc][","][3252](r)
## iso3251 355 355 iso3251 K[loc][","][3251](r)
## iso3250 356 356 iso3250 K[loc][","][3250](r)
## iso3249 357 357 iso3249 K[loc][","][3249](r)
## iso3248 358 358 iso3248 K[loc][","][3248](r)
## iso3247 359 359 iso3247 K[loc][","][3247](r)
## iso3246 360 360 iso3246 K[loc][","][3246](r)
## iso3245 361 361 iso3245 K[loc][","][3245](r)
## iso3244 362 362 iso3244 K[loc][","][3244](r)
## iso3243 363 363 iso3243 K[loc][","][3243](r)
## iso3242 364 364 iso3242 K[loc][","][3242](r)
## iso3241 365 365 iso3241 K[loc][","][3241](r)
## iso3240 366 366 iso3240 K[loc][","][3240](r)
## iso3239 367 367 iso3239 K[loc][","][3239](r)
## iso3238 368 368 iso3238 K[loc][","][3238](r)
## iso3237 369 369 iso3237 K[loc][","][3237](r)
## iso3236 370 370 iso3236 K[loc][","][3236](r)
## iso3235 371 371 iso3235 K[loc][","][3235](r)
## iso3234 372 372 iso3234 K[loc][","][3234](r)
## iso3233 373 373 iso3233 K[loc][","][3233](r)
## iso3232 374 374 iso3232 K[loc][","][3232](r)
## iso3231 375 375 iso3231 K[loc][","][3231](r)
## iso3230 376 376 iso3230 K[loc][","][3230](r)
## iso3229 377 377 iso3229 K[loc][","][3229](r)
## iso3228 378 378 iso3228 K[loc][","][3228](r)
## iso3227 379 379 iso3227 K[loc][","][3227](r)
## iso3226 380 380 iso3226 K[loc][","][3226](r)
## iso3225 381 381 iso3225 K[loc][","][3225](r)
## iso3224 382 382 iso3224 K[loc][","][3224](r)
## iso3223 383 383 iso3223 K[loc][","][3223](r)
## iso3222 384 384 iso3222 K[loc][","][3222](r)
## iso3221 385 385 iso3221 K[loc][","][3221](r)
## iso3220 386 386 iso3220 K[loc][","][3220](r)
## iso3219 387 387 iso3219 K[loc][","][3219](r)
## iso3218 388 388 iso3218 K[loc][","][3218](r)
## iso3217 389 389 iso3217 K[loc][","][3217](r)
## iso3216 390 390 iso3216 K[loc][","][3216](r)
## iso3215 391 391 iso3215 K[loc][","][3215](r)
## iso3214 392 392 iso3214 K[loc][","][3214](r)
## iso3213 393 393 iso3213 K[loc][","][3213](r)
## iso3212 394 394 iso3212 K[loc][","][3212](r)
## iso3211 395 395 iso3211 K[loc][","][3211](r)
## iso3210 396 396 iso3210 K[loc][","][3210](r)
## iso3209 397 397 iso3209 K[loc][","][3209](r)
## iso3208 398 398 iso3208 K[loc][","][3208](r)
## iso3207 399 399 iso3207 K[loc][","][3207](r)
## iso3206 400 400 iso3206 K[loc][","][3206](r)
## iso3205 401 401 iso3205 K[loc][","][3205](r)
## iso3204 402 402 iso3204 K[loc][","][3204](r)
## iso3203 403 403 iso3203 K[loc][","][3203](r)
## iso3202 404 404 iso3202 K[loc][","][3202](r)
## iso3201 405 405 iso3201 K[loc][","][3201](r)
## iso3200 406 406 iso3200 K[loc][","][3200](r)
## iso3199 407 407 iso3199 K[loc][","][3199](r)
## iso3198 408 408 iso3198 K[loc][","][3198](r)
## iso3197 409 409 iso3197 K[loc][","][3197](r)
## iso3196 410 410 iso3196 K[loc][","][3196](r)
## iso3195 411 411 iso3195 K[loc][","][3195](r)
## iso3194 412 412 iso3194 K[loc][","][3194](r)
## iso3193 413 413 iso3193 K[loc][","][3193](r)
## iso3192 414 414 iso3192 K[loc][","][3192](r)
## iso3191 415 415 iso3191 K[loc][","][3191](r)
## iso3190 416 416 iso3190 K[loc][","][3190](r)
## iso3189 417 417 iso3189 K[loc][","][3189](r)
## iso3188 418 418 iso3188 K[loc][","][3188](r)
## iso3187 419 419 iso3187 K[loc][","][3187](r)
## iso3186 420 420 iso3186 K[loc][","][3186](r)
## iso3185 421 421 iso3185 K[loc][","][3185](r)
## iso3184 422 422 iso3184 K[loc][","][3184](r)
## iso3183 423 423 iso3183 K[loc][","][3183](r)
## iso3182 424 424 iso3182 K[loc][","][3182](r)
## iso3181 425 425 iso3181 K[loc][","][3181](r)
## iso3180 426 426 iso3180 K[loc][","][3180](r)
## iso3179 427 427 iso3179 K[loc][","][3179](r)
## iso3178 428 428 iso3178 K[loc][","][3178](r)
## iso3177 429 429 iso3177 K[loc][","][3177](r)
## iso3176 430 430 iso3176 K[loc][","][3176](r)
## iso3175 431 431 iso3175 K[loc][","][3175](r)
## iso3174 432 432 iso3174 K[loc][","][3174](r)
## iso3173 433 433 iso3173 K[loc][","][3173](r)
## iso3172 434 434 iso3172 K[loc][","][3172](r)
## iso3171 435 435 iso3171 K[loc][","][3171](r)
## iso3170 436 436 iso3170 K[loc][","][3170](r)
## iso3169 437 437 iso3169 K[loc][","][3169](r)
## iso3168 438 438 iso3168 K[loc][","][3168](r)
## iso3167 439 439 iso3167 K[loc][","][3167](r)
## iso3166 440 440 iso3166 K[loc][","][3166](r)
## iso3165 441 441 iso3165 K[loc][","][3165](r)
## iso3164 442 442 iso3164 K[loc][","][3164](r)
## iso3163 443 443 iso3163 K[loc][","][3163](r)
## iso3162 444 444 iso3162 K[loc][","][3162](r)
## iso3161 445 445 iso3161 K[loc][","][3161](r)
## iso3160 446 446 iso3160 K[loc][","][3160](r)
## iso3159 447 447 iso3159 K[loc][","][3159](r)
## iso3158 448 448 iso3158 K[loc][","][3158](r)
## iso3157 449 449 iso3157 K[loc][","][3157](r)
## iso3156 450 450 iso3156 K[loc][","][3156](r)
## iso3155 451 451 iso3155 K[loc][","][3155](r)
## iso3154 452 452 iso3154 K[loc][","][3154](r)
## iso3153 453 453 iso3153 K[loc][","][3153](r)
## iso3152 454 454 iso3152 K[loc][","][3152](r)
## iso3151 455 455 iso3151 K[loc][","][3151](r)
## iso3150 456 456 iso3150 K[loc][","][3150](r)
## iso3149 457 457 iso3149 K[loc][","][3149](r)
## iso3148 458 458 iso3148 K[loc][","][3148](r)
## iso3147 459 459 iso3147 K[loc][","][3147](r)
## iso3146 460 460 iso3146 K[loc][","][3146](r)
## iso3145 461 461 iso3145 K[loc][","][3145](r)
## iso3144 462 462 iso3144 K[loc][","][3144](r)
## iso3143 463 463 iso3143 K[loc][","][3143](r)
## iso3142 464 464 iso3142 K[loc][","][3142](r)
## iso3141 465 465 iso3141 K[loc][","][3141](r)
## iso3140 466 466 iso3140 K[loc][","][3140](r)
## iso3139 467 467 iso3139 K[loc][","][3139](r)
## iso3138 468 468 iso3138 K[loc][","][3138](r)
## iso3137 469 469 iso3137 K[loc][","][3137](r)
## iso3136 470 470 iso3136 K[loc][","][3136](r)
## iso3135 471 471 iso3135 K[loc][","][3135](r)
## iso3134 472 472 iso3134 K[loc][","][3134](r)
## iso3133 473 473 iso3133 K[loc][","][3133](r)
## iso3132 474 474 iso3132 K[loc][","][3132](r)
## iso3131 475 475 iso3131 K[loc][","][3131](r)
## iso3130 476 476 iso3130 K[loc][","][3130](r)
## iso3129 477 477 iso3129 K[loc][","][3129](r)
## iso3128 478 478 iso3128 K[loc][","][3128](r)
## iso3127 479 479 iso3127 K[loc][","][3127](r)
## iso3126 480 480 iso3126 K[loc][","][3126](r)
## iso3125 481 481 iso3125 K[loc][","][3125](r)
## iso3124 482 482 iso3124 K[loc][","][3124](r)
## iso3123 483 483 iso3123 K[loc][","][3123](r)
## iso3122 484 484 iso3122 K[loc][","][3122](r)
## iso3121 485 485 iso3121 K[loc][","][3121](r)
## iso3120 486 486 iso3120 K[loc][","][3120](r)
## iso3119 487 487 iso3119 K[loc][","][3119](r)
## iso3118 488 488 iso3118 K[loc][","][3118](r)
## iso3117 489 489 iso3117 K[loc][","][3117](r)
## iso3116 490 490 iso3116 K[loc][","][3116](r)
## iso3115 491 491 iso3115 K[loc][","][3115](r)
## iso3114 492 492 iso3114 K[loc][","][3114](r)
## iso3113 493 493 iso3113 K[loc][","][3113](r)
## iso3112 494 494 iso3112 K[loc][","][3112](r)
## iso3111 495 495 iso3111 K[loc][","][3111](r)
## iso3110 496 496 iso3110 K[loc][","][3110](r)
## iso3109 497 497 iso3109 K[loc][","][3109](r)
## iso3108 498 498 iso3108 K[loc][","][3108](r)
## iso3107 499 499 iso3107 K[loc][","][3107](r)
## iso3106 500 500 iso3106 K[loc][","][3106](r)
## iso3105 501 501 iso3105 K[loc][","][3105](r)
## iso3104 502 502 iso3104 K[loc][","][3104](r)
## iso3103 503 503 iso3103 K[loc][","][3103](r)
## iso3102 504 504 iso3102 K[loc][","][3102](r)
## iso3101 505 505 iso3101 K[loc][","][3101](r)
## iso3100 506 506 iso3100 K[loc][","][3100](r)
## iso3099 507 507 iso3099 K[loc][","][3099](r)
## iso3098 508 508 iso3098 K[loc][","][3098](r)
## iso3097 509 509 iso3097 K[loc][","][3097](r)
## iso3096 510 510 iso3096 K[loc][","][3096](r)
## iso3095 511 511 iso3095 K[loc][","][3095](r)
## iso3094 512 512 iso3094 K[loc][","][3094](r)
## iso3093 513 513 iso3093 K[loc][","][3093](r)
## iso3092 514 514 iso3092 K[loc][","][3092](r)
## iso3091 515 515 iso3091 K[loc][","][3091](r)
## iso3090 516 516 iso3090 K[loc][","][3090](r)
## iso3089 517 517 iso3089 K[loc][","][3089](r)
## iso3088 518 518 iso3088 K[loc][","][3088](r)
## iso3087 519 519 iso3087 K[loc][","][3087](r)
## iso3086 520 520 iso3086 K[loc][","][3086](r)
## iso3085 521 521 iso3085 K[loc][","][3085](r)
## iso3084 522 522 iso3084 K[loc][","][3084](r)
## iso3083 523 523 iso3083 K[loc][","][3083](r)
## iso3082 524 524 iso3082 K[loc][","][3082](r)
## iso3081 525 525 iso3081 K[loc][","][3081](r)
## iso3080 526 526 iso3080 K[loc][","][3080](r)
## iso3079 527 527 iso3079 K[loc][","][3079](r)
## iso3078 528 528 iso3078 K[loc][","][3078](r)
## iso3077 529 529 iso3077 K[loc][","][3077](r)
## iso3076 530 530 iso3076 K[loc][","][3076](r)
## iso3075 531 531 iso3075 K[loc][","][3075](r)
## iso3074 532 532 iso3074 K[loc][","][3074](r)
## iso3073 533 533 iso3073 K[loc][","][3073](r)
## iso3072 534 534 iso3072 K[loc][","][3072](r)
## iso3071 535 535 iso3071 K[loc][","][3071](r)
## iso3070 536 536 iso3070 K[loc][","][3070](r)
## iso3069 537 537 iso3069 K[loc][","][3069](r)
## iso3068 538 538 iso3068 K[loc][","][3068](r)
## iso3067 539 539 iso3067 K[loc][","][3067](r)
## iso3066 540 540 iso3066 K[loc][","][3066](r)
## iso3065 541 541 iso3065 K[loc][","][3065](r)
## iso3064 542 542 iso3064 K[loc][","][3064](r)
## iso3063 543 543 iso3063 K[loc][","][3063](r)
## iso3062 544 544 iso3062 K[loc][","][3062](r)
## iso3061 545 545 iso3061 K[loc][","][3061](r)
## iso3060 546 546 iso3060 K[loc][","][3060](r)
## iso3059 547 547 iso3059 K[loc][","][3059](r)
## iso3058 548 548 iso3058 K[loc][","][3058](r)
## iso3057 549 549 iso3057 K[loc][","][3057](r)
## iso3056 550 550 iso3056 K[loc][","][3056](r)
## iso3055 551 551 iso3055 K[loc][","][3055](r)
## iso3054 552 552 iso3054 K[loc][","][3054](r)
## iso3053 553 553 iso3053 K[loc][","][3053](r)
## iso3052 554 554 iso3052 K[loc][","][3052](r)
## iso3051 555 555 iso3051 K[loc][","][3051](r)
## iso3050 556 556 iso3050 K[loc][","][3050](r)
## iso3049 557 557 iso3049 K[loc][","][3049](r)
## iso3048 558 558 iso3048 K[loc][","][3048](r)
## iso3047 559 559 iso3047 K[loc][","][3047](r)
## iso3046 560 560 iso3046 K[loc][","][3046](r)
## iso3045 561 561 iso3045 K[loc][","][3045](r)
## iso3044 562 562 iso3044 K[loc][","][3044](r)
## iso3043 563 563 iso3043 K[loc][","][3043](r)
## iso3042 564 564 iso3042 K[loc][","][3042](r)
## iso3041 565 565 iso3041 K[loc][","][3041](r)
## iso3040 566 566 iso3040 K[loc][","][3040](r)
## iso3039 567 567 iso3039 K[loc][","][3039](r)
## iso3038 568 568 iso3038 K[loc][","][3038](r)
## iso3037 569 569 iso3037 K[loc][","][3037](r)
## iso3036 570 570 iso3036 K[loc][","][3036](r)
## iso3035 571 571 iso3035 K[loc][","][3035](r)
## iso3034 572 572 iso3034 K[loc][","][3034](r)
## iso3033 573 573 iso3033 K[loc][","][3033](r)
## iso3032 574 574 iso3032 K[loc][","][3032](r)
## iso3031 575 575 iso3031 K[loc][","][3031](r)
## iso3030 576 576 iso3030 K[loc][","][3030](r)
## iso3029 577 577 iso3029 K[loc][","][3029](r)
## iso3028 578 578 iso3028 K[loc][","][3028](r)
## iso3027 579 579 iso3027 K[loc][","][3027](r)
## iso3026 580 580 iso3026 K[loc][","][3026](r)
## iso3025 581 581 iso3025 K[loc][","][3025](r)
## iso3024 582 582 iso3024 K[loc][","][3024](r)
## iso3023 583 583 iso3023 K[loc][","][3023](r)
## iso3022 584 584 iso3022 K[loc][","][3022](r)
## iso3021 585 585 iso3021 K[loc][","][3021](r)
## iso3020 586 586 iso3020 K[loc][","][3020](r)
## iso3019 587 587 iso3019 K[loc][","][3019](r)
## iso3018 588 588 iso3018 K[loc][","][3018](r)
## iso3017 589 589 iso3017 K[loc][","][3017](r)
## iso3016 590 590 iso3016 K[loc][","][3016](r)
## iso3015 591 591 iso3015 K[loc][","][3015](r)
## iso3014 592 592 iso3014 K[loc][","][3014](r)
## iso3013 593 593 iso3013 K[loc][","][3013](r)
## iso3012 594 594 iso3012 K[loc][","][3012](r)
## iso3011 595 595 iso3011 K[loc][","][3011](r)
## iso3010 596 596 iso3010 K[loc][","][3010](r)
## iso3009 597 597 iso3009 K[loc][","][3009](r)
## iso3008 598 598 iso3008 K[loc][","][3008](r)
## iso3007 599 599 iso3007 K[loc][","][3007](r)
## iso3006 600 600 iso3006 K[loc][","][3006](r)
## iso3005 601 601 iso3005 K[loc][","][3005](r)
## iso3004 602 602 iso3004 K[loc][","][3004](r)
## iso3003 603 603 iso3003 K[loc][","][3003](r)
## iso3002 604 604 iso3002 K[loc][","][3002](r)
## iso3001 605 605 iso3001 K[loc][","][3001](r)
## iso3000 606 606 iso3000 K[loc][","][3000](r)
## iso2999 607 607 iso2999 K[loc][","][2999](r)
## iso2998 608 608 iso2998 K[loc][","][2998](r)
## iso2997 609 609 iso2997 K[loc][","][2997](r)
## iso2996 610 610 iso2996 K[loc][","][2996](r)
## iso2995 611 611 iso2995 K[loc][","][2995](r)
## iso2994 612 612 iso2994 K[loc][","][2994](r)
## iso2993 613 613 iso2993 K[loc][","][2993](r)
## iso2992 614 614 iso2992 K[loc][","][2992](r)
## iso2991 615 615 iso2991 K[loc][","][2991](r)
## iso2990 616 616 iso2990 K[loc][","][2990](r)
## iso2989 617 617 iso2989 K[loc][","][2989](r)
## iso2988 618 618 iso2988 K[loc][","][2988](r)
## iso2987 619 619 iso2987 K[loc][","][2987](r)
## iso2986 620 620 iso2986 K[loc][","][2986](r)
## iso2985 621 621 iso2985 K[loc][","][2985](r)
## iso2984 622 622 iso2984 K[loc][","][2984](r)
## iso2983 623 623 iso2983 K[loc][","][2983](r)
## iso2982 624 624 iso2982 K[loc][","][2982](r)
## iso2981 625 625 iso2981 K[loc][","][2981](r)
## iso2980 626 626 iso2980 K[loc][","][2980](r)
## iso2979 627 627 iso2979 K[loc][","][2979](r)
## iso2978 628 628 iso2978 K[loc][","][2978](r)
## iso2977 629 629 iso2977 K[loc][","][2977](r)
## iso2976 630 630 iso2976 K[loc][","][2976](r)
## iso2975 631 631 iso2975 K[loc][","][2975](r)
## iso2974 632 632 iso2974 K[loc][","][2974](r)
## iso2973 633 633 iso2973 K[loc][","][2973](r)
## iso2972 634 634 iso2972 K[loc][","][2972](r)
## iso2971 635 635 iso2971 K[loc][","][2971](r)
## iso2970 636 636 iso2970 K[loc][","][2970](r)
## iso2969 637 637 iso2969 K[loc][","][2969](r)
## iso2968 638 638 iso2968 K[loc][","][2968](r)
## iso2967 639 639 iso2967 K[loc][","][2967](r)
## iso2966 640 640 iso2966 K[loc][","][2966](r)
## iso2965 641 641 iso2965 K[loc][","][2965](r)
## iso2964 642 642 iso2964 K[loc][","][2964](r)
## iso2963 643 643 iso2963 K[loc][","][2963](r)
## iso2962 644 644 iso2962 K[loc][","][2962](r)
## iso2961 645 645 iso2961 K[loc][","][2961](r)
## iso2960 646 646 iso2960 K[loc][","][2960](r)
## iso2959 647 647 iso2959 K[loc][","][2959](r)
## iso2958 648 648 iso2958 K[loc][","][2958](r)
## iso2957 649 649 iso2957 K[loc][","][2957](r)
## iso2956 650 650 iso2956 K[loc][","][2956](r)
## iso2955 651 651 iso2955 K[loc][","][2955](r)
## iso2954 652 652 iso2954 K[loc][","][2954](r)
## iso2953 653 653 iso2953 K[loc][","][2953](r)
## iso2952 654 654 iso2952 K[loc][","][2952](r)
## iso2951 655 655 iso2951 K[loc][","][2951](r)
## iso2950 656 656 iso2950 K[loc][","][2950](r)
## iso2949 657 657 iso2949 K[loc][","][2949](r)
## iso2948 658 658 iso2948 K[loc][","][2948](r)
## iso2947 659 659 iso2947 K[loc][","][2947](r)
## iso2946 660 660 iso2946 K[loc][","][2946](r)
## iso2945 661 661 iso2945 K[loc][","][2945](r)
## iso2944 662 662 iso2944 K[loc][","][2944](r)
## iso2943 663 663 iso2943 K[loc][","][2943](r)
## iso2942 664 664 iso2942 K[loc][","][2942](r)
## iso2941 665 665 iso2941 K[loc][","][2941](r)
## iso2940 666 666 iso2940 K[loc][","][2940](r)
## iso2939 667 667 iso2939 K[loc][","][2939](r)
## iso2938 668 668 iso2938 K[loc][","][2938](r)
## iso2937 669 669 iso2937 K[loc][","][2937](r)
## iso2936 670 670 iso2936 K[loc][","][2936](r)
## iso2935 671 671 iso2935 K[loc][","][2935](r)
## iso2934 672 672 iso2934 K[loc][","][2934](r)
## iso2933 673 673 iso2933 K[loc][","][2933](r)
## iso2932 674 674 iso2932 K[loc][","][2932](r)
## iso2931 675 675 iso2931 K[loc][","][2931](r)
## iso2930 676 676 iso2930 K[loc][","][2930](r)
## iso2929 677 677 iso2929 K[loc][","][2929](r)
## iso2928 678 678 iso2928 K[loc][","][2928](r)
## iso2927 679 679 iso2927 K[loc][","][2927](r)
## iso2926 680 680 iso2926 K[loc][","][2926](r)
## iso2925 681 681 iso2925 K[loc][","][2925](r)
## iso2924 682 682 iso2924 K[loc][","][2924](r)
## iso2923 683 683 iso2923 K[loc][","][2923](r)
## iso2922 684 684 iso2922 K[loc][","][2922](r)
## iso2921 685 685 iso2921 K[loc][","][2921](r)
## iso2920 686 686 iso2920 K[loc][","][2920](r)
## iso2919 687 687 iso2919 K[loc][","][2919](r)
## iso2918 688 688 iso2918 K[loc][","][2918](r)
## iso2917 689 689 iso2917 K[loc][","][2917](r)
## iso2916 690 690 iso2916 K[loc][","][2916](r)
## iso2915 691 691 iso2915 K[loc][","][2915](r)
## iso2914 692 692 iso2914 K[loc][","][2914](r)
## iso2913 693 693 iso2913 K[loc][","][2913](r)
## iso2912 694 694 iso2912 K[loc][","][2912](r)
## iso2911 695 695 iso2911 K[loc][","][2911](r)
## iso2910 696 696 iso2910 K[loc][","][2910](r)
## iso2909 697 697 iso2909 K[loc][","][2909](r)
## iso2908 698 698 iso2908 K[loc][","][2908](r)
## iso2907 699 699 iso2907 K[loc][","][2907](r)
## iso2906 700 700 iso2906 K[loc][","][2906](r)
## iso2905 701 701 iso2905 K[loc][","][2905](r)
## iso2904 702 702 iso2904 K[loc][","][2904](r)
## iso2903 703 703 iso2903 K[loc][","][2903](r)
## iso2902 704 704 iso2902 K[loc][","][2902](r)
## iso2901 705 705 iso2901 K[loc][","][2901](r)
## iso2900 706 706 iso2900 K[loc][","][2900](r)
## iso2899 707 707 iso2899 K[loc][","][2899](r)
## iso2898 708 708 iso2898 K[loc][","][2898](r)
## iso2897 709 709 iso2897 K[loc][","][2897](r)
## iso2896 710 710 iso2896 K[loc][","][2896](r)
## iso2895 711 711 iso2895 K[loc][","][2895](r)
## iso2894 712 712 iso2894 K[loc][","][2894](r)
## iso2893 713 713 iso2893 K[loc][","][2893](r)
## iso2892 714 714 iso2892 K[loc][","][2892](r)
## iso2891 715 715 iso2891 K[loc][","][2891](r)
## iso2890 716 716 iso2890 K[loc][","][2890](r)
## iso2889 717 717 iso2889 K[loc][","][2889](r)
## iso2888 718 718 iso2888 K[loc][","][2888](r)
## iso2887 719 719 iso2887 K[loc][","][2887](r)
## iso2886 720 720 iso2886 K[loc][","][2886](r)
## iso2885 721 721 iso2885 K[loc][","][2885](r)
## iso2884 722 722 iso2884 K[loc][","][2884](r)
## iso2883 723 723 iso2883 K[loc][","][2883](r)
## iso2882 724 724 iso2882 K[loc][","][2882](r)
## iso2881 725 725 iso2881 K[loc][","][2881](r)
## iso2880 726 726 iso2880 K[loc][","][2880](r)
## iso2879 727 727 iso2879 K[loc][","][2879](r)
## iso2878 728 728 iso2878 K[loc][","][2878](r)
## iso2877 729 729 iso2877 K[loc][","][2877](r)
## iso2876 730 730 iso2876 K[loc][","][2876](r)
## iso2875 731 731 iso2875 K[loc][","][2875](r)
## iso2874 732 732 iso2874 K[loc][","][2874](r)
## iso2873 733 733 iso2873 K[loc][","][2873](r)
## iso2872 734 734 iso2872 K[loc][","][2872](r)
## iso2871 735 735 iso2871 K[loc][","][2871](r)
## iso2870 736 736 iso2870 K[loc][","][2870](r)
## iso2869 737 737 iso2869 K[loc][","][2869](r)
## iso2868 738 738 iso2868 K[loc][","][2868](r)
## iso2867 739 739 iso2867 K[loc][","][2867](r)
## iso2866 740 740 iso2866 K[loc][","][2866](r)
## iso2865 741 741 iso2865 K[loc][","][2865](r)
## iso2864 742 742 iso2864 K[loc][","][2864](r)
## iso2863 743 743 iso2863 K[loc][","][2863](r)
## iso2862 744 744 iso2862 K[loc][","][2862](r)
## iso2861 745 745 iso2861 K[loc][","][2861](r)
## iso2860 746 746 iso2860 K[loc][","][2860](r)
## iso2859 747 747 iso2859 K[loc][","][2859](r)
## iso2858 748 748 iso2858 K[loc][","][2858](r)
## iso2857 749 749 iso2857 K[loc][","][2857](r)
## iso2856 750 750 iso2856 K[loc][","][2856](r)
## iso2855 751 751 iso2855 K[loc][","][2855](r)
## iso2854 752 752 iso2854 K[loc][","][2854](r)
## iso2853 753 753 iso2853 K[loc][","][2853](r)
## iso2852 754 754 iso2852 K[loc][","][2852](r)
## iso2851 755 755 iso2851 K[loc][","][2851](r)
## iso2850 756 756 iso2850 K[loc][","][2850](r)
## iso2849 757 757 iso2849 K[loc][","][2849](r)
## iso2848 758 758 iso2848 K[loc][","][2848](r)
## iso2847 759 759 iso2847 K[loc][","][2847](r)
## iso2846 760 760 iso2846 K[loc][","][2846](r)
## iso2845 761 761 iso2845 K[loc][","][2845](r)
## iso2844 762 762 iso2844 K[loc][","][2844](r)
## iso2843 763 763 iso2843 K[loc][","][2843](r)
## iso2842 764 764 iso2842 K[loc][","][2842](r)
## iso2841 765 765 iso2841 K[loc][","][2841](r)
## iso2840 766 766 iso2840 K[loc][","][2840](r)
## iso2839 767 767 iso2839 K[loc][","][2839](r)
## iso2838 768 768 iso2838 K[loc][","][2838](r)
## iso2837 769 769 iso2837 K[loc][","][2837](r)
## iso2836 770 770 iso2836 K[loc][","][2836](r)
## iso2835 771 771 iso2835 K[loc][","][2835](r)
## iso2834 772 772 iso2834 K[loc][","][2834](r)
## iso2833 773 773 iso2833 K[loc][","][2833](r)
## iso2832 774 774 iso2832 K[loc][","][2832](r)
## iso2831 775 775 iso2831 K[loc][","][2831](r)
## iso2830 776 776 iso2830 K[loc][","][2830](r)
## iso2829 777 777 iso2829 K[loc][","][2829](r)
## iso2828 778 778 iso2828 K[loc][","][2828](r)
## iso2827 779 779 iso2827 K[loc][","][2827](r)
## iso2826 780 780 iso2826 K[loc][","][2826](r)
## iso2825 781 781 iso2825 K[loc][","][2825](r)
## iso2824 782 782 iso2824 K[loc][","][2824](r)
## iso2823 783 783 iso2823 K[loc][","][2823](r)
## iso2822 784 784 iso2822 K[loc][","][2822](r)
## iso2821 785 785 iso2821 K[loc][","][2821](r)
## iso2820 786 786 iso2820 K[loc][","][2820](r)
## iso2819 787 787 iso2819 K[loc][","][2819](r)
## iso2818 788 788 iso2818 K[loc][","][2818](r)
## iso2817 789 789 iso2817 K[loc][","][2817](r)
## iso2816 790 790 iso2816 K[loc][","][2816](r)
## iso2815 791 791 iso2815 K[loc][","][2815](r)
## iso2814 792 792 iso2814 K[loc][","][2814](r)
## iso2813 793 793 iso2813 K[loc][","][2813](r)
## iso2812 794 794 iso2812 K[loc][","][2812](r)
## iso2811 795 795 iso2811 K[loc][","][2811](r)
## iso2810 796 796 iso2810 K[loc][","][2810](r)
## iso2809 797 797 iso2809 K[loc][","][2809](r)
## iso2808 798 798 iso2808 K[loc][","][2808](r)
## iso2807 799 799 iso2807 K[loc][","][2807](r)
## iso2806 800 800 iso2806 K[loc][","][2806](r)
## iso2805 801 801 iso2805 K[loc][","][2805](r)
## iso2804 802 802 iso2804 K[loc][","][2804](r)
## iso2803 803 803 iso2803 K[loc][","][2803](r)
## iso2802 804 804 iso2802 K[loc][","][2802](r)
## iso2801 805 805 iso2801 K[loc][","][2801](r)
## iso2800 806 806 iso2800 K[loc][","][2800](r)
## iso2799 807 807 iso2799 K[loc][","][2799](r)
## iso2798 808 808 iso2798 K[loc][","][2798](r)
## iso2797 809 809 iso2797 K[loc][","][2797](r)
## iso2796 810 810 iso2796 K[loc][","][2796](r)
## iso2795 811 811 iso2795 K[loc][","][2795](r)
## iso2794 812 812 iso2794 K[loc][","][2794](r)
## iso2793 813 813 iso2793 K[loc][","][2793](r)
## iso2792 814 814 iso2792 K[loc][","][2792](r)
## iso2791 815 815 iso2791 K[loc][","][2791](r)
## iso2790 816 816 iso2790 K[loc][","][2790](r)
## iso2789 817 817 iso2789 K[loc][","][2789](r)
## iso2788 818 818 iso2788 K[loc][","][2788](r)
## iso2787 819 819 iso2787 K[loc][","][2787](r)
## iso2786 820 820 iso2786 K[loc][","][2786](r)
## iso2785 821 821 iso2785 K[loc][","][2785](r)
## iso2784 822 822 iso2784 K[loc][","][2784](r)
## iso2783 823 823 iso2783 K[loc][","][2783](r)
## iso2782 824 824 iso2782 K[loc][","][2782](r)
## iso2781 825 825 iso2781 K[loc][","][2781](r)
## iso2780 826 826 iso2780 K[loc][","][2780](r)
## iso2779 827 827 iso2779 K[loc][","][2779](r)
## iso2778 828 828 iso2778 K[loc][","][2778](r)
## iso2777 829 829 iso2777 K[loc][","][2777](r)
## iso2776 830 830 iso2776 K[loc][","][2776](r)
## iso2775 831 831 iso2775 K[loc][","][2775](r)
## iso2774 832 832 iso2774 K[loc][","][2774](r)
## iso2773 833 833 iso2773 K[loc][","][2773](r)
## iso2772 834 834 iso2772 K[loc][","][2772](r)
## iso2771 835 835 iso2771 K[loc][","][2771](r)
## iso2770 836 836 iso2770 K[loc][","][2770](r)
## iso2769 837 837 iso2769 K[loc][","][2769](r)
## iso2768 838 838 iso2768 K[loc][","][2768](r)
## iso2767 839 839 iso2767 K[loc][","][2767](r)
## iso2766 840 840 iso2766 K[loc][","][2766](r)
## iso2765 841 841 iso2765 K[loc][","][2765](r)
## iso2764 842 842 iso2764 K[loc][","][2764](r)
## iso2763 843 843 iso2763 K[loc][","][2763](r)
## iso2762 844 844 iso2762 K[loc][","][2762](r)
## iso2761 845 845 iso2761 K[loc][","][2761](r)
## iso2760 846 846 iso2760 K[loc][","][2760](r)
## iso2759 847 847 iso2759 K[loc][","][2759](r)
## iso2758 848 848 iso2758 K[loc][","][2758](r)
## iso2757 849 849 iso2757 K[loc][","][2757](r)
## iso2756 850 850 iso2756 K[loc][","][2756](r)
## iso2755 851 851 iso2755 K[loc][","][2755](r)
## iso2754 852 852 iso2754 K[loc][","][2754](r)
## iso2753 853 853 iso2753 K[loc][","][2753](r)
## iso2752 854 854 iso2752 K[loc][","][2752](r)
## iso2751 855 855 iso2751 K[loc][","][2751](r)
## iso2750 856 856 iso2750 K[loc][","][2750](r)
## iso2749 857 857 iso2749 K[loc][","][2749](r)
## iso2748 858 858 iso2748 K[loc][","][2748](r)
## iso2747 859 859 iso2747 K[loc][","][2747](r)
## iso2746 860 860 iso2746 K[loc][","][2746](r)
## iso2745 861 861 iso2745 K[loc][","][2745](r)
## iso2744 862 862 iso2744 K[loc][","][2744](r)
## iso2743 863 863 iso2743 K[loc][","][2743](r)
## iso2742 864 864 iso2742 K[loc][","][2742](r)
## iso2741 865 865 iso2741 K[loc][","][2741](r)
## iso2740 866 866 iso2740 K[loc][","][2740](r)
## iso2739 867 867 iso2739 K[loc][","][2739](r)
## iso2738 868 868 iso2738 K[loc][","][2738](r)
## iso2737 869 869 iso2737 K[loc][","][2737](r)
## iso2736 870 870 iso2736 K[loc][","][2736](r)
## iso2735 871 871 iso2735 K[loc][","][2735](r)
## iso2734 872 872 iso2734 K[loc][","][2734](r)
## iso2733 873 873 iso2733 K[loc][","][2733](r)
## iso2732 874 874 iso2732 K[loc][","][2732](r)
## iso2731 875 875 iso2731 K[loc][","][2731](r)
## iso2730 876 876 iso2730 K[loc][","][2730](r)
## iso2729 877 877 iso2729 K[loc][","][2729](r)
## iso2728 878 878 iso2728 K[loc][","][2728](r)
## iso2727 879 879 iso2727 K[loc][","][2727](r)
## iso2726 880 880 iso2726 K[loc][","][2726](r)
## iso2725 881 881 iso2725 K[loc][","][2725](r)
## iso2724 882 882 iso2724 K[loc][","][2724](r)
## iso2723 883 883 iso2723 K[loc][","][2723](r)
## iso2722 884 884 iso2722 K[loc][","][2722](r)
## iso2721 885 885 iso2721 K[loc][","][2721](r)
## iso2720 886 886 iso2720 K[loc][","][2720](r)
## iso2719 887 887 iso2719 K[loc][","][2719](r)
## iso2718 888 888 iso2718 K[loc][","][2718](r)
## iso2717 889 889 iso2717 K[loc][","][2717](r)
## iso2716 890 890 iso2716 K[loc][","][2716](r)
## iso2715 891 891 iso2715 K[loc][","][2715](r)
## iso2714 892 892 iso2714 K[loc][","][2714](r)
## iso2713 893 893 iso2713 K[loc][","][2713](r)
## iso2712 894 894 iso2712 K[loc][","][2712](r)
## iso2711 895 895 iso2711 K[loc][","][2711](r)
## iso2710 896 896 iso2710 K[loc][","][2710](r)
## iso2709 897 897 iso2709 K[loc][","][2709](r)
## iso2708 898 898 iso2708 K[loc][","][2708](r)
## iso2707 899 899 iso2707 K[loc][","][2707](r)
## iso2706 900 900 iso2706 K[loc][","][2706](r)
## iso2705 901 901 iso2705 K[loc][","][2705](r)
## iso2704 902 902 iso2704 K[loc][","][2704](r)
## iso2703 903 903 iso2703 K[loc][","][2703](r)
## iso2702 904 904 iso2702 K[loc][","][2702](r)
## iso2701 905 905 iso2701 K[loc][","][2701](r)
## iso2700 906 906 iso2700 K[loc][","][2700](r)
## iso2699 907 907 iso2699 K[loc][","][2699](r)
## iso2698 908 908 iso2698 K[loc][","][2698](r)
## iso2697 909 909 iso2697 K[loc][","][2697](r)
## iso2696 910 910 iso2696 K[loc][","][2696](r)
## iso2695 911 911 iso2695 K[loc][","][2695](r)
## iso2694 912 912 iso2694 K[loc][","][2694](r)
## iso2693 913 913 iso2693 K[loc][","][2693](r)
## iso2692 914 914 iso2692 K[loc][","][2692](r)
## iso2691 915 915 iso2691 K[loc][","][2691](r)
## iso2690 916 916 iso2690 K[loc][","][2690](r)
## iso2689 917 917 iso2689 K[loc][","][2689](r)
## iso2688 918 918 iso2688 K[loc][","][2688](r)
## iso2687 919 919 iso2687 K[loc][","][2687](r)
## iso2686 920 920 iso2686 K[loc][","][2686](r)
## iso2685 921 921 iso2685 K[loc][","][2685](r)
## iso2684 922 922 iso2684 K[loc][","][2684](r)
## iso2683 923 923 iso2683 K[loc][","][2683](r)
## iso2682 924 924 iso2682 K[loc][","][2682](r)
## iso2681 925 925 iso2681 K[loc][","][2681](r)
## iso2680 926 926 iso2680 K[loc][","][2680](r)
## iso2679 927 927 iso2679 K[loc][","][2679](r)
## iso2678 928 928 iso2678 K[loc][","][2678](r)
## iso2677 929 929 iso2677 K[loc][","][2677](r)
## iso2676 930 930 iso2676 K[loc][","][2676](r)
## iso2675 931 931 iso2675 K[loc][","][2675](r)
## iso2674 932 932 iso2674 K[loc][","][2674](r)
## iso2673 933 933 iso2673 K[loc][","][2673](r)
## iso2672 934 934 iso2672 K[loc][","][2672](r)
## iso2671 935 935 iso2671 K[loc][","][2671](r)
## iso2670 936 936 iso2670 K[loc][","][2670](r)
## iso2669 937 937 iso2669 K[loc][","][2669](r)
## iso2668 938 938 iso2668 K[loc][","][2668](r)
## iso2667 939 939 iso2667 K[loc][","][2667](r)
## iso2666 940 940 iso2666 K[loc][","][2666](r)
## iso2665 941 941 iso2665 K[loc][","][2665](r)
## iso2664 942 942 iso2664 K[loc][","][2664](r)
## iso2663 943 943 iso2663 K[loc][","][2663](r)
## iso2662 944 944 iso2662 K[loc][","][2662](r)
## iso2661 945 945 iso2661 K[loc][","][2661](r)
## iso2660 946 946 iso2660 K[loc][","][2660](r)
## iso2659 947 947 iso2659 K[loc][","][2659](r)
## iso2658 948 948 iso2658 K[loc][","][2658](r)
## iso2657 949 949 iso2657 K[loc][","][2657](r)
## iso2656 950 950 iso2656 K[loc][","][2656](r)
## iso2655 951 951 iso2655 K[loc][","][2655](r)
## iso2654 952 952 iso2654 K[loc][","][2654](r)
## iso2653 953 953 iso2653 K[loc][","][2653](r)
## iso2652 954 954 iso2652 K[loc][","][2652](r)
## iso2651 955 955 iso2651 K[loc][","][2651](r)
## iso2650 956 956 iso2650 K[loc][","][2650](r)
## iso2649 957 957 iso2649 K[loc][","][2649](r)
## iso2648 958 958 iso2648 K[loc][","][2648](r)
## iso2647 959 959 iso2647 K[loc][","][2647](r)
## iso2646 960 960 iso2646 K[loc][","][2646](r)
## iso2645 961 961 iso2645 K[loc][","][2645](r)
## iso2644 962 962 iso2644 K[loc][","][2644](r)
## iso2643 963 963 iso2643 K[loc][","][2643](r)
## iso2642 964 964 iso2642 K[loc][","][2642](r)
## iso2641 965 965 iso2641 K[loc][","][2641](r)
## iso2640 966 966 iso2640 K[loc][","][2640](r)
## iso2639 967 967 iso2639 K[loc][","][2639](r)
## iso2638 968 968 iso2638 K[loc][","][2638](r)
## iso2637 969 969 iso2637 K[loc][","][2637](r)
## iso2636 970 970 iso2636 K[loc][","][2636](r)
## iso2635 971 971 iso2635 K[loc][","][2635](r)
## iso2634 972 972 iso2634 K[loc][","][2634](r)
## iso2633 973 973 iso2633 K[loc][","][2633](r)
## iso2632 974 974 iso2632 K[loc][","][2632](r)
## iso2631 975 975 iso2631 K[loc][","][2631](r)
## iso2630 976 976 iso2630 K[loc][","][2630](r)
## iso2629 977 977 iso2629 K[loc][","][2629](r)
## iso2628 978 978 iso2628 K[loc][","][2628](r)
## iso2627 979 979 iso2627 K[loc][","][2627](r)
## iso2626 980 980 iso2626 K[loc][","][2626](r)
## iso2625 981 981 iso2625 K[loc][","][2625](r)
## iso2624 982 982 iso2624 K[loc][","][2624](r)
## iso2623 983 983 iso2623 K[loc][","][2623](r)
## iso2622 984 984 iso2622 K[loc][","][2622](r)
## iso2621 985 985 iso2621 K[loc][","][2621](r)
## iso2620 986 986 iso2620 K[loc][","][2620](r)
## iso2619 987 987 iso2619 K[loc][","][2619](r)
## iso2618 988 988 iso2618 K[loc][","][2618](r)
## iso2617 989 989 iso2617 K[loc][","][2617](r)
## iso2616 990 990 iso2616 K[loc][","][2616](r)
## iso2615 991 991 iso2615 K[loc][","][2615](r)
## iso2614 992 992 iso2614 K[loc][","][2614](r)
## iso2613 993 993 iso2613 K[loc][","][2613](r)
## iso2612 994 994 iso2612 K[loc][","][2612](r)
## iso2611 995 995 iso2611 K[loc][","][2611](r)
## iso2610 996 996 iso2610 K[loc][","][2610](r)
## iso2609 997 997 iso2609 K[loc][","][2609](r)
## iso2608 998 998 iso2608 K[loc][","][2608](r)
## iso2607 999 999 iso2607 K[loc][","][2607](r)
## iso2606 1000 1000 iso2606 K[loc][","][2606](r)
## iso2605 1001 1001 iso2605 K[loc][","][2605](r)
## iso2604 1002 1002 iso2604 K[loc][","][2604](r)
## iso2603 1003 1003 iso2603 K[loc][","][2603](r)
## iso2602 1004 1004 iso2602 K[loc][","][2602](r)
## iso2601 1005 1005 iso2601 K[loc][","][2601](r)
## iso2600 1006 1006 iso2600 K[loc][","][2600](r)
## iso2599 1007 1007 iso2599 K[loc][","][2599](r)
## iso2598 1008 1008 iso2598 K[loc][","][2598](r)
## iso2597 1009 1009 iso2597 K[loc][","][2597](r)
## iso2596 1010 1010 iso2596 K[loc][","][2596](r)
## iso2595 1011 1011 iso2595 K[loc][","][2595](r)
## iso2594 1012 1012 iso2594 K[loc][","][2594](r)
## iso2593 1013 1013 iso2593 K[loc][","][2593](r)
## iso2592 1014 1014 iso2592 K[loc][","][2592](r)
## iso2591 1015 1015 iso2591 K[loc][","][2591](r)
## iso2590 1016 1016 iso2590 K[loc][","][2590](r)
## iso2589 1017 1017 iso2589 K[loc][","][2589](r)
## iso2588 1018 1018 iso2588 K[loc][","][2588](r)
## iso2587 1019 1019 iso2587 K[loc][","][2587](r)
## iso2586 1020 1020 iso2586 K[loc][","][2586](r)
## iso2585 1021 1021 iso2585 K[loc][","][2585](r)
## iso2584 1022 1022 iso2584 K[loc][","][2584](r)
## iso2583 1023 1023 iso2583 K[loc][","][2583](r)
## iso2582 1024 1024 iso2582 K[loc][","][2582](r)
## iso2581 1025 1025 iso2581 K[loc][","][2581](r)
## iso2580 1026 1026 iso2580 K[loc][","][2580](r)
## iso2579 1027 1027 iso2579 K[loc][","][2579](r)
## iso2578 1028 1028 iso2578 K[loc][","][2578](r)
## iso2577 1029 1029 iso2577 K[loc][","][2577](r)
## iso2576 1030 1030 iso2576 K[loc][","][2576](r)
## iso2575 1031 1031 iso2575 K[loc][","][2575](r)
## iso2574 1032 1032 iso2574 K[loc][","][2574](r)
## iso2573 1033 1033 iso2573 K[loc][","][2573](r)
## iso2572 1034 1034 iso2572 K[loc][","][2572](r)
## iso2571 1035 1035 iso2571 K[loc][","][2571](r)
## iso2570 1036 1036 iso2570 K[loc][","][2570](r)
## iso2569 1037 1037 iso2569 K[loc][","][2569](r)
## iso2568 1038 1038 iso2568 K[loc][","][2568](r)
## iso2567 1039 1039 iso2567 K[loc][","][2567](r)
## iso2566 1040 1040 iso2566 K[loc][","][2566](r)
## iso2565 1041 1041 iso2565 K[loc][","][2565](r)
## iso2564 1042 1042 iso2564 K[loc][","][2564](r)
## iso2563 1043 1043 iso2563 K[loc][","][2563](r)
## iso2562 1044 1044 iso2562 K[loc][","][2562](r)
## iso2561 1045 1045 iso2561 K[loc][","][2561](r)
## iso2560 1046 1046 iso2560 K[loc][","][2560](r)
## iso2559 1047 1047 iso2559 K[loc][","][2559](r)
## iso2558 1048 1048 iso2558 K[loc][","][2558](r)
## iso2557 1049 1049 iso2557 K[loc][","][2557](r)
## iso2556 1050 1050 iso2556 K[loc][","][2556](r)
## iso2555 1051 1051 iso2555 K[loc][","][2555](r)
## iso2554 1052 1052 iso2554 K[loc][","][2554](r)
## iso2553 1053 1053 iso2553 K[loc][","][2553](r)
## iso2552 1054 1054 iso2552 K[loc][","][2552](r)
## iso2551 1055 1055 iso2551 K[loc][","][2551](r)
## iso2550 1056 1056 iso2550 K[loc][","][2550](r)
## iso2549 1057 1057 iso2549 K[loc][","][2549](r)
## iso2548 1058 1058 iso2548 K[loc][","][2548](r)
## iso2547 1059 1059 iso2547 K[loc][","][2547](r)
## iso2546 1060 1060 iso2546 K[loc][","][2546](r)
## iso2545 1061 1061 iso2545 K[loc][","][2545](r)
## iso2544 1062 1062 iso2544 K[loc][","][2544](r)
## iso2543 1063 1063 iso2543 K[loc][","][2543](r)
## iso2542 1064 1064 iso2542 K[loc][","][2542](r)
## iso2541 1065 1065 iso2541 K[loc][","][2541](r)
## iso2540 1066 1066 iso2540 K[loc][","][2540](r)
## iso2539 1067 1067 iso2539 K[loc][","][2539](r)
## iso2538 1068 1068 iso2538 K[loc][","][2538](r)
## iso2537 1069 1069 iso2537 K[loc][","][2537](r)
## iso2536 1070 1070 iso2536 K[loc][","][2536](r)
## iso2535 1071 1071 iso2535 K[loc][","][2535](r)
## iso2534 1072 1072 iso2534 K[loc][","][2534](r)
## iso2533 1073 1073 iso2533 K[loc][","][2533](r)
## iso2532 1074 1074 iso2532 K[loc][","][2532](r)
## iso2531 1075 1075 iso2531 K[loc][","][2531](r)
## iso2530 1076 1076 iso2530 K[loc][","][2530](r)
## iso2529 1077 1077 iso2529 K[loc][","][2529](r)
## iso2528 1078 1078 iso2528 K[loc][","][2528](r)
## iso2527 1079 1079 iso2527 K[loc][","][2527](r)
## iso2526 1080 1080 iso2526 K[loc][","][2526](r)
## iso2525 1081 1081 iso2525 K[loc][","][2525](r)
## iso2524 1082 1082 iso2524 K[loc][","][2524](r)
## iso2523 1083 1083 iso2523 K[loc][","][2523](r)
## iso2522 1084 1084 iso2522 K[loc][","][2522](r)
## iso2521 1085 1085 iso2521 K[loc][","][2521](r)
## iso2520 1086 1086 iso2520 K[loc][","][2520](r)
## iso2519 1087 1087 iso2519 K[loc][","][2519](r)
## iso2518 1088 1088 iso2518 K[loc][","][2518](r)
## iso2517 1089 1089 iso2517 K[loc][","][2517](r)
## iso2516 1090 1090 iso2516 K[loc][","][2516](r)
## iso2515 1091 1091 iso2515 K[loc][","][2515](r)
## iso2514 1092 1092 iso2514 K[loc][","][2514](r)
## iso2513 1093 1093 iso2513 K[loc][","][2513](r)
## iso2512 1094 1094 iso2512 K[loc][","][2512](r)
## iso2511 1095 1095 iso2511 K[loc][","][2511](r)
## iso2510 1096 1096 iso2510 K[loc][","][2510](r)
## iso2509 1097 1097 iso2509 K[loc][","][2509](r)
## iso2508 1098 1098 iso2508 K[loc][","][2508](r)
## iso2507 1099 1099 iso2507 K[loc][","][2507](r)
## iso2506 1100 1100 iso2506 K[loc][","][2506](r)
## iso2505 1101 1101 iso2505 K[loc][","][2505](r)
## iso2504 1102 1102 iso2504 K[loc][","][2504](r)
## iso2503 1103 1103 iso2503 K[loc][","][2503](r)
## iso2502 1104 1104 iso2502 K[loc][","][2502](r)
## iso2501 1105 1105 iso2501 K[loc][","][2501](r)
## iso2500 1106 1106 iso2500 K[loc][","][2500](r)
## iso2499 1107 1107 iso2499 K[loc][","][2499](r)
## iso2498 1108 1108 iso2498 K[loc][","][2498](r)
## iso2497 1109 1109 iso2497 K[loc][","][2497](r)
## iso2496 1110 1110 iso2496 K[loc][","][2496](r)
## iso2495 1111 1111 iso2495 K[loc][","][2495](r)
## iso2494 1112 1112 iso2494 K[loc][","][2494](r)
## iso2493 1113 1113 iso2493 K[loc][","][2493](r)
## iso2492 1114 1114 iso2492 K[loc][","][2492](r)
## iso2491 1115 1115 iso2491 K[loc][","][2491](r)
## iso2490 1116 1116 iso2490 K[loc][","][2490](r)
## iso2489 1117 1117 iso2489 K[loc][","][2489](r)
## iso2488 1118 1118 iso2488 K[loc][","][2488](r)
## iso2487 1119 1119 iso2487 K[loc][","][2487](r)
## iso2486 1120 1120 iso2486 K[loc][","][2486](r)
## iso2485 1121 1121 iso2485 K[loc][","][2485](r)
## iso2484 1122 1122 iso2484 K[loc][","][2484](r)
## iso2483 1123 1123 iso2483 K[loc][","][2483](r)
## iso2482 1124 1124 iso2482 K[loc][","][2482](r)
## iso2481 1125 1125 iso2481 K[loc][","][2481](r)
## iso2480 1126 1126 iso2480 K[loc][","][2480](r)
## iso2479 1127 1127 iso2479 K[loc][","][2479](r)
## iso2478 1128 1128 iso2478 K[loc][","][2478](r)
## iso2477 1129 1129 iso2477 K[loc][","][2477](r)
## iso2476 1130 1130 iso2476 K[loc][","][2476](r)
## iso2475 1131 1131 iso2475 K[loc][","][2475](r)
## iso2474 1132 1132 iso2474 K[loc][","][2474](r)
## iso2473 1133 1133 iso2473 K[loc][","][2473](r)
## iso2472 1134 1134 iso2472 K[loc][","][2472](r)
## iso2471 1135 1135 iso2471 K[loc][","][2471](r)
## iso2470 1136 1136 iso2470 K[loc][","][2470](r)
## iso2469 1137 1137 iso2469 K[loc][","][2469](r)
## iso2468 1138 1138 iso2468 K[loc][","][2468](r)
## iso2467 1139 1139 iso2467 K[loc][","][2467](r)
## iso2466 1140 1140 iso2466 K[loc][","][2466](r)
## iso2465 1141 1141 iso2465 K[loc][","][2465](r)
## iso2464 1142 1142 iso2464 K[loc][","][2464](r)
## iso2463 1143 1143 iso2463 K[loc][","][2463](r)
## iso2462 1144 1144 iso2462 K[loc][","][2462](r)
## iso2461 1145 1145 iso2461 K[loc][","][2461](r)
## iso2460 1146 1146 iso2460 K[loc][","][2460](r)
## iso2459 1147 1147 iso2459 K[loc][","][2459](r)
## iso2458 1148 1148 iso2458 K[loc][","][2458](r)
## iso2457 1149 1149 iso2457 K[loc][","][2457](r)
## iso2456 1150 1150 iso2456 K[loc][","][2456](r)
## iso2455 1151 1151 iso2455 K[loc][","][2455](r)
## iso2454 1152 1152 iso2454 K[loc][","][2454](r)
## iso2453 1153 1153 iso2453 K[loc][","][2453](r)
## iso2452 1154 1154 iso2452 K[loc][","][2452](r)
## iso2451 1155 1155 iso2451 K[loc][","][2451](r)
## iso2450 1156 1156 iso2450 K[loc][","][2450](r)
## iso2449 1157 1157 iso2449 K[loc][","][2449](r)
## iso2448 1158 1158 iso2448 K[loc][","][2448](r)
## iso2447 1159 1159 iso2447 K[loc][","][2447](r)
## iso2446 1160 1160 iso2446 K[loc][","][2446](r)
## iso2445 1161 1161 iso2445 K[loc][","][2445](r)
## iso2444 1162 1162 iso2444 K[loc][","][2444](r)
## iso2443 1163 1163 iso2443 K[loc][","][2443](r)
## iso2442 1164 1164 iso2442 K[loc][","][2442](r)
## iso2441 1165 1165 iso2441 K[loc][","][2441](r)
## iso2440 1166 1166 iso2440 K[loc][","][2440](r)
## iso2439 1167 1167 iso2439 K[loc][","][2439](r)
## iso2438 1168 1168 iso2438 K[loc][","][2438](r)
## iso2437 1169 1169 iso2437 K[loc][","][2437](r)
## iso2436 1170 1170 iso2436 K[loc][","][2436](r)
## iso2435 1171 1171 iso2435 K[loc][","][2435](r)
## iso2434 1172 1172 iso2434 K[loc][","][2434](r)
## iso2433 1173 1173 iso2433 K[loc][","][2433](r)
## iso2432 1174 1174 iso2432 K[loc][","][2432](r)
## iso2431 1175 1175 iso2431 K[loc][","][2431](r)
## iso2430 1176 1176 iso2430 K[loc][","][2430](r)
## iso2429 1177 1177 iso2429 K[loc][","][2429](r)
## iso2428 1178 1178 iso2428 K[loc][","][2428](r)
## iso2427 1179 1179 iso2427 K[loc][","][2427](r)
## iso2426 1180 1180 iso2426 K[loc][","][2426](r)
## iso2425 1181 1181 iso2425 K[loc][","][2425](r)
## iso2424 1182 1182 iso2424 K[loc][","][2424](r)
## iso2423 1183 1183 iso2423 K[loc][","][2423](r)
## iso2422 1184 1184 iso2422 K[loc][","][2422](r)
## iso2421 1185 1185 iso2421 K[loc][","][2421](r)
## iso2420 1186 1186 iso2420 K[loc][","][2420](r)
## iso2419 1187 1187 iso2419 K[loc][","][2419](r)
## iso2418 1188 1188 iso2418 K[loc][","][2418](r)
## iso2417 1189 1189 iso2417 K[loc][","][2417](r)
## iso2416 1190 1190 iso2416 K[loc][","][2416](r)
## iso2415 1191 1191 iso2415 K[loc][","][2415](r)
## iso2414 1192 1192 iso2414 K[loc][","][2414](r)
## iso2413 1193 1193 iso2413 K[loc][","][2413](r)
## iso2412 1194 1194 iso2412 K[loc][","][2412](r)
## iso2411 1195 1195 iso2411 K[loc][","][2411](r)
## iso2410 1196 1196 iso2410 K[loc][","][2410](r)
## iso2409 1197 1197 iso2409 K[loc][","][2409](r)
## iso2408 1198 1198 iso2408 K[loc][","][2408](r)
## iso2407 1199 1199 iso2407 K[loc][","][2407](r)
## iso2406 1200 1200 iso2406 K[loc][","][2406](r)
## iso2405 1201 1201 iso2405 K[loc][","][2405](r)
## iso2404 1202 1202 iso2404 K[loc][","][2404](r)
## iso2403 1203 1203 iso2403 K[loc][","][2403](r)
## iso2402 1204 1204 iso2402 K[loc][","][2402](r)
## iso2401 1205 1205 iso2401 K[loc][","][2401](r)
## iso2400 1206 1206 iso2400 K[loc][","][2400](r)
## iso2399 1207 1207 iso2399 K[loc][","][2399](r)
## iso2398 1208 1208 iso2398 K[loc][","][2398](r)
## iso2397 1209 1209 iso2397 K[loc][","][2397](r)
## iso2396 1210 1210 iso2396 K[loc][","][2396](r)
## iso2395 1211 1211 iso2395 K[loc][","][2395](r)
## iso2394 1212 1212 iso2394 K[loc][","][2394](r)
## iso2393 1213 1213 iso2393 K[loc][","][2393](r)
## iso2392 1214 1214 iso2392 K[loc][","][2392](r)
## iso2391 1215 1215 iso2391 K[loc][","][2391](r)
## iso2390 1216 1216 iso2390 K[loc][","][2390](r)
## iso2389 1217 1217 iso2389 K[loc][","][2389](r)
## iso2388 1218 1218 iso2388 K[loc][","][2388](r)
## iso2387 1219 1219 iso2387 K[loc][","][2387](r)
## iso2386 1220 1220 iso2386 K[loc][","][2386](r)
## iso2385 1221 1221 iso2385 K[loc][","][2385](r)
## iso2384 1222 1222 iso2384 K[loc][","][2384](r)
## iso2383 1223 1223 iso2383 K[loc][","][2383](r)
## iso2382 1224 1224 iso2382 K[loc][","][2382](r)
## iso2381 1225 1225 iso2381 K[loc][","][2381](r)
## iso2380 1226 1226 iso2380 K[loc][","][2380](r)
## iso2379 1227 1227 iso2379 K[loc][","][2379](r)
## iso2378 1228 1228 iso2378 K[loc][","][2378](r)
## iso2377 1229 1229 iso2377 K[loc][","][2377](r)
## iso2376 1230 1230 iso2376 K[loc][","][2376](r)
## iso2375 1231 1231 iso2375 K[loc][","][2375](r)
## iso2374 1232 1232 iso2374 K[loc][","][2374](r)
## iso2373 1233 1233 iso2373 K[loc][","][2373](r)
## iso2372 1234 1234 iso2372 K[loc][","][2372](r)
## iso2371 1235 1235 iso2371 K[loc][","][2371](r)
## iso2370 1236 1236 iso2370 K[loc][","][2370](r)
## iso2369 1237 1237 iso2369 K[loc][","][2369](r)
## iso2368 1238 1238 iso2368 K[loc][","][2368](r)
## iso2367 1239 1239 iso2367 K[loc][","][2367](r)
## iso2366 1240 1240 iso2366 K[loc][","][2366](r)
## iso2365 1241 1241 iso2365 K[loc][","][2365](r)
## iso2364 1242 1242 iso2364 K[loc][","][2364](r)
## iso2363 1243 1243 iso2363 K[loc][","][2363](r)
## iso2362 1244 1244 iso2362 K[loc][","][2362](r)
## iso2361 1245 1245 iso2361 K[loc][","][2361](r)
## iso2360 1246 1246 iso2360 K[loc][","][2360](r)
## iso2359 1247 1247 iso2359 K[loc][","][2359](r)
## iso2358 1248 1248 iso2358 K[loc][","][2358](r)
## iso2357 1249 1249 iso2357 K[loc][","][2357](r)
## iso2356 1250 1250 iso2356 K[loc][","][2356](r)
## iso2355 1251 1251 iso2355 K[loc][","][2355](r)
## iso2354 1252 1252 iso2354 K[loc][","][2354](r)
## iso2353 1253 1253 iso2353 K[loc][","][2353](r)
## iso2352 1254 1254 iso2352 K[loc][","][2352](r)
## iso2351 1255 1255 iso2351 K[loc][","][2351](r)
## iso2350 1256 1256 iso2350 K[loc][","][2350](r)
## iso2349 1257 1257 iso2349 K[loc][","][2349](r)
## iso2348 1258 1258 iso2348 K[loc][","][2348](r)
## iso2347 1259 1259 iso2347 K[loc][","][2347](r)
## iso2346 1260 1260 iso2346 K[loc][","][2346](r)
## iso2345 1261 1261 iso2345 K[loc][","][2345](r)
## iso2344 1262 1262 iso2344 K[loc][","][2344](r)
## iso2343 1263 1263 iso2343 K[loc][","][2343](r)
## iso2342 1264 1264 iso2342 K[loc][","][2342](r)
## iso2341 1265 1265 iso2341 K[loc][","][2341](r)
## iso2340 1266 1266 iso2340 K[loc][","][2340](r)
## iso2339 1267 1267 iso2339 K[loc][","][2339](r)
## iso2338 1268 1268 iso2338 K[loc][","][2338](r)
## iso2337 1269 1269 iso2337 K[loc][","][2337](r)
## iso2336 1270 1270 iso2336 K[loc][","][2336](r)
## iso2335 1271 1271 iso2335 K[loc][","][2335](r)
## iso2334 1272 1272 iso2334 K[loc][","][2334](r)
## iso2333 1273 1273 iso2333 K[loc][","][2333](r)
## iso2332 1274 1274 iso2332 K[loc][","][2332](r)
## iso2331 1275 1275 iso2331 K[loc][","][2331](r)
## iso2330 1276 1276 iso2330 K[loc][","][2330](r)
## iso2329 1277 1277 iso2329 K[loc][","][2329](r)
## iso2328 1278 1278 iso2328 K[loc][","][2328](r)
## iso2327 1279 1279 iso2327 K[loc][","][2327](r)
## iso2326 1280 1280 iso2326 K[loc][","][2326](r)
## iso2325 1281 1281 iso2325 K[loc][","][2325](r)
## iso2324 1282 1282 iso2324 K[loc][","][2324](r)
## iso2323 1283 1283 iso2323 K[loc][","][2323](r)
## iso2322 1284 1284 iso2322 K[loc][","][2322](r)
## iso2321 1285 1285 iso2321 K[loc][","][2321](r)
## iso2320 1286 1286 iso2320 K[loc][","][2320](r)
## iso2319 1287 1287 iso2319 K[loc][","][2319](r)
## iso2318 1288 1288 iso2318 K[loc][","][2318](r)
## iso2317 1289 1289 iso2317 K[loc][","][2317](r)
## iso2316 1290 1290 iso2316 K[loc][","][2316](r)
## iso2315 1291 1291 iso2315 K[loc][","][2315](r)
## iso2314 1292 1292 iso2314 K[loc][","][2314](r)
## iso2313 1293 1293 iso2313 K[loc][","][2313](r)
## iso2312 1294 1294 iso2312 K[loc][","][2312](r)
## iso2311 1295 1295 iso2311 K[loc][","][2311](r)
## iso2310 1296 1296 iso2310 K[loc][","][2310](r)
## iso2309 1297 1297 iso2309 K[loc][","][2309](r)
## iso2308 1298 1298 iso2308 K[loc][","][2308](r)
## iso2307 1299 1299 iso2307 K[loc][","][2307](r)
## iso2306 1300 1300 iso2306 K[loc][","][2306](r)
## iso2305 1301 1301 iso2305 K[loc][","][2305](r)
## iso2304 1302 1302 iso2304 K[loc][","][2304](r)
## iso2303 1303 1303 iso2303 K[loc][","][2303](r)
## iso2302 1304 1304 iso2302 K[loc][","][2302](r)
## iso2301 1305 1305 iso2301 K[loc][","][2301](r)
## iso2300 1306 1306 iso2300 K[loc][","][2300](r)
## iso2299 1307 1307 iso2299 K[loc][","][2299](r)
## iso2298 1308 1308 iso2298 K[loc][","][2298](r)
## iso2297 1309 1309 iso2297 K[loc][","][2297](r)
## iso2296 1310 1310 iso2296 K[loc][","][2296](r)
## iso2295 1311 1311 iso2295 K[loc][","][2295](r)
## iso2294 1312 1312 iso2294 K[loc][","][2294](r)
## iso2293 1313 1313 iso2293 K[loc][","][2293](r)
## iso2292 1314 1314 iso2292 K[loc][","][2292](r)
## iso2291 1315 1315 iso2291 K[loc][","][2291](r)
## iso2290 1316 1316 iso2290 K[loc][","][2290](r)
## iso2289 1317 1317 iso2289 K[loc][","][2289](r)
## iso2288 1318 1318 iso2288 K[loc][","][2288](r)
## iso2287 1319 1319 iso2287 K[loc][","][2287](r)
## iso2286 1320 1320 iso2286 K[loc][","][2286](r)
## iso2285 1321 1321 iso2285 K[loc][","][2285](r)
## iso2284 1322 1322 iso2284 K[loc][","][2284](r)
## iso2283 1323 1323 iso2283 K[loc][","][2283](r)
## iso2282 1324 1324 iso2282 K[loc][","][2282](r)
## iso2281 1325 1325 iso2281 K[loc][","][2281](r)
## iso2280 1326 1326 iso2280 K[loc][","][2280](r)
## iso2279 1327 1327 iso2279 K[loc][","][2279](r)
## iso2278 1328 1328 iso2278 K[loc][","][2278](r)
## iso2277 1329 1329 iso2277 K[loc][","][2277](r)
## iso2276 1330 1330 iso2276 K[loc][","][2276](r)
## iso2275 1331 1331 iso2275 K[loc][","][2275](r)
## iso2274 1332 1332 iso2274 K[loc][","][2274](r)
## iso2273 1333 1333 iso2273 K[loc][","][2273](r)
## iso2272 1334 1334 iso2272 K[loc][","][2272](r)
## iso2271 1335 1335 iso2271 K[loc][","][2271](r)
## iso2270 1336 1336 iso2270 K[loc][","][2270](r)
## iso2269 1337 1337 iso2269 K[loc][","][2269](r)
## iso2268 1338 1338 iso2268 K[loc][","][2268](r)
## iso2267 1339 1339 iso2267 K[loc][","][2267](r)
## iso2266 1340 1340 iso2266 K[loc][","][2266](r)
## iso2265 1341 1341 iso2265 K[loc][","][2265](r)
## iso2264 1342 1342 iso2264 K[loc][","][2264](r)
## iso2263 1343 1343 iso2263 K[loc][","][2263](r)
## iso2262 1344 1344 iso2262 K[loc][","][2262](r)
## iso2261 1345 1345 iso2261 K[loc][","][2261](r)
## iso2260 1346 1346 iso2260 K[loc][","][2260](r)
## iso2259 1347 1347 iso2259 K[loc][","][2259](r)
## iso2258 1348 1348 iso2258 K[loc][","][2258](r)
## iso2257 1349 1349 iso2257 K[loc][","][2257](r)
## iso2256 1350 1350 iso2256 K[loc][","][2256](r)
## iso2255 1351 1351 iso2255 K[loc][","][2255](r)
## iso2254 1352 1352 iso2254 K[loc][","][2254](r)
## iso2253 1353 1353 iso2253 K[loc][","][2253](r)
## iso2252 1354 1354 iso2252 K[loc][","][2252](r)
## iso2251 1355 1355 iso2251 K[loc][","][2251](r)
## iso2250 1356 1356 iso2250 K[loc][","][2250](r)
## iso2249 1357 1357 iso2249 K[loc][","][2249](r)
## iso2248 1358 1358 iso2248 K[loc][","][2248](r)
## iso2247 1359 1359 iso2247 K[loc][","][2247](r)
## iso2246 1360 1360 iso2246 K[loc][","][2246](r)
## iso2245 1361 1361 iso2245 K[loc][","][2245](r)
## iso2244 1362 1362 iso2244 K[loc][","][2244](r)
## iso2243 1363 1363 iso2243 K[loc][","][2243](r)
## iso2242 1364 1364 iso2242 K[loc][","][2242](r)
## iso2241 1365 1365 iso2241 K[loc][","][2241](r)
## iso2240 1366 1366 iso2240 K[loc][","][2240](r)
## iso2239 1367 1367 iso2239 K[loc][","][2239](r)
## iso2238 1368 1368 iso2238 K[loc][","][2238](r)
## iso2237 1369 1369 iso2237 K[loc][","][2237](r)
## iso2236 1370 1370 iso2236 K[loc][","][2236](r)
## iso2235 1371 1371 iso2235 K[loc][","][2235](r)
## iso2234 1372 1372 iso2234 K[loc][","][2234](r)
## iso2233 1373 1373 iso2233 K[loc][","][2233](r)
## iso2232 1374 1374 iso2232 K[loc][","][2232](r)
## iso2231 1375 1375 iso2231 K[loc][","][2231](r)
## iso2230 1376 1376 iso2230 K[loc][","][2230](r)
## iso2229 1377 1377 iso2229 K[loc][","][2229](r)
## iso2228 1378 1378 iso2228 K[loc][","][2228](r)
## iso2227 1379 1379 iso2227 K[loc][","][2227](r)
## iso2226 1380 1380 iso2226 K[loc][","][2226](r)
## iso2225 1381 1381 iso2225 K[loc][","][2225](r)
## iso2224 1382 1382 iso2224 K[loc][","][2224](r)
## iso2223 1383 1383 iso2223 K[loc][","][2223](r)
## iso2222 1384 1384 iso2222 K[loc][","][2222](r)
## iso2221 1385 1385 iso2221 K[loc][","][2221](r)
## iso2220 1386 1386 iso2220 K[loc][","][2220](r)
## iso2219 1387 1387 iso2219 K[loc][","][2219](r)
## iso2218 1388 1388 iso2218 K[loc][","][2218](r)
## iso2217 1389 1389 iso2217 K[loc][","][2217](r)
## iso2216 1390 1390 iso2216 K[loc][","][2216](r)
## iso2215 1391 1391 iso2215 K[loc][","][2215](r)
## iso2214 1392 1392 iso2214 K[loc][","][2214](r)
## iso2213 1393 1393 iso2213 K[loc][","][2213](r)
## iso2212 1394 1394 iso2212 K[loc][","][2212](r)
## iso2211 1395 1395 iso2211 K[loc][","][2211](r)
## iso2210 1396 1396 iso2210 K[loc][","][2210](r)
## iso2209 1397 1397 iso2209 K[loc][","][2209](r)
## iso2208 1398 1398 iso2208 K[loc][","][2208](r)
## iso2207 1399 1399 iso2207 K[loc][","][2207](r)
## iso2206 1400 1400 iso2206 K[loc][","][2206](r)
## iso2205 1401 1401 iso2205 K[loc][","][2205](r)
## iso2204 1402 1402 iso2204 K[loc][","][2204](r)
## iso2203 1403 1403 iso2203 K[loc][","][2203](r)
## iso2202 1404 1404 iso2202 K[loc][","][2202](r)
## iso2201 1405 1405 iso2201 K[loc][","][2201](r)
## iso2200 1406 1406 iso2200 K[loc][","][2200](r)
## iso2199 1407 1407 iso2199 K[loc][","][2199](r)
## iso2198 1408 1408 iso2198 K[loc][","][2198](r)
## iso2197 1409 1409 iso2197 K[loc][","][2197](r)
## iso2196 1410 1410 iso2196 K[loc][","][2196](r)
## iso2195 1411 1411 iso2195 K[loc][","][2195](r)
## iso2194 1412 1412 iso2194 K[loc][","][2194](r)
## iso2193 1413 1413 iso2193 K[loc][","][2193](r)
## iso2192 1414 1414 iso2192 K[loc][","][2192](r)
## iso2191 1415 1415 iso2191 K[loc][","][2191](r)
## iso2190 1416 1416 iso2190 K[loc][","][2190](r)
## iso2189 1417 1417 iso2189 K[loc][","][2189](r)
## iso2188 1418 1418 iso2188 K[loc][","][2188](r)
## iso2187 1419 1419 iso2187 K[loc][","][2187](r)
## iso2186 1420 1420 iso2186 K[loc][","][2186](r)
## iso2185 1421 1421 iso2185 K[loc][","][2185](r)
## iso2184 1422 1422 iso2184 K[loc][","][2184](r)
## iso2183 1423 1423 iso2183 K[loc][","][2183](r)
## iso2182 1424 1424 iso2182 K[loc][","][2182](r)
## iso2181 1425 1425 iso2181 K[loc][","][2181](r)
## iso2180 1426 1426 iso2180 K[loc][","][2180](r)
## iso2179 1427 1427 iso2179 K[loc][","][2179](r)
## iso2178 1428 1428 iso2178 K[loc][","][2178](r)
## iso2177 1429 1429 iso2177 K[loc][","][2177](r)
## iso2176 1430 1430 iso2176 K[loc][","][2176](r)
## iso2175 1431 1431 iso2175 K[loc][","][2175](r)
## iso2174 1432 1432 iso2174 K[loc][","][2174](r)
## iso2173 1433 1433 iso2173 K[loc][","][2173](r)
## iso2172 1434 1434 iso2172 K[loc][","][2172](r)
## iso2171 1435 1435 iso2171 K[loc][","][2171](r)
## iso2170 1436 1436 iso2170 K[loc][","][2170](r)
## iso2169 1437 1437 iso2169 K[loc][","][2169](r)
## iso2168 1438 1438 iso2168 K[loc][","][2168](r)
## iso2167 1439 1439 iso2167 K[loc][","][2167](r)
## iso2166 1440 1440 iso2166 K[loc][","][2166](r)
## iso2165 1441 1441 iso2165 K[loc][","][2165](r)
## iso2164 1442 1442 iso2164 K[loc][","][2164](r)
## iso2163 1443 1443 iso2163 K[loc][","][2163](r)
## iso2162 1444 1444 iso2162 K[loc][","][2162](r)
## iso2161 1445 1445 iso2161 K[loc][","][2161](r)
## iso2160 1446 1446 iso2160 K[loc][","][2160](r)
## iso2159 1447 1447 iso2159 K[loc][","][2159](r)
## iso2158 1448 1448 iso2158 K[loc][","][2158](r)
## iso2157 1449 1449 iso2157 K[loc][","][2157](r)
## iso2156 1450 1450 iso2156 K[loc][","][2156](r)
## iso2155 1451 1451 iso2155 K[loc][","][2155](r)
## iso2154 1452 1452 iso2154 K[loc][","][2154](r)
## iso2153 1453 1453 iso2153 K[loc][","][2153](r)
## iso2152 1454 1454 iso2152 K[loc][","][2152](r)
## iso2151 1455 1455 iso2151 K[loc][","][2151](r)
## iso2150 1456 1456 iso2150 K[loc][","][2150](r)
## iso2149 1457 1457 iso2149 K[loc][","][2149](r)
## iso2148 1458 1458 iso2148 K[loc][","][2148](r)
## iso2147 1459 1459 iso2147 K[loc][","][2147](r)
## iso2146 1460 1460 iso2146 K[loc][","][2146](r)
## iso2145 1461 1461 iso2145 K[loc][","][2145](r)
## iso2144 1462 1462 iso2144 K[loc][","][2144](r)
## iso2143 1463 1463 iso2143 K[loc][","][2143](r)
## iso2142 1464 1464 iso2142 K[loc][","][2142](r)
## iso2141 1465 1465 iso2141 K[loc][","][2141](r)
## iso2140 1466 1466 iso2140 K[loc][","][2140](r)
## iso2139 1467 1467 iso2139 K[loc][","][2139](r)
## iso2138 1468 1468 iso2138 K[loc][","][2138](r)
## iso2137 1469 1469 iso2137 K[loc][","][2137](r)
## iso2136 1470 1470 iso2136 K[loc][","][2136](r)
## iso2135 1471 1471 iso2135 K[loc][","][2135](r)
## iso2134 1472 1472 iso2134 K[loc][","][2134](r)
## iso2133 1473 1473 iso2133 K[loc][","][2133](r)
## iso2132 1474 1474 iso2132 K[loc][","][2132](r)
## iso2131 1475 1475 iso2131 K[loc][","][2131](r)
## iso2130 1476 1476 iso2130 K[loc][","][2130](r)
## iso2129 1477 1477 iso2129 K[loc][","][2129](r)
## iso2128 1478 1478 iso2128 K[loc][","][2128](r)
## iso2127 1479 1479 iso2127 K[loc][","][2127](r)
## iso2126 1480 1480 iso2126 K[loc][","][2126](r)
## iso2125 1481 1481 iso2125 K[loc][","][2125](r)
## iso2124 1482 1482 iso2124 K[loc][","][2124](r)
## iso2123 1483 1483 iso2123 K[loc][","][2123](r)
## iso2122 1484 1484 iso2122 K[loc][","][2122](r)
## iso2121 1485 1485 iso2121 K[loc][","][2121](r)
## iso2120 1486 1486 iso2120 K[loc][","][2120](r)
## iso2119 1487 1487 iso2119 K[loc][","][2119](r)
## iso2118 1488 1488 iso2118 K[loc][","][2118](r)
## iso2117 1489 1489 iso2117 K[loc][","][2117](r)
## iso2116 1490 1490 iso2116 K[loc][","][2116](r)
## iso2115 1491 1491 iso2115 K[loc][","][2115](r)
## iso2114 1492 1492 iso2114 K[loc][","][2114](r)
## iso2113 1493 1493 iso2113 K[loc][","][2113](r)
## iso2112 1494 1494 iso2112 K[loc][","][2112](r)
## iso2111 1495 1495 iso2111 K[loc][","][2111](r)
## iso2110 1496 1496 iso2110 K[loc][","][2110](r)
## iso2109 1497 1497 iso2109 K[loc][","][2109](r)
## iso2108 1498 1498 iso2108 K[loc][","][2108](r)
## iso2107 1499 1499 iso2107 K[loc][","][2107](r)
## iso2106 1500 1500 iso2106 K[loc][","][2106](r)
## iso2105 1501 1501 iso2105 K[loc][","][2105](r)
## iso2104 1502 1502 iso2104 K[loc][","][2104](r)
## iso2103 1503 1503 iso2103 K[loc][","][2103](r)
## iso2102 1504 1504 iso2102 K[loc][","][2102](r)
## iso2101 1505 1505 iso2101 K[loc][","][2101](r)
## iso2100 1506 1506 iso2100 K[loc][","][2100](r)
## iso2099 1507 1507 iso2099 K[loc][","][2099](r)
## iso2098 1508 1508 iso2098 K[loc][","][2098](r)
## iso2097 1509 1509 iso2097 K[loc][","][2097](r)
## iso2096 1510 1510 iso2096 K[loc][","][2096](r)
## iso2095 1511 1511 iso2095 K[loc][","][2095](r)
## iso2094 1512 1512 iso2094 K[loc][","][2094](r)
## iso2093 1513 1513 iso2093 K[loc][","][2093](r)
## iso2092 1514 1514 iso2092 K[loc][","][2092](r)
## iso2091 1515 1515 iso2091 K[loc][","][2091](r)
## iso2090 1516 1516 iso2090 K[loc][","][2090](r)
## iso2089 1517 1517 iso2089 K[loc][","][2089](r)
## iso2088 1518 1518 iso2088 K[loc][","][2088](r)
## iso2087 1519 1519 iso2087 K[loc][","][2087](r)
## iso2086 1520 1520 iso2086 K[loc][","][2086](r)
## iso2085 1521 1521 iso2085 K[loc][","][2085](r)
## iso2084 1522 1522 iso2084 K[loc][","][2084](r)
## iso2083 1523 1523 iso2083 K[loc][","][2083](r)
## iso2082 1524 1524 iso2082 K[loc][","][2082](r)
## iso2081 1525 1525 iso2081 K[loc][","][2081](r)
## iso2080 1526 1526 iso2080 K[loc][","][2080](r)
## iso2079 1527 1527 iso2079 K[loc][","][2079](r)
## iso2078 1528 1528 iso2078 K[loc][","][2078](r)
## iso2077 1529 1529 iso2077 K[loc][","][2077](r)
## iso2076 1530 1530 iso2076 K[loc][","][2076](r)
## iso2075 1531 1531 iso2075 K[loc][","][2075](r)
## iso2074 1532 1532 iso2074 K[loc][","][2074](r)
## iso2073 1533 1533 iso2073 K[loc][","][2073](r)
## iso2072 1534 1534 iso2072 K[loc][","][2072](r)
## iso2071 1535 1535 iso2071 K[loc][","][2071](r)
## iso2070 1536 1536 iso2070 K[loc][","][2070](r)
## iso2069 1537 1537 iso2069 K[loc][","][2069](r)
## iso2068 1538 1538 iso2068 K[loc][","][2068](r)
## iso2067 1539 1539 iso2067 K[loc][","][2067](r)
## iso2066 1540 1540 iso2066 K[loc][","][2066](r)
## iso2065 1541 1541 iso2065 K[loc][","][2065](r)
## iso2064 1542 1542 iso2064 K[loc][","][2064](r)
## iso2063 1543 1543 iso2063 K[loc][","][2063](r)
## iso2062 1544 1544 iso2062 K[loc][","][2062](r)
## iso2061 1545 1545 iso2061 K[loc][","][2061](r)
## iso2060 1546 1546 iso2060 K[loc][","][2060](r)
## iso2059 1547 1547 iso2059 K[loc][","][2059](r)
## iso2058 1548 1548 iso2058 K[loc][","][2058](r)
## iso2057 1549 1549 iso2057 K[loc][","][2057](r)
## iso2056 1550 1550 iso2056 K[loc][","][2056](r)
## iso2055 1551 1551 iso2055 K[loc][","][2055](r)
## iso2054 1552 1552 iso2054 K[loc][","][2054](r)
## iso2053 1553 1553 iso2053 K[loc][","][2053](r)
## iso2052 1554 1554 iso2052 K[loc][","][2052](r)
## iso2051 1555 1555 iso2051 K[loc][","][2051](r)
## iso2050 1556 1556 iso2050 K[loc][","][2050](r)
## iso2049 1557 1557 iso2049 K[loc][","][2049](r)
## iso2048 1558 1558 iso2048 K[loc][","][2048](r)
## iso2047 1559 1559 iso2047 K[loc][","][2047](r)
## iso2046 1560 1560 iso2046 K[loc][","][2046](r)
## iso2045 1561 1561 iso2045 K[loc][","][2045](r)
## iso2044 1562 1562 iso2044 K[loc][","][2044](r)
## iso2043 1563 1563 iso2043 K[loc][","][2043](r)
## iso2042 1564 1564 iso2042 K[loc][","][2042](r)
## iso2041 1565 1565 iso2041 K[loc][","][2041](r)
## iso2040 1566 1566 iso2040 K[loc][","][2040](r)
## iso2039 1567 1567 iso2039 K[loc][","][2039](r)
## iso2038 1568 1568 iso2038 K[loc][","][2038](r)
## iso2037 1569 1569 iso2037 K[loc][","][2037](r)
## iso2036 1570 1570 iso2036 K[loc][","][2036](r)
## iso2035 1571 1571 iso2035 K[loc][","][2035](r)
## iso2034 1572 1572 iso2034 K[loc][","][2034](r)
## iso2033 1573 1573 iso2033 K[loc][","][2033](r)
## iso2032 1574 1574 iso2032 K[loc][","][2032](r)
## iso2031 1575 1575 iso2031 K[loc][","][2031](r)
## iso2030 1576 1576 iso2030 K[loc][","][2030](r)
## iso2029 1577 1577 iso2029 K[loc][","][2029](r)
## iso2028 1578 1578 iso2028 K[loc][","][2028](r)
## iso2027 1579 1579 iso2027 K[loc][","][2027](r)
## iso2026 1580 1580 iso2026 K[loc][","][2026](r)
## iso2025 1581 1581 iso2025 K[loc][","][2025](r)
## iso2024 1582 1582 iso2024 K[loc][","][2024](r)
## iso2023 1583 1583 iso2023 K[loc][","][2023](r)
## iso2022 1584 1584 iso2022 K[loc][","][2022](r)
## iso2021 1585 1585 iso2021 K[loc][","][2021](r)
## iso2020 1586 1586 iso2020 K[loc][","][2020](r)
## iso2019 1587 1587 iso2019 K[loc][","][2019](r)
## iso2018 1588 1588 iso2018 K[loc][","][2018](r)
## iso2017 1589 1589 iso2017 K[loc][","][2017](r)
## iso2016 1590 1590 iso2016 K[loc][","][2016](r)
## iso2015 1591 1591 iso2015 K[loc][","][2015](r)
## iso2014 1592 1592 iso2014 K[loc][","][2014](r)
## iso2013 1593 1593 iso2013 K[loc][","][2013](r)
## iso2012 1594 1594 iso2012 K[loc][","][2012](r)
## iso2011 1595 1595 iso2011 K[loc][","][2011](r)
## iso2010 1596 1596 iso2010 K[loc][","][2010](r)
## iso2009 1597 1597 iso2009 K[loc][","][2009](r)
## iso2008 1598 1598 iso2008 K[loc][","][2008](r)
## iso2007 1599 1599 iso2007 K[loc][","][2007](r)
## iso2006 1600 1600 iso2006 K[loc][","][2006](r)
## iso2005 1601 1601 iso2005 K[loc][","][2005](r)
## iso2004 1602 1602 iso2004 K[loc][","][2004](r)
## iso2003 1603 1603 iso2003 K[loc][","][2003](r)
## iso2002 1604 1604 iso2002 K[loc][","][2002](r)
## iso2001 1605 1605 iso2001 K[loc][","][2001](r)
## iso2000 1606 1606 iso2000 K[loc][","][2000](r)
## iso1999 1607 1607 iso1999 K[loc][","][1999](r)
## iso1998 1608 1608 iso1998 K[loc][","][1998](r)
## iso1997 1609 1609 iso1997 K[loc][","][1997](r)
## iso1996 1610 1610 iso1996 K[loc][","][1996](r)
## iso1995 1611 1611 iso1995 K[loc][","][1995](r)
## iso1994 1612 1612 iso1994 K[loc][","][1994](r)
## iso1993 1613 1613 iso1993 K[loc][","][1993](r)
## iso1992 1614 1614 iso1992 K[loc][","][1992](r)
## iso1991 1615 1615 iso1991 K[loc][","][1991](r)
## iso1990 1616 1616 iso1990 K[loc][","][1990](r)
## iso1989 1617 1617 iso1989 K[loc][","][1989](r)
## iso1988 1618 1618 iso1988 K[loc][","][1988](r)
## iso1987 1619 1619 iso1987 K[loc][","][1987](r)
## iso1986 1620 1620 iso1986 K[loc][","][1986](r)
## iso1985 1621 1621 iso1985 K[loc][","][1985](r)
## iso1984 1622 1622 iso1984 K[loc][","][1984](r)
## iso1983 1623 1623 iso1983 K[loc][","][1983](r)
## iso1982 1624 1624 iso1982 K[loc][","][1982](r)
## iso1981 1625 1625 iso1981 K[loc][","][1981](r)
## iso1980 1626 1626 iso1980 K[loc][","][1980](r)
## iso1979 1627 1627 iso1979 K[loc][","][1979](r)
## iso1978 1628 1628 iso1978 K[loc][","][1978](r)
## iso1977 1629 1629 iso1977 K[loc][","][1977](r)
## iso1976 1630 1630 iso1976 K[loc][","][1976](r)
## iso1975 1631 1631 iso1975 K[loc][","][1975](r)
## iso1974 1632 1632 iso1974 K[loc][","][1974](r)
## iso1973 1633 1633 iso1973 K[loc][","][1973](r)
## iso1972 1634 1634 iso1972 K[loc][","][1972](r)
## iso1971 1635 1635 iso1971 K[loc][","][1971](r)
## iso1970 1636 1636 iso1970 K[loc][","][1970](r)
## iso1969 1637 1637 iso1969 K[loc][","][1969](r)
## iso1968 1638 1638 iso1968 K[loc][","][1968](r)
## iso1967 1639 1639 iso1967 K[loc][","][1967](r)
## iso1966 1640 1640 iso1966 K[loc][","][1966](r)
## iso1965 1641 1641 iso1965 K[loc][","][1965](r)
## iso1964 1642 1642 iso1964 K[loc][","][1964](r)
## iso1963 1643 1643 iso1963 K[loc][","][1963](r)
## iso1962 1644 1644 iso1962 K[loc][","][1962](r)
## iso1961 1645 1645 iso1961 K[loc][","][1961](r)
## iso1960 1646 1646 iso1960 K[loc][","][1960](r)
## iso1959 1647 1647 iso1959 K[loc][","][1959](r)
## iso1958 1648 1648 iso1958 K[loc][","][1958](r)
## iso1957 1649 1649 iso1957 K[loc][","][1957](r)
## iso1956 1650 1650 iso1956 K[loc][","][1956](r)
## iso1955 1651 1651 iso1955 K[loc][","][1955](r)
## iso1954 1652 1652 iso1954 K[loc][","][1954](r)
## iso1953 1653 1653 iso1953 K[loc][","][1953](r)
## iso1952 1654 1654 iso1952 K[loc][","][1952](r)
## iso1951 1655 1655 iso1951 K[loc][","][1951](r)
## iso1950 1656 1656 iso1950 K[loc][","][1950](r)
## iso1949 1657 1657 iso1949 K[loc][","][1949](r)
## iso1948 1658 1658 iso1948 K[loc][","][1948](r)
## iso1947 1659 1659 iso1947 K[loc][","][1947](r)
## iso1946 1660 1660 iso1946 K[loc][","][1946](r)
## iso1945 1661 1661 iso1945 K[loc][","][1945](r)
## iso1944 1662 1662 iso1944 K[loc][","][1944](r)
## iso1943 1663 1663 iso1943 K[loc][","][1943](r)
## iso1942 1664 1664 iso1942 K[loc][","][1942](r)
## iso1941 1665 1665 iso1941 K[loc][","][1941](r)
## iso1940 1666 1666 iso1940 K[loc][","][1940](r)
## iso1939 1667 1667 iso1939 K[loc][","][1939](r)
## iso1938 1668 1668 iso1938 K[loc][","][1938](r)
## iso1937 1669 1669 iso1937 K[loc][","][1937](r)
## iso1936 1670 1670 iso1936 K[loc][","][1936](r)
## iso1935 1671 1671 iso1935 K[loc][","][1935](r)
## iso1934 1672 1672 iso1934 K[loc][","][1934](r)
## iso1933 1673 1673 iso1933 K[loc][","][1933](r)
## iso1932 1674 1674 iso1932 K[loc][","][1932](r)
## iso1931 1675 1675 iso1931 K[loc][","][1931](r)
## iso1930 1676 1676 iso1930 K[loc][","][1930](r)
## iso1929 1677 1677 iso1929 K[loc][","][1929](r)
## iso1928 1678 1678 iso1928 K[loc][","][1928](r)
## iso1927 1679 1679 iso1927 K[loc][","][1927](r)
## iso1926 1680 1680 iso1926 K[loc][","][1926](r)
## iso1925 1681 1681 iso1925 K[loc][","][1925](r)
## iso1924 1682 1682 iso1924 K[loc][","][1924](r)
## iso1923 1683 1683 iso1923 K[loc][","][1923](r)
## iso1922 1684 1684 iso1922 K[loc][","][1922](r)
## iso1921 1685 1685 iso1921 K[loc][","][1921](r)
## iso1920 1686 1686 iso1920 K[loc][","][1920](r)
## iso1919 1687 1687 iso1919 K[loc][","][1919](r)
## iso1918 1688 1688 iso1918 K[loc][","][1918](r)
## iso1917 1689 1689 iso1917 K[loc][","][1917](r)
## iso1916 1690 1690 iso1916 K[loc][","][1916](r)
## iso1915 1691 1691 iso1915 K[loc][","][1915](r)
## iso1914 1692 1692 iso1914 K[loc][","][1914](r)
## iso1913 1693 1693 iso1913 K[loc][","][1913](r)
## iso1912 1694 1694 iso1912 K[loc][","][1912](r)
## iso1911 1695 1695 iso1911 K[loc][","][1911](r)
## iso1910 1696 1696 iso1910 K[loc][","][1910](r)
## iso1909 1697 1697 iso1909 K[loc][","][1909](r)
## iso1908 1698 1698 iso1908 K[loc][","][1908](r)
## iso1907 1699 1699 iso1907 K[loc][","][1907](r)
## iso1906 1700 1700 iso1906 K[loc][","][1906](r)
## iso1905 1701 1701 iso1905 K[loc][","][1905](r)
## iso1904 1702 1702 iso1904 K[loc][","][1904](r)
## iso1903 1703 1703 iso1903 K[loc][","][1903](r)
## iso1902 1704 1704 iso1902 K[loc][","][1902](r)
## iso1901 1705 1705 iso1901 K[loc][","][1901](r)
## iso1900 1706 1706 iso1900 K[loc][","][1900](r)
## iso1899 1707 1707 iso1899 K[loc][","][1899](r)
## iso1898 1708 1708 iso1898 K[loc][","][1898](r)
## iso1897 1709 1709 iso1897 K[loc][","][1897](r)
## iso1896 1710 1710 iso1896 K[loc][","][1896](r)
## iso1895 1711 1711 iso1895 K[loc][","][1895](r)
## iso1894 1712 1712 iso1894 K[loc][","][1894](r)
## iso1893 1713 1713 iso1893 K[loc][","][1893](r)
## iso1892 1714 1714 iso1892 K[loc][","][1892](r)
## iso1891 1715 1715 iso1891 K[loc][","][1891](r)
## iso1890 1716 1716 iso1890 K[loc][","][1890](r)
## iso1889 1717 1717 iso1889 K[loc][","][1889](r)
## iso1888 1718 1718 iso1888 K[loc][","][1888](r)
## iso1887 1719 1719 iso1887 K[loc][","][1887](r)
## iso1886 1720 1720 iso1886 K[loc][","][1886](r)
## iso1885 1721 1721 iso1885 K[loc][","][1885](r)
## iso1884 1722 1722 iso1884 K[loc][","][1884](r)
## iso1883 1723 1723 iso1883 K[loc][","][1883](r)
## iso1882 1724 1724 iso1882 K[loc][","][1882](r)
## iso1881 1725 1725 iso1881 K[loc][","][1881](r)
## iso1880 1726 1726 iso1880 K[loc][","][1880](r)
## iso1879 1727 1727 iso1879 K[loc][","][1879](r)
## iso1878 1728 1728 iso1878 K[loc][","][1878](r)
## iso1877 1729 1729 iso1877 K[loc][","][1877](r)
## iso1876 1730 1730 iso1876 K[loc][","][1876](r)
## iso1875 1731 1731 iso1875 K[loc][","][1875](r)
## iso1874 1732 1732 iso1874 K[loc][","][1874](r)
## iso1873 1733 1733 iso1873 K[loc][","][1873](r)
## iso1872 1734 1734 iso1872 K[loc][","][1872](r)
## iso1871 1735 1735 iso1871 K[loc][","][1871](r)
## iso1870 1736 1736 iso1870 K[loc][","][1870](r)
## iso1869 1737 1737 iso1869 K[loc][","][1869](r)
## iso1868 1738 1738 iso1868 K[loc][","][1868](r)
## iso1867 1739 1739 iso1867 K[loc][","][1867](r)
## iso1866 1740 1740 iso1866 K[loc][","][1866](r)
## iso1865 1741 1741 iso1865 K[loc][","][1865](r)
## iso1864 1742 1742 iso1864 K[loc][","][1864](r)
## iso1863 1743 1743 iso1863 K[loc][","][1863](r)
## iso1862 1744 1744 iso1862 K[loc][","][1862](r)
## iso1861 1745 1745 iso1861 K[loc][","][1861](r)
## iso1860 1746 1746 iso1860 K[loc][","][1860](r)
## iso1859 1747 1747 iso1859 K[loc][","][1859](r)
## iso1858 1748 1748 iso1858 K[loc][","][1858](r)
## iso1857 1749 1749 iso1857 K[loc][","][1857](r)
## iso1856 1750 1750 iso1856 K[loc][","][1856](r)
## iso1855 1751 1751 iso1855 K[loc][","][1855](r)
## iso1854 1752 1752 iso1854 K[loc][","][1854](r)
## iso1853 1753 1753 iso1853 K[loc][","][1853](r)
## iso1852 1754 1754 iso1852 K[loc][","][1852](r)
## iso1851 1755 1755 iso1851 K[loc][","][1851](r)
## iso1850 1756 1756 iso1850 K[loc][","][1850](r)
## iso1849 1757 1757 iso1849 K[loc][","][1849](r)
## iso1848 1758 1758 iso1848 K[loc][","][1848](r)
## iso1847 1759 1759 iso1847 K[loc][","][1847](r)
## iso1846 1760 1760 iso1846 K[loc][","][1846](r)
## iso1845 1761 1761 iso1845 K[loc][","][1845](r)
## iso1844 1762 1762 iso1844 K[loc][","][1844](r)
## iso1843 1763 1763 iso1843 K[loc][","][1843](r)
## iso1842 1764 1764 iso1842 K[loc][","][1842](r)
## iso1841 1765 1765 iso1841 K[loc][","][1841](r)
## iso1840 1766 1766 iso1840 K[loc][","][1840](r)
## iso1839 1767 1767 iso1839 K[loc][","][1839](r)
## iso1838 1768 1768 iso1838 K[loc][","][1838](r)
## iso1837 1769 1769 iso1837 K[loc][","][1837](r)
## iso1836 1770 1770 iso1836 K[loc][","][1836](r)
## iso1835 1771 1771 iso1835 K[loc][","][1835](r)
## iso1834 1772 1772 iso1834 K[loc][","][1834](r)
## iso1833 1773 1773 iso1833 K[loc][","][1833](r)
## iso1832 1774 1774 iso1832 K[loc][","][1832](r)
## iso1831 1775 1775 iso1831 K[loc][","][1831](r)
## iso1830 1776 1776 iso1830 K[loc][","][1830](r)
## iso1829 1777 1777 iso1829 K[loc][","][1829](r)
## iso1828 1778 1778 iso1828 K[loc][","][1828](r)
## iso1827 1779 1779 iso1827 K[loc][","][1827](r)
## iso1826 1780 1780 iso1826 K[loc][","][1826](r)
## iso1825 1781 1781 iso1825 K[loc][","][1825](r)
## iso1824 1782 1782 iso1824 K[loc][","][1824](r)
## iso1823 1783 1783 iso1823 K[loc][","][1823](r)
## iso1822 1784 1784 iso1822 K[loc][","][1822](r)
## iso1821 1785 1785 iso1821 K[loc][","][1821](r)
## iso1820 1786 1786 iso1820 K[loc][","][1820](r)
## iso1819 1787 1787 iso1819 K[loc][","][1819](r)
## iso1818 1788 1788 iso1818 K[loc][","][1818](r)
## iso1817 1789 1789 iso1817 K[loc][","][1817](r)
## iso1816 1790 1790 iso1816 K[loc][","][1816](r)
## iso1815 1791 1791 iso1815 K[loc][","][1815](r)
## iso1814 1792 1792 iso1814 K[loc][","][1814](r)
## iso1813 1793 1793 iso1813 K[loc][","][1813](r)
## iso1812 1794 1794 iso1812 K[loc][","][1812](r)
## iso1811 1795 1795 iso1811 K[loc][","][1811](r)
## iso1810 1796 1796 iso1810 K[loc][","][1810](r)
## iso1809 1797 1797 iso1809 K[loc][","][1809](r)
## iso1808 1798 1798 iso1808 K[loc][","][1808](r)
## iso1807 1799 1799 iso1807 K[loc][","][1807](r)
## iso1806 1800 1800 iso1806 K[loc][","][1806](r)
## iso1805 1801 1801 iso1805 K[loc][","][1805](r)
## iso1804 1802 1802 iso1804 K[loc][","][1804](r)
## iso1803 1803 1803 iso1803 K[loc][","][1803](r)
## iso1802 1804 1804 iso1802 K[loc][","][1802](r)
## iso1801 1805 1805 iso1801 K[loc][","][1801](r)
## iso1800 1806 1806 iso1800 K[loc][","][1800](r)
## iso1799 1807 1807 iso1799 K[loc][","][1799](r)
## iso1798 1808 1808 iso1798 K[loc][","][1798](r)
## iso1797 1809 1809 iso1797 K[loc][","][1797](r)
## iso1796 1810 1810 iso1796 K[loc][","][1796](r)
## iso1795 1811 1811 iso1795 K[loc][","][1795](r)
## iso1794 1812 1812 iso1794 K[loc][","][1794](r)
## iso1793 1813 1813 iso1793 K[loc][","][1793](r)
## iso1792 1814 1814 iso1792 K[loc][","][1792](r)
## iso1791 1815 1815 iso1791 K[loc][","][1791](r)
## iso1790 1816 1816 iso1790 K[loc][","][1790](r)
## iso1789 1817 1817 iso1789 K[loc][","][1789](r)
## iso1788 1818 1818 iso1788 K[loc][","][1788](r)
## iso1787 1819 1819 iso1787 K[loc][","][1787](r)
## iso1786 1820 1820 iso1786 K[loc][","][1786](r)
## iso1785 1821 1821 iso1785 K[loc][","][1785](r)
## iso1784 1822 1822 iso1784 K[loc][","][1784](r)
## iso1783 1823 1823 iso1783 K[loc][","][1783](r)
## iso1782 1824 1824 iso1782 K[loc][","][1782](r)
## iso1781 1825 1825 iso1781 K[loc][","][1781](r)
## iso1780 1826 1826 iso1780 K[loc][","][1780](r)
## iso1779 1827 1827 iso1779 K[loc][","][1779](r)
## iso1778 1828 1828 iso1778 K[loc][","][1778](r)
## iso1777 1829 1829 iso1777 K[loc][","][1777](r)
## iso1776 1830 1830 iso1776 K[loc][","][1776](r)
## iso1775 1831 1831 iso1775 K[loc][","][1775](r)
## iso1774 1832 1832 iso1774 K[loc][","][1774](r)
## iso1773 1833 1833 iso1773 K[loc][","][1773](r)
## iso1772 1834 1834 iso1772 K[loc][","][1772](r)
## iso1771 1835 1835 iso1771 K[loc][","][1771](r)
## iso1770 1836 1836 iso1770 K[loc][","][1770](r)
## iso1769 1837 1837 iso1769 K[loc][","][1769](r)
## iso1768 1838 1838 iso1768 K[loc][","][1768](r)
## iso1767 1839 1839 iso1767 K[loc][","][1767](r)
## iso1766 1840 1840 iso1766 K[loc][","][1766](r)
## iso1765 1841 1841 iso1765 K[loc][","][1765](r)
## iso1764 1842 1842 iso1764 K[loc][","][1764](r)
## iso1763 1843 1843 iso1763 K[loc][","][1763](r)
## iso1762 1844 1844 iso1762 K[loc][","][1762](r)
## iso1761 1845 1845 iso1761 K[loc][","][1761](r)
## iso1760 1846 1846 iso1760 K[loc][","][1760](r)
## iso1759 1847 1847 iso1759 K[loc][","][1759](r)
## iso1758 1848 1848 iso1758 K[loc][","][1758](r)
## iso1757 1849 1849 iso1757 K[loc][","][1757](r)
## iso1756 1850 1850 iso1756 K[loc][","][1756](r)
## iso1755 1851 1851 iso1755 K[loc][","][1755](r)
## iso1754 1852 1852 iso1754 K[loc][","][1754](r)
## iso1753 1853 1853 iso1753 K[loc][","][1753](r)
## iso1752 1854 1854 iso1752 K[loc][","][1752](r)
## iso1751 1855 1855 iso1751 K[loc][","][1751](r)
## iso1750 1856 1856 iso1750 K[loc][","][1750](r)
## iso1749 1857 1857 iso1749 K[loc][","][1749](r)
## iso1748 1858 1858 iso1748 K[loc][","][1748](r)
## iso1747 1859 1859 iso1747 K[loc][","][1747](r)
## iso1746 1860 1860 iso1746 K[loc][","][1746](r)
## iso1745 1861 1861 iso1745 K[loc][","][1745](r)
## iso1744 1862 1862 iso1744 K[loc][","][1744](r)
## iso1743 1863 1863 iso1743 K[loc][","][1743](r)
## iso1742 1864 1864 iso1742 K[loc][","][1742](r)
## iso1741 1865 1865 iso1741 K[loc][","][1741](r)
## iso1740 1866 1866 iso1740 K[loc][","][1740](r)
## iso1739 1867 1867 iso1739 K[loc][","][1739](r)
## iso1738 1868 1868 iso1738 K[loc][","][1738](r)
## iso1737 1869 1869 iso1737 K[loc][","][1737](r)
## iso1736 1870 1870 iso1736 K[loc][","][1736](r)
## iso1735 1871 1871 iso1735 K[loc][","][1735](r)
## iso1734 1872 1872 iso1734 K[loc][","][1734](r)
## iso1733 1873 1873 iso1733 K[loc][","][1733](r)
## iso1732 1874 1874 iso1732 K[loc][","][1732](r)
## iso1731 1875 1875 iso1731 K[loc][","][1731](r)
## iso1730 1876 1876 iso1730 K[loc][","][1730](r)
## iso1729 1877 1877 iso1729 K[loc][","][1729](r)
## iso1728 1878 1878 iso1728 K[loc][","][1728](r)
## iso1727 1879 1879 iso1727 K[loc][","][1727](r)
## iso1726 1880 1880 iso1726 K[loc][","][1726](r)
## iso1725 1881 1881 iso1725 K[loc][","][1725](r)
## iso1724 1882 1882 iso1724 K[loc][","][1724](r)
## iso1723 1883 1883 iso1723 K[loc][","][1723](r)
## iso1722 1884 1884 iso1722 K[loc][","][1722](r)
## iso1721 1885 1885 iso1721 K[loc][","][1721](r)
## iso1720 1886 1886 iso1720 K[loc][","][1720](r)
## iso1719 1887 1887 iso1719 K[loc][","][1719](r)
## iso1718 1888 1888 iso1718 K[loc][","][1718](r)
## iso1717 1889 1889 iso1717 K[loc][","][1717](r)
## iso1716 1890 1890 iso1716 K[loc][","][1716](r)
## iso1715 1891 1891 iso1715 K[loc][","][1715](r)
## iso1714 1892 1892 iso1714 K[loc][","][1714](r)
## iso1713 1893 1893 iso1713 K[loc][","][1713](r)
## iso1712 1894 1894 iso1712 K[loc][","][1712](r)
## iso1711 1895 1895 iso1711 K[loc][","][1711](r)
## iso1710 1896 1896 iso1710 K[loc][","][1710](r)
## iso1709 1897 1897 iso1709 K[loc][","][1709](r)
## iso1708 1898 1898 iso1708 K[loc][","][1708](r)
## iso1707 1899 1899 iso1707 K[loc][","][1707](r)
## iso1706 1900 1900 iso1706 K[loc][","][1706](r)
## iso1705 1901 1901 iso1705 K[loc][","][1705](r)
## iso1704 1902 1902 iso1704 K[loc][","][1704](r)
## iso1703 1903 1903 iso1703 K[loc][","][1703](r)
## iso1702 1904 1904 iso1702 K[loc][","][1702](r)
## iso1701 1905 1905 iso1701 K[loc][","][1701](r)
## iso1700 1906 1906 iso1700 K[loc][","][1700](r)
## iso1699 1907 1907 iso1699 K[loc][","][1699](r)
## iso1698 1908 1908 iso1698 K[loc][","][1698](r)
## iso1697 1909 1909 iso1697 K[loc][","][1697](r)
## iso1696 1910 1910 iso1696 K[loc][","][1696](r)
## iso1695 1911 1911 iso1695 K[loc][","][1695](r)
## iso1694 1912 1912 iso1694 K[loc][","][1694](r)
## iso1693 1913 1913 iso1693 K[loc][","][1693](r)
## iso1692 1914 1914 iso1692 K[loc][","][1692](r)
## iso1691 1915 1915 iso1691 K[loc][","][1691](r)
## iso1690 1916 1916 iso1690 K[loc][","][1690](r)
## iso1689 1917 1917 iso1689 K[loc][","][1689](r)
## iso1688 1918 1918 iso1688 K[loc][","][1688](r)
## iso1687 1919 1919 iso1687 K[loc][","][1687](r)
## iso1686 1920 1920 iso1686 K[loc][","][1686](r)
## iso1685 1921 1921 iso1685 K[loc][","][1685](r)
## iso1684 1922 1922 iso1684 K[loc][","][1684](r)
## iso1683 1923 1923 iso1683 K[loc][","][1683](r)
## iso1682 1924 1924 iso1682 K[loc][","][1682](r)
## iso1681 1925 1925 iso1681 K[loc][","][1681](r)
## iso1680 1926 1926 iso1680 K[loc][","][1680](r)
## iso1679 1927 1927 iso1679 K[loc][","][1679](r)
## iso1678 1928 1928 iso1678 K[loc][","][1678](r)
## iso1677 1929 1929 iso1677 K[loc][","][1677](r)
## iso1676 1930 1930 iso1676 K[loc][","][1676](r)
## iso1675 1931 1931 iso1675 K[loc][","][1675](r)
## iso1674 1932 1932 iso1674 K[loc][","][1674](r)
## iso1673 1933 1933 iso1673 K[loc][","][1673](r)
## iso1672 1934 1934 iso1672 K[loc][","][1672](r)
## iso1671 1935 1935 iso1671 K[loc][","][1671](r)
## iso1670 1936 1936 iso1670 K[loc][","][1670](r)
## iso1669 1937 1937 iso1669 K[loc][","][1669](r)
## iso1668 1938 1938 iso1668 K[loc][","][1668](r)
## iso1667 1939 1939 iso1667 K[loc][","][1667](r)
## iso1666 1940 1940 iso1666 K[loc][","][1666](r)
## iso1665 1941 1941 iso1665 K[loc][","][1665](r)
## iso1664 1942 1942 iso1664 K[loc][","][1664](r)
## iso1663 1943 1943 iso1663 K[loc][","][1663](r)
## iso1662 1944 1944 iso1662 K[loc][","][1662](r)
## iso1661 1945 1945 iso1661 K[loc][","][1661](r)
## iso1660 1946 1946 iso1660 K[loc][","][1660](r)
## iso1659 1947 1947 iso1659 K[loc][","][1659](r)
## iso1658 1948 1948 iso1658 K[loc][","][1658](r)
## iso1657 1949 1949 iso1657 K[loc][","][1657](r)
## iso1656 1950 1950 iso1656 K[loc][","][1656](r)
## iso1655 1951 1951 iso1655 K[loc][","][1655](r)
## iso1654 1952 1952 iso1654 K[loc][","][1654](r)
## iso1653 1953 1953 iso1653 K[loc][","][1653](r)
## iso1652 1954 1954 iso1652 K[loc][","][1652](r)
## iso1651 1955 1955 iso1651 K[loc][","][1651](r)
## iso1650 1956 1956 iso1650 K[loc][","][1650](r)
## iso1649 1957 1957 iso1649 K[loc][","][1649](r)
## iso1648 1958 1958 iso1648 K[loc][","][1648](r)
## iso1647 1959 1959 iso1647 K[loc][","][1647](r)
## iso1646 1960 1960 iso1646 K[loc][","][1646](r)
## iso1645 1961 1961 iso1645 K[loc][","][1645](r)
## iso1644 1962 1962 iso1644 K[loc][","][1644](r)
## iso1643 1963 1963 iso1643 K[loc][","][1643](r)
## iso1642 1964 1964 iso1642 K[loc][","][1642](r)
## iso1641 1965 1965 iso1641 K[loc][","][1641](r)
## iso1640 1966 1966 iso1640 K[loc][","][1640](r)
## iso1639 1967 1967 iso1639 K[loc][","][1639](r)
## iso1638 1968 1968 iso1638 K[loc][","][1638](r)
## iso1637 1969 1969 iso1637 K[loc][","][1637](r)
## iso1636 1970 1970 iso1636 K[loc][","][1636](r)
## iso1635 1971 1971 iso1635 K[loc][","][1635](r)
## iso1634 1972 1972 iso1634 K[loc][","][1634](r)
## iso1633 1973 1973 iso1633 K[loc][","][1633](r)
## iso1632 1974 1974 iso1632 K[loc][","][1632](r)
## iso1631 1975 1975 iso1631 K[loc][","][1631](r)
## iso1630 1976 1976 iso1630 K[loc][","][1630](r)
## iso1629 1977 1977 iso1629 K[loc][","][1629](r)
## iso1628 1978 1978 iso1628 K[loc][","][1628](r)
## iso1627 1979 1979 iso1627 K[loc][","][1627](r)
## iso1626 1980 1980 iso1626 K[loc][","][1626](r)
## iso1625 1981 1981 iso1625 K[loc][","][1625](r)
## iso1624 1982 1982 iso1624 K[loc][","][1624](r)
## iso1623 1983 1983 iso1623 K[loc][","][1623](r)
## iso1622 1984 1984 iso1622 K[loc][","][1622](r)
## iso1621 1985 1985 iso1621 K[loc][","][1621](r)
## iso1620 1986 1986 iso1620 K[loc][","][1620](r)
## iso1619 1987 1987 iso1619 K[loc][","][1619](r)
## iso1618 1988 1988 iso1618 K[loc][","][1618](r)
## iso1617 1989 1989 iso1617 K[loc][","][1617](r)
## iso1616 1990 1990 iso1616 K[loc][","][1616](r)
## iso1615 1991 1991 iso1615 K[loc][","][1615](r)
## iso1614 1992 1992 iso1614 K[loc][","][1614](r)
## iso1613 1993 1993 iso1613 K[loc][","][1613](r)
## iso1612 1994 1994 iso1612 K[loc][","][1612](r)
## iso1611 1995 1995 iso1611 K[loc][","][1611](r)
## iso1610 1996 1996 iso1610 K[loc][","][1610](r)
## iso1609 1997 1997 iso1609 K[loc][","][1609](r)
## iso1608 1998 1998 iso1608 K[loc][","][1608](r)
## iso1607 1999 1999 iso1607 K[loc][","][1607](r)
## iso1606 2000 2000 iso1606 K[loc][","][1606](r)
## iso1605 2001 2001 iso1605 K[loc][","][1605](r)
## iso1604 2002 2002 iso1604 K[loc][","][1604](r)
## iso1603 2003 2003 iso1603 K[loc][","][1603](r)
## iso1602 2004 2004 iso1602 K[loc][","][1602](r)
## iso1601 2005 2005 iso1601 K[loc][","][1601](r)
## iso1600 2006 2006 iso1600 K[loc][","][1600](r)
## iso1599 2007 2007 iso1599 K[loc][","][1599](r)
## iso1598 2008 2008 iso1598 K[loc][","][1598](r)
## iso1597 2009 2009 iso1597 K[loc][","][1597](r)
## iso1596 2010 2010 iso1596 K[loc][","][1596](r)
## iso1595 2011 2011 iso1595 K[loc][","][1595](r)
## iso1594 2012 2012 iso1594 K[loc][","][1594](r)
## iso1593 2013 2013 iso1593 K[loc][","][1593](r)
## iso1592 2014 2014 iso1592 K[loc][","][1592](r)
## iso1591 2015 2015 iso1591 K[loc][","][1591](r)
## iso1590 2016 2016 iso1590 K[loc][","][1590](r)
## iso1589 2017 2017 iso1589 K[loc][","][1589](r)
## iso1588 2018 2018 iso1588 K[loc][","][1588](r)
## iso1587 2019 2019 iso1587 K[loc][","][1587](r)
## iso1586 2020 2020 iso1586 K[loc][","][1586](r)
## iso1585 2021 2021 iso1585 K[loc][","][1585](r)
## iso1584 2022 2022 iso1584 K[loc][","][1584](r)
## iso1583 2023 2023 iso1583 K[loc][","][1583](r)
## iso1582 2024 2024 iso1582 K[loc][","][1582](r)
## iso1581 2025 2025 iso1581 K[loc][","][1581](r)
## iso1580 2026 2026 iso1580 K[loc][","][1580](r)
## iso1579 2027 2027 iso1579 K[loc][","][1579](r)
## iso1578 2028 2028 iso1578 K[loc][","][1578](r)
## iso1577 2029 2029 iso1577 K[loc][","][1577](r)
## iso1576 2030 2030 iso1576 K[loc][","][1576](r)
## iso1575 2031 2031 iso1575 K[loc][","][1575](r)
## iso1574 2032 2032 iso1574 K[loc][","][1574](r)
## iso1573 2033 2033 iso1573 K[loc][","][1573](r)
## iso1572 2034 2034 iso1572 K[loc][","][1572](r)
## iso1571 2035 2035 iso1571 K[loc][","][1571](r)
## iso1570 2036 2036 iso1570 K[loc][","][1570](r)
## iso1569 2037 2037 iso1569 K[loc][","][1569](r)
## iso1568 2038 2038 iso1568 K[loc][","][1568](r)
## iso1567 2039 2039 iso1567 K[loc][","][1567](r)
## iso1566 2040 2040 iso1566 K[loc][","][1566](r)
## iso1565 2041 2041 iso1565 K[loc][","][1565](r)
## iso1564 2042 2042 iso1564 K[loc][","][1564](r)
## iso1563 2043 2043 iso1563 K[loc][","][1563](r)
## iso1562 2044 2044 iso1562 K[loc][","][1562](r)
## iso1561 2045 2045 iso1561 K[loc][","][1561](r)
## iso1560 2046 2046 iso1560 K[loc][","][1560](r)
## iso1559 2047 2047 iso1559 K[loc][","][1559](r)
## iso1558 2048 2048 iso1558 K[loc][","][1558](r)
## iso1557 2049 2049 iso1557 K[loc][","][1557](r)
## iso1556 2050 2050 iso1556 K[loc][","][1556](r)
## iso1555 2051 2051 iso1555 K[loc][","][1555](r)
## iso1554 2052 2052 iso1554 K[loc][","][1554](r)
## iso1553 2053 2053 iso1553 K[loc][","][1553](r)
## iso1552 2054 2054 iso1552 K[loc][","][1552](r)
## iso1551 2055 2055 iso1551 K[loc][","][1551](r)
## iso1550 2056 2056 iso1550 K[loc][","][1550](r)
## iso1549 2057 2057 iso1549 K[loc][","][1549](r)
## iso1548 2058 2058 iso1548 K[loc][","][1548](r)
## iso1547 2059 2059 iso1547 K[loc][","][1547](r)
## iso1546 2060 2060 iso1546 K[loc][","][1546](r)
## iso1545 2061 2061 iso1545 K[loc][","][1545](r)
## iso1544 2062 2062 iso1544 K[loc][","][1544](r)
## iso1543 2063 2063 iso1543 K[loc][","][1543](r)
## iso1542 2064 2064 iso1542 K[loc][","][1542](r)
## iso1541 2065 2065 iso1541 K[loc][","][1541](r)
## iso1540 2066 2066 iso1540 K[loc][","][1540](r)
## iso1539 2067 2067 iso1539 K[loc][","][1539](r)
## iso1538 2068 2068 iso1538 K[loc][","][1538](r)
## iso1537 2069 2069 iso1537 K[loc][","][1537](r)
## iso1536 2070 2070 iso1536 K[loc][","][1536](r)
## iso1535 2071 2071 iso1535 K[loc][","][1535](r)
## iso1534 2072 2072 iso1534 K[loc][","][1534](r)
## iso1533 2073 2073 iso1533 K[loc][","][1533](r)
## iso1532 2074 2074 iso1532 K[loc][","][1532](r)
## iso1531 2075 2075 iso1531 K[loc][","][1531](r)
## iso1530 2076 2076 iso1530 K[loc][","][1530](r)
## iso1529 2077 2077 iso1529 K[loc][","][1529](r)
## iso1528 2078 2078 iso1528 K[loc][","][1528](r)
## iso1527 2079 2079 iso1527 K[loc][","][1527](r)
## iso1526 2080 2080 iso1526 K[loc][","][1526](r)
## iso1525 2081 2081 iso1525 K[loc][","][1525](r)
## iso1524 2082 2082 iso1524 K[loc][","][1524](r)
## iso1523 2083 2083 iso1523 K[loc][","][1523](r)
## iso1522 2084 2084 iso1522 K[loc][","][1522](r)
## iso1521 2085 2085 iso1521 K[loc][","][1521](r)
## iso1520 2086 2086 iso1520 K[loc][","][1520](r)
## iso1519 2087 2087 iso1519 K[loc][","][1519](r)
## iso1518 2088 2088 iso1518 K[loc][","][1518](r)
## iso1517 2089 2089 iso1517 K[loc][","][1517](r)
## iso1516 2090 2090 iso1516 K[loc][","][1516](r)
## iso1515 2091 2091 iso1515 K[loc][","][1515](r)
## iso1514 2092 2092 iso1514 K[loc][","][1514](r)
## iso1513 2093 2093 iso1513 K[loc][","][1513](r)
## iso1512 2094 2094 iso1512 K[loc][","][1512](r)
## iso1511 2095 2095 iso1511 K[loc][","][1511](r)
## iso1510 2096 2096 iso1510 K[loc][","][1510](r)
## iso1509 2097 2097 iso1509 K[loc][","][1509](r)
## iso1508 2098 2098 iso1508 K[loc][","][1508](r)
## iso1507 2099 2099 iso1507 K[loc][","][1507](r)
## iso1506 2100 2100 iso1506 K[loc][","][1506](r)
## iso1505 2101 2101 iso1505 K[loc][","][1505](r)
## iso1504 2102 2102 iso1504 K[loc][","][1504](r)
## iso1503 2103 2103 iso1503 K[loc][","][1503](r)
## iso1502 2104 2104 iso1502 K[loc][","][1502](r)
## iso1501 2105 2105 iso1501 K[loc][","][1501](r)
## iso1500 2106 2106 iso1500 K[loc][","][1500](r)
## iso1499 2107 2107 iso1499 K[loc][","][1499](r)
## iso1498 2108 2108 iso1498 K[loc][","][1498](r)
## iso1497 2109 2109 iso1497 K[loc][","][1497](r)
## iso1496 2110 2110 iso1496 K[loc][","][1496](r)
## iso1495 2111 2111 iso1495 K[loc][","][1495](r)
## iso1494 2112 2112 iso1494 K[loc][","][1494](r)
## iso1493 2113 2113 iso1493 K[loc][","][1493](r)
## iso1492 2114 2114 iso1492 K[loc][","][1492](r)
## iso1491 2115 2115 iso1491 K[loc][","][1491](r)
## iso1490 2116 2116 iso1490 K[loc][","][1490](r)
## iso1489 2117 2117 iso1489 K[loc][","][1489](r)
## iso1488 2118 2118 iso1488 K[loc][","][1488](r)
## iso1487 2119 2119 iso1487 K[loc][","][1487](r)
## iso1486 2120 2120 iso1486 K[loc][","][1486](r)
## iso1485 2121 2121 iso1485 K[loc][","][1485](r)
## iso1484 2122 2122 iso1484 K[loc][","][1484](r)
## iso1483 2123 2123 iso1483 K[loc][","][1483](r)
## iso1482 2124 2124 iso1482 K[loc][","][1482](r)
## iso1481 2125 2125 iso1481 K[loc][","][1481](r)
## iso1480 2126 2126 iso1480 K[loc][","][1480](r)
## iso1479 2127 2127 iso1479 K[loc][","][1479](r)
## iso1478 2128 2128 iso1478 K[loc][","][1478](r)
## iso1477 2129 2129 iso1477 K[loc][","][1477](r)
## iso1476 2130 2130 iso1476 K[loc][","][1476](r)
## iso1475 2131 2131 iso1475 K[loc][","][1475](r)
## iso1474 2132 2132 iso1474 K[loc][","][1474](r)
## iso1473 2133 2133 iso1473 K[loc][","][1473](r)
## iso1472 2134 2134 iso1472 K[loc][","][1472](r)
## iso1471 2135 2135 iso1471 K[loc][","][1471](r)
## iso1470 2136 2136 iso1470 K[loc][","][1470](r)
## iso1469 2137 2137 iso1469 K[loc][","][1469](r)
## iso1468 2138 2138 iso1468 K[loc][","][1468](r)
## iso1467 2139 2139 iso1467 K[loc][","][1467](r)
## iso1466 2140 2140 iso1466 K[loc][","][1466](r)
## iso1465 2141 2141 iso1465 K[loc][","][1465](r)
## iso1464 2142 2142 iso1464 K[loc][","][1464](r)
## iso1463 2143 2143 iso1463 K[loc][","][1463](r)
## iso1462 2144 2144 iso1462 K[loc][","][1462](r)
## iso1461 2145 2145 iso1461 K[loc][","][1461](r)
## iso1460 2146 2146 iso1460 K[loc][","][1460](r)
## iso1459 2147 2147 iso1459 K[loc][","][1459](r)
## iso1458 2148 2148 iso1458 K[loc][","][1458](r)
## iso1457 2149 2149 iso1457 K[loc][","][1457](r)
## iso1456 2150 2150 iso1456 K[loc][","][1456](r)
## iso1455 2151 2151 iso1455 K[loc][","][1455](r)
## iso1454 2152 2152 iso1454 K[loc][","][1454](r)
## iso1453 2153 2153 iso1453 K[loc][","][1453](r)
## iso1452 2154 2154 iso1452 K[loc][","][1452](r)
## iso1451 2155 2155 iso1451 K[loc][","][1451](r)
## iso1450 2156 2156 iso1450 K[loc][","][1450](r)
## iso1449 2157 2157 iso1449 K[loc][","][1449](r)
## iso1448 2158 2158 iso1448 K[loc][","][1448](r)
## iso1447 2159 2159 iso1447 K[loc][","][1447](r)
## iso1446 2160 2160 iso1446 K[loc][","][1446](r)
## iso1445 2161 2161 iso1445 K[loc][","][1445](r)
## iso1444 2162 2162 iso1444 K[loc][","][1444](r)
## iso1443 2163 2163 iso1443 K[loc][","][1443](r)
## iso1442 2164 2164 iso1442 K[loc][","][1442](r)
## iso1441 2165 2165 iso1441 K[loc][","][1441](r)
## iso1440 2166 2166 iso1440 K[loc][","][1440](r)
## iso1439 2167 2167 iso1439 K[loc][","][1439](r)
## iso1438 2168 2168 iso1438 K[loc][","][1438](r)
## iso1437 2169 2169 iso1437 K[loc][","][1437](r)
## iso1436 2170 2170 iso1436 K[loc][","][1436](r)
## iso1435 2171 2171 iso1435 K[loc][","][1435](r)
## iso1434 2172 2172 iso1434 K[loc][","][1434](r)
## iso1433 2173 2173 iso1433 K[loc][","][1433](r)
## iso1432 2174 2174 iso1432 K[loc][","][1432](r)
## iso1431 2175 2175 iso1431 K[loc][","][1431](r)
## iso1430 2176 2176 iso1430 K[loc][","][1430](r)
## iso1429 2177 2177 iso1429 K[loc][","][1429](r)
## iso1428 2178 2178 iso1428 K[loc][","][1428](r)
## iso1427 2179 2179 iso1427 K[loc][","][1427](r)
## iso1426 2180 2180 iso1426 K[loc][","][1426](r)
## iso1425 2181 2181 iso1425 K[loc][","][1425](r)
## iso1424 2182 2182 iso1424 K[loc][","][1424](r)
## iso1423 2183 2183 iso1423 K[loc][","][1423](r)
## iso1422 2184 2184 iso1422 K[loc][","][1422](r)
## iso1421 2185 2185 iso1421 K[loc][","][1421](r)
## iso1420 2186 2186 iso1420 K[loc][","][1420](r)
## iso1419 2187 2187 iso1419 K[loc][","][1419](r)
## iso1418 2188 2188 iso1418 K[loc][","][1418](r)
## iso1417 2189 2189 iso1417 K[loc][","][1417](r)
## iso1416 2190 2190 iso1416 K[loc][","][1416](r)
## iso1415 2191 2191 iso1415 K[loc][","][1415](r)
## iso1414 2192 2192 iso1414 K[loc][","][1414](r)
## iso1413 2193 2193 iso1413 K[loc][","][1413](r)
## iso1412 2194 2194 iso1412 K[loc][","][1412](r)
## iso1411 2195 2195 iso1411 K[loc][","][1411](r)
## iso1410 2196 2196 iso1410 K[loc][","][1410](r)
## iso1409 2197 2197 iso1409 K[loc][","][1409](r)
## iso1408 2198 2198 iso1408 K[loc][","][1408](r)
## iso1407 2199 2199 iso1407 K[loc][","][1407](r)
## iso1406 2200 2200 iso1406 K[loc][","][1406](r)
## iso1405 2201 2201 iso1405 K[loc][","][1405](r)
## iso1404 2202 2202 iso1404 K[loc][","][1404](r)
## iso1403 2203 2203 iso1403 K[loc][","][1403](r)
## iso1402 2204 2204 iso1402 K[loc][","][1402](r)
## iso1401 2205 2205 iso1401 K[loc][","][1401](r)
## iso1400 2206 2206 iso1400 K[loc][","][1400](r)
## iso1399 2207 2207 iso1399 K[loc][","][1399](r)
## iso1398 2208 2208 iso1398 K[loc][","][1398](r)
## iso1397 2209 2209 iso1397 K[loc][","][1397](r)
## iso1396 2210 2210 iso1396 K[loc][","][1396](r)
## iso1395 2211 2211 iso1395 K[loc][","][1395](r)
## iso1394 2212 2212 iso1394 K[loc][","][1394](r)
## iso1393 2213 2213 iso1393 K[loc][","][1393](r)
## iso1392 2214 2214 iso1392 K[loc][","][1392](r)
## iso1391 2215 2215 iso1391 K[loc][","][1391](r)
## iso1390 2216 2216 iso1390 K[loc][","][1390](r)
## iso1389 2217 2217 iso1389 K[loc][","][1389](r)
## iso1388 2218 2218 iso1388 K[loc][","][1388](r)
## iso1387 2219 2219 iso1387 K[loc][","][1387](r)
## iso1386 2220 2220 iso1386 K[loc][","][1386](r)
## iso1385 2221 2221 iso1385 K[loc][","][1385](r)
## iso1384 2222 2222 iso1384 K[loc][","][1384](r)
## iso1383 2223 2223 iso1383 K[loc][","][1383](r)
## iso1382 2224 2224 iso1382 K[loc][","][1382](r)
## iso1381 2225 2225 iso1381 K[loc][","][1381](r)
## iso1380 2226 2226 iso1380 K[loc][","][1380](r)
## iso1379 2227 2227 iso1379 K[loc][","][1379](r)
## iso1378 2228 2228 iso1378 K[loc][","][1378](r)
## iso1377 2229 2229 iso1377 K[loc][","][1377](r)
## iso1376 2230 2230 iso1376 K[loc][","][1376](r)
## iso1375 2231 2231 iso1375 K[loc][","][1375](r)
## iso1374 2232 2232 iso1374 K[loc][","][1374](r)
## iso1373 2233 2233 iso1373 K[loc][","][1373](r)
## iso1372 2234 2234 iso1372 K[loc][","][1372](r)
## iso1371 2235 2235 iso1371 K[loc][","][1371](r)
## iso1370 2236 2236 iso1370 K[loc][","][1370](r)
## iso1369 2237 2237 iso1369 K[loc][","][1369](r)
## iso1368 2238 2238 iso1368 K[loc][","][1368](r)
## iso1367 2239 2239 iso1367 K[loc][","][1367](r)
## iso1366 2240 2240 iso1366 K[loc][","][1366](r)
## iso1365 2241 2241 iso1365 K[loc][","][1365](r)
## iso1364 2242 2242 iso1364 K[loc][","][1364](r)
## iso1363 2243 2243 iso1363 K[loc][","][1363](r)
## iso1362 2244 2244 iso1362 K[loc][","][1362](r)
## iso1361 2245 2245 iso1361 K[loc][","][1361](r)
## iso1360 2246 2246 iso1360 K[loc][","][1360](r)
## iso1359 2247 2247 iso1359 K[loc][","][1359](r)
## iso1358 2248 2248 iso1358 K[loc][","][1358](r)
## iso1357 2249 2249 iso1357 K[loc][","][1357](r)
## iso1356 2250 2250 iso1356 K[loc][","][1356](r)
## iso1355 2251 2251 iso1355 K[loc][","][1355](r)
## iso1354 2252 2252 iso1354 K[loc][","][1354](r)
## iso1353 2253 2253 iso1353 K[loc][","][1353](r)
## iso1352 2254 2254 iso1352 K[loc][","][1352](r)
## iso1351 2255 2255 iso1351 K[loc][","][1351](r)
## iso1350 2256 2256 iso1350 K[loc][","][1350](r)
## iso1349 2257 2257 iso1349 K[loc][","][1349](r)
## iso1348 2258 2258 iso1348 K[loc][","][1348](r)
## iso1347 2259 2259 iso1347 K[loc][","][1347](r)
## iso1346 2260 2260 iso1346 K[loc][","][1346](r)
## iso1345 2261 2261 iso1345 K[loc][","][1345](r)
## iso1344 2262 2262 iso1344 K[loc][","][1344](r)
## iso1343 2263 2263 iso1343 K[loc][","][1343](r)
## iso1342 2264 2264 iso1342 K[loc][","][1342](r)
## iso1341 2265 2265 iso1341 K[loc][","][1341](r)
## iso1340 2266 2266 iso1340 K[loc][","][1340](r)
## iso1339 2267 2267 iso1339 K[loc][","][1339](r)
## iso1338 2268 2268 iso1338 K[loc][","][1338](r)
## iso1337 2269 2269 iso1337 K[loc][","][1337](r)
## iso1336 2270 2270 iso1336 K[loc][","][1336](r)
## iso1335 2271 2271 iso1335 K[loc][","][1335](r)
## iso1334 2272 2272 iso1334 K[loc][","][1334](r)
## iso1333 2273 2273 iso1333 K[loc][","][1333](r)
## iso1332 2274 2274 iso1332 K[loc][","][1332](r)
## iso1331 2275 2275 iso1331 K[loc][","][1331](r)
## iso1330 2276 2276 iso1330 K[loc][","][1330](r)
## iso1329 2277 2277 iso1329 K[loc][","][1329](r)
## iso1328 2278 2278 iso1328 K[loc][","][1328](r)
## iso1327 2279 2279 iso1327 K[loc][","][1327](r)
## iso1326 2280 2280 iso1326 K[loc][","][1326](r)
## iso1325 2281 2281 iso1325 K[loc][","][1325](r)
## iso1324 2282 2282 iso1324 K[loc][","][1324](r)
## iso1323 2283 2283 iso1323 K[loc][","][1323](r)
## iso1322 2284 2284 iso1322 K[loc][","][1322](r)
## iso1321 2285 2285 iso1321 K[loc][","][1321](r)
## iso1320 2286 2286 iso1320 K[loc][","][1320](r)
## iso1319 2287 2287 iso1319 K[loc][","][1319](r)
## iso1318 2288 2288 iso1318 K[loc][","][1318](r)
## iso1317 2289 2289 iso1317 K[loc][","][1317](r)
## iso1316 2290 2290 iso1316 K[loc][","][1316](r)
## iso1315 2291 2291 iso1315 K[loc][","][1315](r)
## iso1314 2292 2292 iso1314 K[loc][","][1314](r)
## iso1313 2293 2293 iso1313 K[loc][","][1313](r)
## iso1312 2294 2294 iso1312 K[loc][","][1312](r)
## iso1311 2295 2295 iso1311 K[loc][","][1311](r)
## iso1310 2296 2296 iso1310 K[loc][","][1310](r)
## iso1309 2297 2297 iso1309 K[loc][","][1309](r)
## iso1308 2298 2298 iso1308 K[loc][","][1308](r)
## iso1307 2299 2299 iso1307 K[loc][","][1307](r)
## iso1306 2300 2300 iso1306 K[loc][","][1306](r)
## iso1305 2301 2301 iso1305 K[loc][","][1305](r)
## iso1304 2302 2302 iso1304 K[loc][","][1304](r)
## iso1303 2303 2303 iso1303 K[loc][","][1303](r)
## iso1302 2304 2304 iso1302 K[loc][","][1302](r)
## iso1301 2305 2305 iso1301 K[loc][","][1301](r)
## iso1300 2306 2306 iso1300 K[loc][","][1300](r)
## iso1299 2307 2307 iso1299 K[loc][","][1299](r)
## iso1298 2308 2308 iso1298 K[loc][","][1298](r)
## iso1297 2309 2309 iso1297 K[loc][","][1297](r)
## iso1296 2310 2310 iso1296 K[loc][","][1296](r)
## iso1295 2311 2311 iso1295 K[loc][","][1295](r)
## iso1294 2312 2312 iso1294 K[loc][","][1294](r)
## iso1293 2313 2313 iso1293 K[loc][","][1293](r)
## iso1292 2314 2314 iso1292 K[loc][","][1292](r)
## iso1291 2315 2315 iso1291 K[loc][","][1291](r)
## iso1290 2316 2316 iso1290 K[loc][","][1290](r)
## iso1289 2317 2317 iso1289 K[loc][","][1289](r)
## iso1288 2318 2318 iso1288 K[loc][","][1288](r)
## iso1287 2319 2319 iso1287 K[loc][","][1287](r)
## iso1286 2320 2320 iso1286 K[loc][","][1286](r)
## iso1285 2321 2321 iso1285 K[loc][","][1285](r)
## iso1284 2322 2322 iso1284 K[loc][","][1284](r)
## iso1283 2323 2323 iso1283 K[loc][","][1283](r)
## iso1282 2324 2324 iso1282 K[loc][","][1282](r)
## iso1281 2325 2325 iso1281 K[loc][","][1281](r)
## iso1280 2326 2326 iso1280 K[loc][","][1280](r)
## iso1279 2327 2327 iso1279 K[loc][","][1279](r)
## iso1278 2328 2328 iso1278 K[loc][","][1278](r)
## iso1277 2329 2329 iso1277 K[loc][","][1277](r)
## iso1276 2330 2330 iso1276 K[loc][","][1276](r)
## iso1275 2331 2331 iso1275 K[loc][","][1275](r)
## iso1274 2332 2332 iso1274 K[loc][","][1274](r)
## iso1273 2333 2333 iso1273 K[loc][","][1273](r)
## iso1272 2334 2334 iso1272 K[loc][","][1272](r)
## iso1271 2335 2335 iso1271 K[loc][","][1271](r)
## iso1270 2336 2336 iso1270 K[loc][","][1270](r)
## iso1269 2337 2337 iso1269 K[loc][","][1269](r)
## iso1268 2338 2338 iso1268 K[loc][","][1268](r)
## iso1267 2339 2339 iso1267 K[loc][","][1267](r)
## iso1266 2340 2340 iso1266 K[loc][","][1266](r)
## iso1265 2341 2341 iso1265 K[loc][","][1265](r)
## iso1264 2342 2342 iso1264 K[loc][","][1264](r)
## iso1263 2343 2343 iso1263 K[loc][","][1263](r)
## iso1262 2344 2344 iso1262 K[loc][","][1262](r)
## iso1261 2345 2345 iso1261 K[loc][","][1261](r)
## iso1260 2346 2346 iso1260 K[loc][","][1260](r)
## iso1259 2347 2347 iso1259 K[loc][","][1259](r)
## iso1258 2348 2348 iso1258 K[loc][","][1258](r)
## iso1257 2349 2349 iso1257 K[loc][","][1257](r)
## iso1256 2350 2350 iso1256 K[loc][","][1256](r)
## iso1255 2351 2351 iso1255 K[loc][","][1255](r)
## iso1254 2352 2352 iso1254 K[loc][","][1254](r)
## iso1253 2353 2353 iso1253 K[loc][","][1253](r)
## iso1252 2354 2354 iso1252 K[loc][","][1252](r)
## iso1251 2355 2355 iso1251 K[loc][","][1251](r)
## iso1250 2356 2356 iso1250 K[loc][","][1250](r)
## iso1249 2357 2357 iso1249 K[loc][","][1249](r)
## iso1248 2358 2358 iso1248 K[loc][","][1248](r)
## iso1247 2359 2359 iso1247 K[loc][","][1247](r)
## iso1246 2360 2360 iso1246 K[loc][","][1246](r)
## iso1245 2361 2361 iso1245 K[loc][","][1245](r)
## iso1244 2362 2362 iso1244 K[loc][","][1244](r)
## iso1243 2363 2363 iso1243 K[loc][","][1243](r)
## iso1242 2364 2364 iso1242 K[loc][","][1242](r)
## iso1241 2365 2365 iso1241 K[loc][","][1241](r)
## iso1240 2366 2366 iso1240 K[loc][","][1240](r)
## iso1239 2367 2367 iso1239 K[loc][","][1239](r)
## iso1238 2368 2368 iso1238 K[loc][","][1238](r)
## iso1237 2369 2369 iso1237 K[loc][","][1237](r)
## iso1236 2370 2370 iso1236 K[loc][","][1236](r)
## iso1235 2371 2371 iso1235 K[loc][","][1235](r)
## iso1234 2372 2372 iso1234 K[loc][","][1234](r)
## iso1233 2373 2373 iso1233 K[loc][","][1233](r)
## iso1232 2374 2374 iso1232 K[loc][","][1232](r)
## iso1231 2375 2375 iso1231 K[loc][","][1231](r)
## iso1230 2376 2376 iso1230 K[loc][","][1230](r)
## iso1229 2377 2377 iso1229 K[loc][","][1229](r)
## iso1228 2378 2378 iso1228 K[loc][","][1228](r)
## iso1227 2379 2379 iso1227 K[loc][","][1227](r)
## iso1226 2380 2380 iso1226 K[loc][","][1226](r)
## iso1225 2381 2381 iso1225 K[loc][","][1225](r)
## iso1224 2382 2382 iso1224 K[loc][","][1224](r)
## iso1223 2383 2383 iso1223 K[loc][","][1223](r)
## iso1222 2384 2384 iso1222 K[loc][","][1222](r)
## iso1221 2385 2385 iso1221 K[loc][","][1221](r)
## iso1220 2386 2386 iso1220 K[loc][","][1220](r)
## iso1219 2387 2387 iso1219 K[loc][","][1219](r)
## iso1218 2388 2388 iso1218 K[loc][","][1218](r)
## iso1217 2389 2389 iso1217 K[loc][","][1217](r)
## iso1216 2390 2390 iso1216 K[loc][","][1216](r)
## iso1215 2391 2391 iso1215 K[loc][","][1215](r)
## iso1214 2392 2392 iso1214 K[loc][","][1214](r)
## iso1213 2393 2393 iso1213 K[loc][","][1213](r)
## iso1212 2394 2394 iso1212 K[loc][","][1212](r)
## iso1211 2395 2395 iso1211 K[loc][","][1211](r)
## iso1210 2396 2396 iso1210 K[loc][","][1210](r)
## iso1209 2397 2397 iso1209 K[loc][","][1209](r)
## iso1208 2398 2398 iso1208 K[loc][","][1208](r)
## iso1207 2399 2399 iso1207 K[loc][","][1207](r)
## iso1206 2400 2400 iso1206 K[loc][","][1206](r)
## iso1205 2401 2401 iso1205 K[loc][","][1205](r)
## iso1204 2402 2402 iso1204 K[loc][","][1204](r)
## iso1203 2403 2403 iso1203 K[loc][","][1203](r)
## iso1202 2404 2404 iso1202 K[loc][","][1202](r)
## iso1201 2405 2405 iso1201 K[loc][","][1201](r)
## iso1200 2406 2406 iso1200 K[loc][","][1200](r)
## iso1199 2407 2407 iso1199 K[loc][","][1199](r)
## iso1198 2408 2408 iso1198 K[loc][","][1198](r)
## iso1197 2409 2409 iso1197 K[loc][","][1197](r)
## iso1196 2410 2410 iso1196 K[loc][","][1196](r)
## iso1195 2411 2411 iso1195 K[loc][","][1195](r)
## iso1194 2412 2412 iso1194 K[loc][","][1194](r)
## iso1193 2413 2413 iso1193 K[loc][","][1193](r)
## iso1192 2414 2414 iso1192 K[loc][","][1192](r)
## iso1191 2415 2415 iso1191 K[loc][","][1191](r)
## iso1190 2416 2416 iso1190 K[loc][","][1190](r)
## iso1189 2417 2417 iso1189 K[loc][","][1189](r)
## iso1188 2418 2418 iso1188 K[loc][","][1188](r)
## iso1187 2419 2419 iso1187 K[loc][","][1187](r)
## iso1186 2420 2420 iso1186 K[loc][","][1186](r)
## iso1185 2421 2421 iso1185 K[loc][","][1185](r)
## iso1184 2422 2422 iso1184 K[loc][","][1184](r)
## iso1183 2423 2423 iso1183 K[loc][","][1183](r)
## iso1182 2424 2424 iso1182 K[loc][","][1182](r)
## iso1181 2425 2425 iso1181 K[loc][","][1181](r)
## iso1180 2426 2426 iso1180 K[loc][","][1180](r)
## iso1179 2427 2427 iso1179 K[loc][","][1179](r)
## iso1178 2428 2428 iso1178 K[loc][","][1178](r)
## iso1177 2429 2429 iso1177 K[loc][","][1177](r)
## iso1176 2430 2430 iso1176 K[loc][","][1176](r)
## iso1175 2431 2431 iso1175 K[loc][","][1175](r)
## iso1174 2432 2432 iso1174 K[loc][","][1174](r)
## iso1173 2433 2433 iso1173 K[loc][","][1173](r)
## iso1172 2434 2434 iso1172 K[loc][","][1172](r)
## iso1171 2435 2435 iso1171 K[loc][","][1171](r)
## iso1170 2436 2436 iso1170 K[loc][","][1170](r)
## iso1169 2437 2437 iso1169 K[loc][","][1169](r)
## iso1168 2438 2438 iso1168 K[loc][","][1168](r)
## iso1167 2439 2439 iso1167 K[loc][","][1167](r)
## iso1166 2440 2440 iso1166 K[loc][","][1166](r)
## iso1165 2441 2441 iso1165 K[loc][","][1165](r)
## iso1164 2442 2442 iso1164 K[loc][","][1164](r)
## iso1163 2443 2443 iso1163 K[loc][","][1163](r)
## iso1162 2444 2444 iso1162 K[loc][","][1162](r)
## iso1161 2445 2445 iso1161 K[loc][","][1161](r)
## iso1160 2446 2446 iso1160 K[loc][","][1160](r)
## iso1159 2447 2447 iso1159 K[loc][","][1159](r)
## iso1158 2448 2448 iso1158 K[loc][","][1158](r)
## iso1157 2449 2449 iso1157 K[loc][","][1157](r)
## iso1156 2450 2450 iso1156 K[loc][","][1156](r)
## iso1155 2451 2451 iso1155 K[loc][","][1155](r)
## iso1154 2452 2452 iso1154 K[loc][","][1154](r)
## iso1153 2453 2453 iso1153 K[loc][","][1153](r)
## iso1152 2454 2454 iso1152 K[loc][","][1152](r)
## iso1151 2455 2455 iso1151 K[loc][","][1151](r)
## iso1150 2456 2456 iso1150 K[loc][","][1150](r)
## iso1149 2457 2457 iso1149 K[loc][","][1149](r)
## iso1148 2458 2458 iso1148 K[loc][","][1148](r)
## iso1147 2459 2459 iso1147 K[loc][","][1147](r)
## iso1146 2460 2460 iso1146 K[loc][","][1146](r)
## iso1145 2461 2461 iso1145 K[loc][","][1145](r)
## iso1144 2462 2462 iso1144 K[loc][","][1144](r)
## iso1143 2463 2463 iso1143 K[loc][","][1143](r)
## iso1142 2464 2464 iso1142 K[loc][","][1142](r)
## iso1141 2465 2465 iso1141 K[loc][","][1141](r)
## iso1140 2466 2466 iso1140 K[loc][","][1140](r)
## iso1139 2467 2467 iso1139 K[loc][","][1139](r)
## iso1138 2468 2468 iso1138 K[loc][","][1138](r)
## iso1137 2469 2469 iso1137 K[loc][","][1137](r)
## iso1136 2470 2470 iso1136 K[loc][","][1136](r)
## iso1135 2471 2471 iso1135 K[loc][","][1135](r)
## iso1134 2472 2472 iso1134 K[loc][","][1134](r)
## iso1133 2473 2473 iso1133 K[loc][","][1133](r)
## iso1132 2474 2474 iso1132 K[loc][","][1132](r)
## iso1131 2475 2475 iso1131 K[loc][","][1131](r)
## iso1130 2476 2476 iso1130 K[loc][","][1130](r)
## iso1129 2477 2477 iso1129 K[loc][","][1129](r)
## iso1128 2478 2478 iso1128 K[loc][","][1128](r)
## iso1127 2479 2479 iso1127 K[loc][","][1127](r)
## iso1126 2480 2480 iso1126 K[loc][","][1126](r)
## iso1125 2481 2481 iso1125 K[loc][","][1125](r)
## iso1124 2482 2482 iso1124 K[loc][","][1124](r)
## iso1123 2483 2483 iso1123 K[loc][","][1123](r)
## iso1122 2484 2484 iso1122 K[loc][","][1122](r)
## iso1121 2485 2485 iso1121 K[loc][","][1121](r)
## iso1120 2486 2486 iso1120 K[loc][","][1120](r)
## iso1119 2487 2487 iso1119 K[loc][","][1119](r)
## iso1118 2488 2488 iso1118 K[loc][","][1118](r)
## iso1117 2489 2489 iso1117 K[loc][","][1117](r)
## iso1116 2490 2490 iso1116 K[loc][","][1116](r)
## iso1115 2491 2491 iso1115 K[loc][","][1115](r)
## iso1114 2492 2492 iso1114 K[loc][","][1114](r)
## iso1113 2493 2493 iso1113 K[loc][","][1113](r)
## iso1112 2494 2494 iso1112 K[loc][","][1112](r)
## iso1111 2495 2495 iso1111 K[loc][","][1111](r)
## iso1110 2496 2496 iso1110 K[loc][","][1110](r)
## iso1109 2497 2497 iso1109 K[loc][","][1109](r)
## iso1108 2498 2498 iso1108 K[loc][","][1108](r)
## iso1107 2499 2499 iso1107 K[loc][","][1107](r)
## iso1106 2500 2500 iso1106 K[loc][","][1106](r)
## iso1105 2501 2501 iso1105 K[loc][","][1105](r)
## iso1104 2502 2502 iso1104 K[loc][","][1104](r)
## iso1103 2503 2503 iso1103 K[loc][","][1103](r)
## iso1102 2504 2504 iso1102 K[loc][","][1102](r)
## iso1101 2505 2505 iso1101 K[loc][","][1101](r)
## iso1100 2506 2506 iso1100 K[loc][","][1100](r)
## iso1099 2507 2507 iso1099 K[loc][","][1099](r)
## iso1098 2508 2508 iso1098 K[loc][","][1098](r)
## iso1097 2509 2509 iso1097 K[loc][","][1097](r)
## iso1096 2510 2510 iso1096 K[loc][","][1096](r)
## iso1095 2511 2511 iso1095 K[loc][","][1095](r)
## iso1094 2512 2512 iso1094 K[loc][","][1094](r)
## iso1093 2513 2513 iso1093 K[loc][","][1093](r)
## iso1092 2514 2514 iso1092 K[loc][","][1092](r)
## iso1091 2515 2515 iso1091 K[loc][","][1091](r)
## iso1090 2516 2516 iso1090 K[loc][","][1090](r)
## iso1089 2517 2517 iso1089 K[loc][","][1089](r)
## iso1088 2518 2518 iso1088 K[loc][","][1088](r)
## iso1087 2519 2519 iso1087 K[loc][","][1087](r)
## iso1086 2520 2520 iso1086 K[loc][","][1086](r)
## iso1085 2521 2521 iso1085 K[loc][","][1085](r)
## iso1084 2522 2522 iso1084 K[loc][","][1084](r)
## iso1083 2523 2523 iso1083 K[loc][","][1083](r)
## iso1082 2524 2524 iso1082 K[loc][","][1082](r)
## iso1081 2525 2525 iso1081 K[loc][","][1081](r)
## iso1080 2526 2526 iso1080 K[loc][","][1080](r)
## iso1079 2527 2527 iso1079 K[loc][","][1079](r)
## iso1078 2528 2528 iso1078 K[loc][","][1078](r)
## iso1077 2529 2529 iso1077 K[loc][","][1077](r)
## iso1076 2530 2530 iso1076 K[loc][","][1076](r)
## iso1075 2531 2531 iso1075 K[loc][","][1075](r)
## iso1074 2532 2532 iso1074 K[loc][","][1074](r)
## iso1073 2533 2533 iso1073 K[loc][","][1073](r)
## iso1072 2534 2534 iso1072 K[loc][","][1072](r)
## iso1071 2535 2535 iso1071 K[loc][","][1071](r)
## iso1070 2536 2536 iso1070 K[loc][","][1070](r)
## iso1069 2537 2537 iso1069 K[loc][","][1069](r)
## iso1068 2538 2538 iso1068 K[loc][","][1068](r)
## iso1067 2539 2539 iso1067 K[loc][","][1067](r)
## iso1066 2540 2540 iso1066 K[loc][","][1066](r)
## iso1065 2541 2541 iso1065 K[loc][","][1065](r)
## iso1064 2542 2542 iso1064 K[loc][","][1064](r)
## iso1063 2543 2543 iso1063 K[loc][","][1063](r)
## iso1062 2544 2544 iso1062 K[loc][","][1062](r)
## iso1061 2545 2545 iso1061 K[loc][","][1061](r)
## iso1060 2546 2546 iso1060 K[loc][","][1060](r)
## iso1059 2547 2547 iso1059 K[loc][","][1059](r)
## iso1058 2548 2548 iso1058 K[loc][","][1058](r)
## iso1057 2549 2549 iso1057 K[loc][","][1057](r)
## iso1056 2550 2550 iso1056 K[loc][","][1056](r)
## iso1055 2551 2551 iso1055 K[loc][","][1055](r)
## iso1054 2552 2552 iso1054 K[loc][","][1054](r)
## iso1053 2553 2553 iso1053 K[loc][","][1053](r)
## iso1052 2554 2554 iso1052 K[loc][","][1052](r)
## iso1051 2555 2555 iso1051 K[loc][","][1051](r)
## iso1050 2556 2556 iso1050 K[loc][","][1050](r)
## iso1049 2557 2557 iso1049 K[loc][","][1049](r)
## iso1048 2558 2558 iso1048 K[loc][","][1048](r)
## iso1047 2559 2559 iso1047 K[loc][","][1047](r)
## iso1046 2560 2560 iso1046 K[loc][","][1046](r)
## iso1045 2561 2561 iso1045 K[loc][","][1045](r)
## iso1044 2562 2562 iso1044 K[loc][","][1044](r)
## iso1043 2563 2563 iso1043 K[loc][","][1043](r)
## iso1042 2564 2564 iso1042 K[loc][","][1042](r)
## iso1041 2565 2565 iso1041 K[loc][","][1041](r)
## iso1040 2566 2566 iso1040 K[loc][","][1040](r)
## iso1039 2567 2567 iso1039 K[loc][","][1039](r)
## iso1038 2568 2568 iso1038 K[loc][","][1038](r)
## iso1037 2569 2569 iso1037 K[loc][","][1037](r)
## iso1036 2570 2570 iso1036 K[loc][","][1036](r)
## iso1035 2571 2571 iso1035 K[loc][","][1035](r)
## iso1034 2572 2572 iso1034 K[loc][","][1034](r)
## iso1033 2573 2573 iso1033 K[loc][","][1033](r)
## iso1032 2574 2574 iso1032 K[loc][","][1032](r)
## iso1031 2575 2575 iso1031 K[loc][","][1031](r)
## iso1030 2576 2576 iso1030 K[loc][","][1030](r)
## iso1029 2577 2577 iso1029 K[loc][","][1029](r)
## iso1028 2578 2578 iso1028 K[loc][","][1028](r)
## iso1027 2579 2579 iso1027 K[loc][","][1027](r)
## iso1026 2580 2580 iso1026 K[loc][","][1026](r)
## iso1025 2581 2581 iso1025 K[loc][","][1025](r)
## iso1024 2582 2582 iso1024 K[loc][","][1024](r)
## iso1023 2583 2583 iso1023 K[loc][","][1023](r)
## iso1022 2584 2584 iso1022 K[loc][","][1022](r)
## iso1021 2585 2585 iso1021 K[loc][","][1021](r)
## iso1020 2586 2586 iso1020 K[loc][","][1020](r)
## iso1019 2587 2587 iso1019 K[loc][","][1019](r)
## iso1018 2588 2588 iso1018 K[loc][","][1018](r)
## iso1017 2589 2589 iso1017 K[loc][","][1017](r)
## iso1016 2590 2590 iso1016 K[loc][","][1016](r)
## iso1015 2591 2591 iso1015 K[loc][","][1015](r)
## iso1014 2592 2592 iso1014 K[loc][","][1014](r)
## iso1013 2593 2593 iso1013 K[loc][","][1013](r)
## iso1012 2594 2594 iso1012 K[loc][","][1012](r)
## iso1011 2595 2595 iso1011 K[loc][","][1011](r)
## iso1010 2596 2596 iso1010 K[loc][","][1010](r)
## iso1009 2597 2597 iso1009 K[loc][","][1009](r)
## iso1008 2598 2598 iso1008 K[loc][","][1008](r)
## iso1007 2599 2599 iso1007 K[loc][","][1007](r)
## iso1006 2600 2600 iso1006 K[loc][","][1006](r)
## iso1005 2601 2601 iso1005 K[loc][","][1005](r)
## iso1004 2602 2602 iso1004 K[loc][","][1004](r)
## iso1003 2603 2603 iso1003 K[loc][","][1003](r)
## iso1002 2604 2604 iso1002 K[loc][","][1002](r)
## iso1001 2605 2605 iso1001 K[loc][","][1001](r)
## iso1000 2606 2606 iso1000 K[loc][","][1000](r)
## iso0999 2607 2607 iso0999 K[loc][","][999](r)
## iso0998 2608 2608 iso0998 K[loc][","][998](r)
## iso0997 2609 2609 iso0997 K[loc][","][997](r)
## iso0996 2610 2610 iso0996 K[loc][","][996](r)
## iso0995 2611 2611 iso0995 K[loc][","][995](r)
## iso0994 2612 2612 iso0994 K[loc][","][994](r)
## iso0993 2613 2613 iso0993 K[loc][","][993](r)
## iso0992 2614 2614 iso0992 K[loc][","][992](r)
## iso0991 2615 2615 iso0991 K[loc][","][991](r)
## iso0990 2616 2616 iso0990 K[loc][","][990](r)
## iso0989 2617 2617 iso0989 K[loc][","][989](r)
## iso0988 2618 2618 iso0988 K[loc][","][988](r)
## iso0987 2619 2619 iso0987 K[loc][","][987](r)
## iso0986 2620 2620 iso0986 K[loc][","][986](r)
## iso0985 2621 2621 iso0985 K[loc][","][985](r)
## iso0984 2622 2622 iso0984 K[loc][","][984](r)
## iso0983 2623 2623 iso0983 K[loc][","][983](r)
## iso0982 2624 2624 iso0982 K[loc][","][982](r)
## iso0981 2625 2625 iso0981 K[loc][","][981](r)
## iso0980 2626 2626 iso0980 K[loc][","][980](r)
## iso0979 2627 2627 iso0979 K[loc][","][979](r)
## iso0978 2628 2628 iso0978 K[loc][","][978](r)
## iso0977 2629 2629 iso0977 K[loc][","][977](r)
## iso0976 2630 2630 iso0976 K[loc][","][976](r)
## iso0975 2631 2631 iso0975 K[loc][","][975](r)
## iso0974 2632 2632 iso0974 K[loc][","][974](r)
## iso0973 2633 2633 iso0973 K[loc][","][973](r)
## iso0972 2634 2634 iso0972 K[loc][","][972](r)
## iso0971 2635 2635 iso0971 K[loc][","][971](r)
## iso0970 2636 2636 iso0970 K[loc][","][970](r)
## iso0969 2637 2637 iso0969 K[loc][","][969](r)
## iso0968 2638 2638 iso0968 K[loc][","][968](r)
## iso0967 2639 2639 iso0967 K[loc][","][967](r)
## iso0966 2640 2640 iso0966 K[loc][","][966](r)
## iso0965 2641 2641 iso0965 K[loc][","][965](r)
## iso0964 2642 2642 iso0964 K[loc][","][964](r)
## iso0963 2643 2643 iso0963 K[loc][","][963](r)
## iso0962 2644 2644 iso0962 K[loc][","][962](r)
## iso0961 2645 2645 iso0961 K[loc][","][961](r)
## iso0960 2646 2646 iso0960 K[loc][","][960](r)
## iso0959 2647 2647 iso0959 K[loc][","][959](r)
## iso0958 2648 2648 iso0958 K[loc][","][958](r)
## iso0957 2649 2649 iso0957 K[loc][","][957](r)
## iso0956 2650 2650 iso0956 K[loc][","][956](r)
## iso0955 2651 2651 iso0955 K[loc][","][955](r)
## iso0954 2652 2652 iso0954 K[loc][","][954](r)
## iso0953 2653 2653 iso0953 K[loc][","][953](r)
## iso0952 2654 2654 iso0952 K[loc][","][952](r)
## iso0951 2655 2655 iso0951 K[loc][","][951](r)
## iso0950 2656 2656 iso0950 K[loc][","][950](r)
## iso0949 2657 2657 iso0949 K[loc][","][949](r)
## iso0948 2658 2658 iso0948 K[loc][","][948](r)
## iso0947 2659 2659 iso0947 K[loc][","][947](r)
## iso0946 2660 2660 iso0946 K[loc][","][946](r)
## iso0945 2661 2661 iso0945 K[loc][","][945](r)
## iso0944 2662 2662 iso0944 K[loc][","][944](r)
## iso0943 2663 2663 iso0943 K[loc][","][943](r)
## iso0942 2664 2664 iso0942 K[loc][","][942](r)
## iso0941 2665 2665 iso0941 K[loc][","][941](r)
## iso0940 2666 2666 iso0940 K[loc][","][940](r)
## iso0939 2667 2667 iso0939 K[loc][","][939](r)
## iso0938 2668 2668 iso0938 K[loc][","][938](r)
## iso0937 2669 2669 iso0937 K[loc][","][937](r)
## iso0936 2670 2670 iso0936 K[loc][","][936](r)
## iso0935 2671 2671 iso0935 K[loc][","][935](r)
## iso0934 2672 2672 iso0934 K[loc][","][934](r)
## iso0933 2673 2673 iso0933 K[loc][","][933](r)
## iso0932 2674 2674 iso0932 K[loc][","][932](r)
## iso0931 2675 2675 iso0931 K[loc][","][931](r)
## iso0930 2676 2676 iso0930 K[loc][","][930](r)
## iso0929 2677 2677 iso0929 K[loc][","][929](r)
## iso0928 2678 2678 iso0928 K[loc][","][928](r)
## iso0927 2679 2679 iso0927 K[loc][","][927](r)
## iso0926 2680 2680 iso0926 K[loc][","][926](r)
## iso0925 2681 2681 iso0925 K[loc][","][925](r)
## iso0924 2682 2682 iso0924 K[loc][","][924](r)
## iso0923 2683 2683 iso0923 K[loc][","][923](r)
## iso0922 2684 2684 iso0922 K[loc][","][922](r)
## iso0921 2685 2685 iso0921 K[loc][","][921](r)
## iso0920 2686 2686 iso0920 K[loc][","][920](r)
## iso0919 2687 2687 iso0919 K[loc][","][919](r)
## iso0918 2688 2688 iso0918 K[loc][","][918](r)
## iso0917 2689 2689 iso0917 K[loc][","][917](r)
## iso0916 2690 2690 iso0916 K[loc][","][916](r)
## iso0915 2691 2691 iso0915 K[loc][","][915](r)
## iso0914 2692 2692 iso0914 K[loc][","][914](r)
## iso0913 2693 2693 iso0913 K[loc][","][913](r)
## iso0912 2694 2694 iso0912 K[loc][","][912](r)
## iso0911 2695 2695 iso0911 K[loc][","][911](r)
## iso0910 2696 2696 iso0910 K[loc][","][910](r)
## iso0909 2697 2697 iso0909 K[loc][","][909](r)
## iso0908 2698 2698 iso0908 K[loc][","][908](r)
## iso0907 2699 2699 iso0907 K[loc][","][907](r)
## iso0906 2700 2700 iso0906 K[loc][","][906](r)
## iso0905 2701 2701 iso0905 K[loc][","][905](r)
## iso0904 2702 2702 iso0904 K[loc][","][904](r)
## iso0903 2703 2703 iso0903 K[loc][","][903](r)
## iso0902 2704 2704 iso0902 K[loc][","][902](r)
## iso0901 2705 2705 iso0901 K[loc][","][901](r)
## iso0900 2706 2706 iso0900 K[loc][","][900](r)
## iso0899 2707 2707 iso0899 K[loc][","][899](r)
## iso0898 2708 2708 iso0898 K[loc][","][898](r)
## iso0897 2709 2709 iso0897 K[loc][","][897](r)
## iso0896 2710 2710 iso0896 K[loc][","][896](r)
## iso0895 2711 2711 iso0895 K[loc][","][895](r)
## iso0894 2712 2712 iso0894 K[loc][","][894](r)
## iso0893 2713 2713 iso0893 K[loc][","][893](r)
## iso0892 2714 2714 iso0892 K[loc][","][892](r)
## iso0891 2715 2715 iso0891 K[loc][","][891](r)
## iso0890 2716 2716 iso0890 K[loc][","][890](r)
## iso0889 2717 2717 iso0889 K[loc][","][889](r)
## iso0888 2718 2718 iso0888 K[loc][","][888](r)
## iso0887 2719 2719 iso0887 K[loc][","][887](r)
## iso0886 2720 2720 iso0886 K[loc][","][886](r)
## iso0885 2721 2721 iso0885 K[loc][","][885](r)
## iso0884 2722 2722 iso0884 K[loc][","][884](r)
## iso0883 2723 2723 iso0883 K[loc][","][883](r)
## iso0882 2724 2724 iso0882 K[loc][","][882](r)
## iso0881 2725 2725 iso0881 K[loc][","][881](r)
## iso0880 2726 2726 iso0880 K[loc][","][880](r)
## iso0879 2727 2727 iso0879 K[loc][","][879](r)
## iso0878 2728 2728 iso0878 K[loc][","][878](r)
## iso0877 2729 2729 iso0877 K[loc][","][877](r)
## iso0876 2730 2730 iso0876 K[loc][","][876](r)
## iso0875 2731 2731 iso0875 K[loc][","][875](r)
## iso0874 2732 2732 iso0874 K[loc][","][874](r)
## iso0873 2733 2733 iso0873 K[loc][","][873](r)
## iso0872 2734 2734 iso0872 K[loc][","][872](r)
## iso0871 2735 2735 iso0871 K[loc][","][871](r)
## iso0870 2736 2736 iso0870 K[loc][","][870](r)
## iso0869 2737 2737 iso0869 K[loc][","][869](r)
## iso0868 2738 2738 iso0868 K[loc][","][868](r)
## iso0867 2739 2739 iso0867 K[loc][","][867](r)
## iso0866 2740 2740 iso0866 K[loc][","][866](r)
## iso0865 2741 2741 iso0865 K[loc][","][865](r)
## iso0864 2742 2742 iso0864 K[loc][","][864](r)
## iso0863 2743 2743 iso0863 K[loc][","][863](r)
## iso0862 2744 2744 iso0862 K[loc][","][862](r)
## iso0861 2745 2745 iso0861 K[loc][","][861](r)
## iso0860 2746 2746 iso0860 K[loc][","][860](r)
## iso0859 2747 2747 iso0859 K[loc][","][859](r)
## iso0858 2748 2748 iso0858 K[loc][","][858](r)
## iso0857 2749 2749 iso0857 K[loc][","][857](r)
## iso0856 2750 2750 iso0856 K[loc][","][856](r)
## iso0855 2751 2751 iso0855 K[loc][","][855](r)
## iso0854 2752 2752 iso0854 K[loc][","][854](r)
## iso0853 2753 2753 iso0853 K[loc][","][853](r)
## iso0852 2754 2754 iso0852 K[loc][","][852](r)
## iso0851 2755 2755 iso0851 K[loc][","][851](r)
## iso0850 2756 2756 iso0850 K[loc][","][850](r)
## iso0849 2757 2757 iso0849 K[loc][","][849](r)
## iso0848 2758 2758 iso0848 K[loc][","][848](r)
## iso0847 2759 2759 iso0847 K[loc][","][847](r)
## iso0846 2760 2760 iso0846 K[loc][","][846](r)
## iso0845 2761 2761 iso0845 K[loc][","][845](r)
## iso0844 2762 2762 iso0844 K[loc][","][844](r)
## iso0843 2763 2763 iso0843 K[loc][","][843](r)
## iso0842 2764 2764 iso0842 K[loc][","][842](r)
## iso0841 2765 2765 iso0841 K[loc][","][841](r)
## iso0840 2766 2766 iso0840 K[loc][","][840](r)
## iso0839 2767 2767 iso0839 K[loc][","][839](r)
## iso0838 2768 2768 iso0838 K[loc][","][838](r)
## iso0837 2769 2769 iso0837 K[loc][","][837](r)
## iso0836 2770 2770 iso0836 K[loc][","][836](r)
## iso0835 2771 2771 iso0835 K[loc][","][835](r)
## iso0834 2772 2772 iso0834 K[loc][","][834](r)
## iso0833 2773 2773 iso0833 K[loc][","][833](r)
## iso0832 2774 2774 iso0832 K[loc][","][832](r)
## iso0831 2775 2775 iso0831 K[loc][","][831](r)
## iso0830 2776 2776 iso0830 K[loc][","][830](r)
## iso0829 2777 2777 iso0829 K[loc][","][829](r)
## iso0828 2778 2778 iso0828 K[loc][","][828](r)
## iso0827 2779 2779 iso0827 K[loc][","][827](r)
## iso0826 2780 2780 iso0826 K[loc][","][826](r)
## iso0825 2781 2781 iso0825 K[loc][","][825](r)
## iso0824 2782 2782 iso0824 K[loc][","][824](r)
## iso0823 2783 2783 iso0823 K[loc][","][823](r)
## iso0822 2784 2784 iso0822 K[loc][","][822](r)
## iso0821 2785 2785 iso0821 K[loc][","][821](r)
## iso0820 2786 2786 iso0820 K[loc][","][820](r)
## iso0819 2787 2787 iso0819 K[loc][","][819](r)
## iso0818 2788 2788 iso0818 K[loc][","][818](r)
## iso0817 2789 2789 iso0817 K[loc][","][817](r)
## iso0816 2790 2790 iso0816 K[loc][","][816](r)
## iso0815 2791 2791 iso0815 K[loc][","][815](r)
## iso0814 2792 2792 iso0814 K[loc][","][814](r)
## iso0813 2793 2793 iso0813 K[loc][","][813](r)
## iso0812 2794 2794 iso0812 K[loc][","][812](r)
## iso0811 2795 2795 iso0811 K[loc][","][811](r)
## iso0810 2796 2796 iso0810 K[loc][","][810](r)
## iso0809 2797 2797 iso0809 K[loc][","][809](r)
## iso0808 2798 2798 iso0808 K[loc][","][808](r)
## iso0807 2799 2799 iso0807 K[loc][","][807](r)
## iso0806 2800 2800 iso0806 K[loc][","][806](r)
## iso0805 2801 2801 iso0805 K[loc][","][805](r)
## iso0804 2802 2802 iso0804 K[loc][","][804](r)
## iso0803 2803 2803 iso0803 K[loc][","][803](r)
## iso0802 2804 2804 iso0802 K[loc][","][802](r)
## iso0801 2805 2805 iso0801 K[loc][","][801](r)
## iso0800 2806 2806 iso0800 K[loc][","][800](r)
## iso0799 2807 2807 iso0799 K[loc][","][799](r)
## iso0798 2808 2808 iso0798 K[loc][","][798](r)
## iso0797 2809 2809 iso0797 K[loc][","][797](r)
## iso0796 2810 2810 iso0796 K[loc][","][796](r)
## iso0795 2811 2811 iso0795 K[loc][","][795](r)
## iso0794 2812 2812 iso0794 K[loc][","][794](r)
## iso0793 2813 2813 iso0793 K[loc][","][793](r)
## iso0792 2814 2814 iso0792 K[loc][","][792](r)
## iso0791 2815 2815 iso0791 K[loc][","][791](r)
## iso0790 2816 2816 iso0790 K[loc][","][790](r)
## iso0789 2817 2817 iso0789 K[loc][","][789](r)
## iso0788 2818 2818 iso0788 K[loc][","][788](r)
## iso0787 2819 2819 iso0787 K[loc][","][787](r)
## iso0786 2820 2820 iso0786 K[loc][","][786](r)
## iso0785 2821 2821 iso0785 K[loc][","][785](r)
## iso0784 2822 2822 iso0784 K[loc][","][784](r)
## iso0783 2823 2823 iso0783 K[loc][","][783](r)
## iso0782 2824 2824 iso0782 K[loc][","][782](r)
## iso0781 2825 2825 iso0781 K[loc][","][781](r)
## iso0780 2826 2826 iso0780 K[loc][","][780](r)
## iso0779 2827 2827 iso0779 K[loc][","][779](r)
## iso0778 2828 2828 iso0778 K[loc][","][778](r)
## iso0777 2829 2829 iso0777 K[loc][","][777](r)
## iso0776 2830 2830 iso0776 K[loc][","][776](r)
## iso0775 2831 2831 iso0775 K[loc][","][775](r)
## iso0774 2832 2832 iso0774 K[loc][","][774](r)
## iso0773 2833 2833 iso0773 K[loc][","][773](r)
## iso0772 2834 2834 iso0772 K[loc][","][772](r)
## iso0771 2835 2835 iso0771 K[loc][","][771](r)
## iso0770 2836 2836 iso0770 K[loc][","][770](r)
## iso0769 2837 2837 iso0769 K[loc][","][769](r)
## iso0768 2838 2838 iso0768 K[loc][","][768](r)
## iso0767 2839 2839 iso0767 K[loc][","][767](r)
## iso0766 2840 2840 iso0766 K[loc][","][766](r)
## iso0765 2841 2841 iso0765 K[loc][","][765](r)
## iso0764 2842 2842 iso0764 K[loc][","][764](r)
## iso0763 2843 2843 iso0763 K[loc][","][763](r)
## iso0762 2844 2844 iso0762 K[loc][","][762](r)
## iso0761 2845 2845 iso0761 K[loc][","][761](r)
## iso0760 2846 2846 iso0760 K[loc][","][760](r)
## iso0759 2847 2847 iso0759 K[loc][","][759](r)
## iso0758 2848 2848 iso0758 K[loc][","][758](r)
## iso0757 2849 2849 iso0757 K[loc][","][757](r)
## iso0756 2850 2850 iso0756 K[loc][","][756](r)
## iso0755 2851 2851 iso0755 K[loc][","][755](r)
## iso0754 2852 2852 iso0754 K[loc][","][754](r)
## iso0753 2853 2853 iso0753 K[loc][","][753](r)
## iso0752 2854 2854 iso0752 K[loc][","][752](r)
## iso0751 2855 2855 iso0751 K[loc][","][751](r)
## iso0750 2856 2856 iso0750 K[loc][","][750](r)
## iso0749 2857 2857 iso0749 K[loc][","][749](r)
## iso0748 2858 2858 iso0748 K[loc][","][748](r)
## iso0747 2859 2859 iso0747 K[loc][","][747](r)
## iso0746 2860 2860 iso0746 K[loc][","][746](r)
## iso0745 2861 2861 iso0745 K[loc][","][745](r)
## iso0744 2862 2862 iso0744 K[loc][","][744](r)
## iso0743 2863 2863 iso0743 K[loc][","][743](r)
## iso0742 2864 2864 iso0742 K[loc][","][742](r)
## iso0741 2865 2865 iso0741 K[loc][","][741](r)
## iso0740 2866 2866 iso0740 K[loc][","][740](r)
## iso0739 2867 2867 iso0739 K[loc][","][739](r)
## iso0738 2868 2868 iso0738 K[loc][","][738](r)
## iso0737 2869 2869 iso0737 K[loc][","][737](r)
## iso0736 2870 2870 iso0736 K[loc][","][736](r)
## iso0735 2871 2871 iso0735 K[loc][","][735](r)
## iso0734 2872 2872 iso0734 K[loc][","][734](r)
## iso0733 2873 2873 iso0733 K[loc][","][733](r)
## iso0732 2874 2874 iso0732 K[loc][","][732](r)
## iso0731 2875 2875 iso0731 K[loc][","][731](r)
## iso0730 2876 2876 iso0730 K[loc][","][730](r)
## iso0729 2877 2877 iso0729 K[loc][","][729](r)
## iso0728 2878 2878 iso0728 K[loc][","][728](r)
## iso0727 2879 2879 iso0727 K[loc][","][727](r)
## iso0726 2880 2880 iso0726 K[loc][","][726](r)
## iso0725 2881 2881 iso0725 K[loc][","][725](r)
## iso0724 2882 2882 iso0724 K[loc][","][724](r)
## iso0723 2883 2883 iso0723 K[loc][","][723](r)
## iso0722 2884 2884 iso0722 K[loc][","][722](r)
## iso0721 2885 2885 iso0721 K[loc][","][721](r)
## iso0720 2886 2886 iso0720 K[loc][","][720](r)
## iso0719 2887 2887 iso0719 K[loc][","][719](r)
## iso0718 2888 2888 iso0718 K[loc][","][718](r)
## iso0717 2889 2889 iso0717 K[loc][","][717](r)
## iso0716 2890 2890 iso0716 K[loc][","][716](r)
## iso0715 2891 2891 iso0715 K[loc][","][715](r)
## iso0714 2892 2892 iso0714 K[loc][","][714](r)
## iso0713 2893 2893 iso0713 K[loc][","][713](r)
## iso0712 2894 2894 iso0712 K[loc][","][712](r)
## iso0711 2895 2895 iso0711 K[loc][","][711](r)
## iso0710 2896 2896 iso0710 K[loc][","][710](r)
## iso0709 2897 2897 iso0709 K[loc][","][709](r)
## iso0708 2898 2898 iso0708 K[loc][","][708](r)
## iso0707 2899 2899 iso0707 K[loc][","][707](r)
## iso0706 2900 2900 iso0706 K[loc][","][706](r)
## iso0705 2901 2901 iso0705 K[loc][","][705](r)
## iso0704 2902 2902 iso0704 K[loc][","][704](r)
## iso0703 2903 2903 iso0703 K[loc][","][703](r)
## iso0702 2904 2904 iso0702 K[loc][","][702](r)
## iso0701 2905 2905 iso0701 K[loc][","][701](r)
## iso0700 2906 2906 iso0700 K[loc][","][700](r)
## iso0699 2907 2907 iso0699 K[loc][","][699](r)
## iso0698 2908 2908 iso0698 K[loc][","][698](r)
## iso0697 2909 2909 iso0697 K[loc][","][697](r)
## iso0696 2910 2910 iso0696 K[loc][","][696](r)
## iso0695 2911 2911 iso0695 K[loc][","][695](r)
## iso0694 2912 2912 iso0694 K[loc][","][694](r)
## iso0693 2913 2913 iso0693 K[loc][","][693](r)
## iso0692 2914 2914 iso0692 K[loc][","][692](r)
## iso0691 2915 2915 iso0691 K[loc][","][691](r)
## iso0690 2916 2916 iso0690 K[loc][","][690](r)
## iso0689 2917 2917 iso0689 K[loc][","][689](r)
## iso0688 2918 2918 iso0688 K[loc][","][688](r)
## iso0687 2919 2919 iso0687 K[loc][","][687](r)
## iso0686 2920 2920 iso0686 K[loc][","][686](r)
## iso0685 2921 2921 iso0685 K[loc][","][685](r)
## iso0684 2922 2922 iso0684 K[loc][","][684](r)
## iso0683 2923 2923 iso0683 K[loc][","][683](r)
## iso0682 2924 2924 iso0682 K[loc][","][682](r)
## iso0681 2925 2925 iso0681 K[loc][","][681](r)
## iso0680 2926 2926 iso0680 K[loc][","][680](r)
## iso0679 2927 2927 iso0679 K[loc][","][679](r)
## iso0678 2928 2928 iso0678 K[loc][","][678](r)
## iso0677 2929 2929 iso0677 K[loc][","][677](r)
## iso0676 2930 2930 iso0676 K[loc][","][676](r)
## iso0675 2931 2931 iso0675 K[loc][","][675](r)
## iso0674 2932 2932 iso0674 K[loc][","][674](r)
## iso0673 2933 2933 iso0673 K[loc][","][673](r)
## iso0672 2934 2934 iso0672 K[loc][","][672](r)
## iso0671 2935 2935 iso0671 K[loc][","][671](r)
## iso0670 2936 2936 iso0670 K[loc][","][670](r)
## iso0669 2937 2937 iso0669 K[loc][","][669](r)
## iso0668 2938 2938 iso0668 K[loc][","][668](r)
## iso0667 2939 2939 iso0667 K[loc][","][667](r)
## iso0666 2940 2940 iso0666 K[loc][","][666](r)
## iso0665 2941 2941 iso0665 K[loc][","][665](r)
## iso0664 2942 2942 iso0664 K[loc][","][664](r)
## iso0663 2943 2943 iso0663 K[loc][","][663](r)
## iso0662 2944 2944 iso0662 K[loc][","][662](r)
## iso0661 2945 2945 iso0661 K[loc][","][661](r)
## iso0660 2946 2946 iso0660 K[loc][","][660](r)
## iso0659 2947 2947 iso0659 K[loc][","][659](r)
## iso0658 2948 2948 iso0658 K[loc][","][658](r)
## iso0657 2949 2949 iso0657 K[loc][","][657](r)
## iso0656 2950 2950 iso0656 K[loc][","][656](r)
## iso0655 2951 2951 iso0655 K[loc][","][655](r)
## iso0654 2952 2952 iso0654 K[loc][","][654](r)
## iso0653 2953 2953 iso0653 K[loc][","][653](r)
## iso0652 2954 2954 iso0652 K[loc][","][652](r)
## iso0651 2955 2955 iso0651 K[loc][","][651](r)
## iso0650 2956 2956 iso0650 K[loc][","][650](r)
## iso0649 2957 2957 iso0649 K[loc][","][649](r)
## iso0648 2958 2958 iso0648 K[loc][","][648](r)
## iso0647 2959 2959 iso0647 K[loc][","][647](r)
## iso0646 2960 2960 iso0646 K[loc][","][646](r)
## iso0645 2961 2961 iso0645 K[loc][","][645](r)
## iso0644 2962 2962 iso0644 K[loc][","][644](r)
## iso0643 2963 2963 iso0643 K[loc][","][643](r)
## iso0642 2964 2964 iso0642 K[loc][","][642](r)
## iso0641 2965 2965 iso0641 K[loc][","][641](r)
## iso0640 2966 2966 iso0640 K[loc][","][640](r)
## iso0639 2967 2967 iso0639 K[loc][","][639](r)
## iso0638 2968 2968 iso0638 K[loc][","][638](r)
## iso0637 2969 2969 iso0637 K[loc][","][637](r)
## iso0636 2970 2970 iso0636 K[loc][","][636](r)
## iso0635 2971 2971 iso0635 K[loc][","][635](r)
## iso0634 2972 2972 iso0634 K[loc][","][634](r)
## iso0633 2973 2973 iso0633 K[loc][","][633](r)
## iso0632 2974 2974 iso0632 K[loc][","][632](r)
## iso0631 2975 2975 iso0631 K[loc][","][631](r)
## iso0630 2976 2976 iso0630 K[loc][","][630](r)
## iso0629 2977 2977 iso0629 K[loc][","][629](r)
## iso0628 2978 2978 iso0628 K[loc][","][628](r)
## iso0627 2979 2979 iso0627 K[loc][","][627](r)
## iso0626 2980 2980 iso0626 K[loc][","][626](r)
## iso0625 2981 2981 iso0625 K[loc][","][625](r)
## iso0624 2982 2982 iso0624 K[loc][","][624](r)
## iso0623 2983 2983 iso0623 K[loc][","][623](r)
## iso0622 2984 2984 iso0622 K[loc][","][622](r)
## iso0621 2985 2985 iso0621 K[loc][","][621](r)
## iso0620 2986 2986 iso0620 K[loc][","][620](r)
## iso0619 2987 2987 iso0619 K[loc][","][619](r)
## iso0618 2988 2988 iso0618 K[loc][","][618](r)
## iso0617 2989 2989 iso0617 K[loc][","][617](r)
## iso0616 2990 2990 iso0616 K[loc][","][616](r)
## iso0615 2991 2991 iso0615 K[loc][","][615](r)
## iso0614 2992 2992 iso0614 K[loc][","][614](r)
## iso0613 2993 2993 iso0613 K[loc][","][613](r)
## iso0612 2994 2994 iso0612 K[loc][","][612](r)
## iso0611 2995 2995 iso0611 K[loc][","][611](r)
## iso0610 2996 2996 iso0610 K[loc][","][610](r)
## iso0609 2997 2997 iso0609 K[loc][","][609](r)
## iso0608 2998 2998 iso0608 K[loc][","][608](r)
## iso0607 2999 2999 iso0607 K[loc][","][607](r)
## iso0606 3000 3000 iso0606 K[loc][","][606](r)
## iso0605 3001 3001 iso0605 K[loc][","][605](r)
## iso0604 3002 3002 iso0604 K[loc][","][604](r)
## iso0603 3003 3003 iso0603 K[loc][","][603](r)
## iso0602 3004 3004 iso0602 K[loc][","][602](r)
## iso0601 3005 3005 iso0601 K[loc][","][601](r)
## iso0600 3006 3006 iso0600 K[loc][","][600](r)
## iso0599 3007 3007 iso0599 K[loc][","][599](r)
## iso0598 3008 3008 iso0598 K[loc][","][598](r)
## iso0597 3009 3009 iso0597 K[loc][","][597](r)
## iso0596 3010 3010 iso0596 K[loc][","][596](r)
## iso0595 3011 3011 iso0595 K[loc][","][595](r)
## iso0594 3012 3012 iso0594 K[loc][","][594](r)
## iso0593 3013 3013 iso0593 K[loc][","][593](r)
## iso0592 3014 3014 iso0592 K[loc][","][592](r)
## iso0591 3015 3015 iso0591 K[loc][","][591](r)
## iso0590 3016 3016 iso0590 K[loc][","][590](r)
## iso0589 3017 3017 iso0589 K[loc][","][589](r)
## iso0588 3018 3018 iso0588 K[loc][","][588](r)
## iso0587 3019 3019 iso0587 K[loc][","][587](r)
## iso0586 3020 3020 iso0586 K[loc][","][586](r)
## iso0585 3021 3021 iso0585 K[loc][","][585](r)
## iso0584 3022 3022 iso0584 K[loc][","][584](r)
## iso0583 3023 3023 iso0583 K[loc][","][583](r)
## iso0582 3024 3024 iso0582 K[loc][","][582](r)
## iso0581 3025 3025 iso0581 K[loc][","][581](r)
## iso0580 3026 3026 iso0580 K[loc][","][580](r)
## iso0579 3027 3027 iso0579 K[loc][","][579](r)
## iso0578 3028 3028 iso0578 K[loc][","][578](r)
## iso0577 3029 3029 iso0577 K[loc][","][577](r)
## iso0576 3030 3030 iso0576 K[loc][","][576](r)
## iso0575 3031 3031 iso0575 K[loc][","][575](r)
## iso0574 3032 3032 iso0574 K[loc][","][574](r)
## iso0573 3033 3033 iso0573 K[loc][","][573](r)
## iso0572 3034 3034 iso0572 K[loc][","][572](r)
## iso0571 3035 3035 iso0571 K[loc][","][571](r)
## iso0570 3036 3036 iso0570 K[loc][","][570](r)
## iso0569 3037 3037 iso0569 K[loc][","][569](r)
## iso0568 3038 3038 iso0568 K[loc][","][568](r)
## iso0567 3039 3039 iso0567 K[loc][","][567](r)
## iso0566 3040 3040 iso0566 K[loc][","][566](r)
## iso0565 3041 3041 iso0565 K[loc][","][565](r)
## iso0564 3042 3042 iso0564 K[loc][","][564](r)
## iso0563 3043 3043 iso0563 K[loc][","][563](r)
## iso0562 3044 3044 iso0562 K[loc][","][562](r)
## iso0561 3045 3045 iso0561 K[loc][","][561](r)
## iso0560 3046 3046 iso0560 K[loc][","][560](r)
## iso0559 3047 3047 iso0559 K[loc][","][559](r)
## iso0558 3048 3048 iso0558 K[loc][","][558](r)
## iso0557 3049 3049 iso0557 K[loc][","][557](r)
## iso0556 3050 3050 iso0556 K[loc][","][556](r)
## iso0555 3051 3051 iso0555 K[loc][","][555](r)
## iso0554 3052 3052 iso0554 K[loc][","][554](r)
## iso0553 3053 3053 iso0553 K[loc][","][553](r)
## iso0552 3054 3054 iso0552 K[loc][","][552](r)
## iso0551 3055 3055 iso0551 K[loc][","][551](r)
## iso0550 3056 3056 iso0550 K[loc][","][550](r)
## iso0549 3057 3057 iso0549 K[loc][","][549](r)
## iso0548 3058 3058 iso0548 K[loc][","][548](r)
## iso0547 3059 3059 iso0547 K[loc][","][547](r)
## iso0546 3060 3060 iso0546 K[loc][","][546](r)
## iso0545 3061 3061 iso0545 K[loc][","][545](r)
## iso0544 3062 3062 iso0544 K[loc][","][544](r)
## iso0543 3063 3063 iso0543 K[loc][","][543](r)
## iso0542 3064 3064 iso0542 K[loc][","][542](r)
## iso0541 3065 3065 iso0541 K[loc][","][541](r)
## iso0540 3066 3066 iso0540 K[loc][","][540](r)
## iso0539 3067 3067 iso0539 K[loc][","][539](r)
## iso0538 3068 3068 iso0538 K[loc][","][538](r)
## iso0537 3069 3069 iso0537 K[loc][","][537](r)
## iso0536 3070 3070 iso0536 K[loc][","][536](r)
## iso0535 3071 3071 iso0535 K[loc][","][535](r)
## iso0534 3072 3072 iso0534 K[loc][","][534](r)
## iso0533 3073 3073 iso0533 K[loc][","][533](r)
## iso0532 3074 3074 iso0532 K[loc][","][532](r)
## iso0531 3075 3075 iso0531 K[loc][","][531](r)
## iso0530 3076 3076 iso0530 K[loc][","][530](r)
## iso0529 3077 3077 iso0529 K[loc][","][529](r)
## iso0528 3078 3078 iso0528 K[loc][","][528](r)
## iso0527 3079 3079 iso0527 K[loc][","][527](r)
## iso0526 3080 3080 iso0526 K[loc][","][526](r)
## iso0525 3081 3081 iso0525 K[loc][","][525](r)
## iso0524 3082 3082 iso0524 K[loc][","][524](r)
## iso0523 3083 3083 iso0523 K[loc][","][523](r)
## iso0522 3084 3084 iso0522 K[loc][","][522](r)
## iso0521 3085 3085 iso0521 K[loc][","][521](r)
## iso0520 3086 3086 iso0520 K[loc][","][520](r)
## iso0519 3087 3087 iso0519 K[loc][","][519](r)
## iso0518 3088 3088 iso0518 K[loc][","][518](r)
## iso0517 3089 3089 iso0517 K[loc][","][517](r)
## iso0516 3090 3090 iso0516 K[loc][","][516](r)
## iso0515 3091 3091 iso0515 K[loc][","][515](r)
## iso0514 3092 3092 iso0514 K[loc][","][514](r)
## iso0513 3093 3093 iso0513 K[loc][","][513](r)
## iso0512 3094 3094 iso0512 K[loc][","][512](r)
## iso0511 3095 3095 iso0511 K[loc][","][511](r)
## iso0510 3096 3096 iso0510 K[loc][","][510](r)
## iso0509 3097 3097 iso0509 K[loc][","][509](r)
## iso0508 3098 3098 iso0508 K[loc][","][508](r)
## iso0507 3099 3099 iso0507 K[loc][","][507](r)
## iso0506 3100 3100 iso0506 K[loc][","][506](r)
## iso0505 3101 3101 iso0505 K[loc][","][505](r)
## iso0504 3102 3102 iso0504 K[loc][","][504](r)
## iso0503 3103 3103 iso0503 K[loc][","][503](r)
## iso0502 3104 3104 iso0502 K[loc][","][502](r)
## iso0501 3105 3105 iso0501 K[loc][","][501](r)
## iso0500 3106 3106 iso0500 K[loc][","][500](r)
## iso0499 3107 3107 iso0499 K[loc][","][499](r)
## iso0498 3108 3108 iso0498 K[loc][","][498](r)
## iso0497 3109 3109 iso0497 K[loc][","][497](r)
## iso0496 3110 3110 iso0496 K[loc][","][496](r)
## iso0495 3111 3111 iso0495 K[loc][","][495](r)
## iso0494 3112 3112 iso0494 K[loc][","][494](r)
## iso0493 3113 3113 iso0493 K[loc][","][493](r)
## iso0492 3114 3114 iso0492 K[loc][","][492](r)
## iso0491 3115 3115 iso0491 K[loc][","][491](r)
## iso0490 3116 3116 iso0490 K[loc][","][490](r)
## iso0489 3117 3117 iso0489 K[loc][","][489](r)
## iso0488 3118 3118 iso0488 K[loc][","][488](r)
## iso0487 3119 3119 iso0487 K[loc][","][487](r)
## iso0486 3120 3120 iso0486 K[loc][","][486](r)
## iso0485 3121 3121 iso0485 K[loc][","][485](r)
## iso0484 3122 3122 iso0484 K[loc][","][484](r)
## iso0483 3123 3123 iso0483 K[loc][","][483](r)
## iso0482 3124 3124 iso0482 K[loc][","][482](r)
## iso0481 3125 3125 iso0481 K[loc][","][481](r)
## iso0480 3126 3126 iso0480 K[loc][","][480](r)
## iso0479 3127 3127 iso0479 K[loc][","][479](r)
## iso0478 3128 3128 iso0478 K[loc][","][478](r)
## iso0477 3129 3129 iso0477 K[loc][","][477](r)
## iso0476 3130 3130 iso0476 K[loc][","][476](r)
## iso0475 3131 3131 iso0475 K[loc][","][475](r)
## iso0474 3132 3132 iso0474 K[loc][","][474](r)
## iso0473 3133 3133 iso0473 K[loc][","][473](r)
## iso0472 3134 3134 iso0472 K[loc][","][472](r)
## iso0471 3135 3135 iso0471 K[loc][","][471](r)
## iso0470 3136 3136 iso0470 K[loc][","][470](r)
## iso0469 3137 3137 iso0469 K[loc][","][469](r)
## iso0468 3138 3138 iso0468 K[loc][","][468](r)
## iso0467 3139 3139 iso0467 K[loc][","][467](r)
## iso0466 3140 3140 iso0466 K[loc][","][466](r)
## iso0465 3141 3141 iso0465 K[loc][","][465](r)
## iso0464 3142 3142 iso0464 K[loc][","][464](r)
## iso0463 3143 3143 iso0463 K[loc][","][463](r)
## iso0462 3144 3144 iso0462 K[loc][","][462](r)
## iso0461 3145 3145 iso0461 K[loc][","][461](r)
## iso0460 3146 3146 iso0460 K[loc][","][460](r)
## iso0459 3147 3147 iso0459 K[loc][","][459](r)
## iso0458 3148 3148 iso0458 K[loc][","][458](r)
## iso0457 3149 3149 iso0457 K[loc][","][457](r)
## iso0456 3150 3150 iso0456 K[loc][","][456](r)
## iso0455 3151 3151 iso0455 K[loc][","][455](r)
## iso0454 3152 3152 iso0454 K[loc][","][454](r)
## iso0453 3153 3153 iso0453 K[loc][","][453](r)
## iso0452 3154 3154 iso0452 K[loc][","][452](r)
## iso0451 3155 3155 iso0451 K[loc][","][451](r)
## iso0450 3156 3156 iso0450 K[loc][","][450](r)
## iso0449 3157 3157 iso0449 K[loc][","][449](r)
## iso0448 3158 3158 iso0448 K[loc][","][448](r)
## iso0447 3159 3159 iso0447 K[loc][","][447](r)
## iso0446 3160 3160 iso0446 K[loc][","][446](r)
## iso0445 3161 3161 iso0445 K[loc][","][445](r)
## iso0444 3162 3162 iso0444 K[loc][","][444](r)
## iso0443 3163 3163 iso0443 K[loc][","][443](r)
## iso0442 3164 3164 iso0442 K[loc][","][442](r)
## iso0441 3165 3165 iso0441 K[loc][","][441](r)
## iso0440 3166 3166 iso0440 K[loc][","][440](r)
## iso0439 3167 3167 iso0439 K[loc][","][439](r)
## iso0438 3168 3168 iso0438 K[loc][","][438](r)
## iso0437 3169 3169 iso0437 K[loc][","][437](r)
## iso0436 3170 3170 iso0436 K[loc][","][436](r)
## iso0435 3171 3171 iso0435 K[loc][","][435](r)
## iso0434 3172 3172 iso0434 K[loc][","][434](r)
## iso0433 3173 3173 iso0433 K[loc][","][433](r)
## iso0432 3174 3174 iso0432 K[loc][","][432](r)
## iso0431 3175 3175 iso0431 K[loc][","][431](r)
## iso0430 3176 3176 iso0430 K[loc][","][430](r)
## iso0429 3177 3177 iso0429 K[loc][","][429](r)
## iso0428 3178 3178 iso0428 K[loc][","][428](r)
## iso0427 3179 3179 iso0427 K[loc][","][427](r)
## iso0426 3180 3180 iso0426 K[loc][","][426](r)
## iso0425 3181 3181 iso0425 K[loc][","][425](r)
## iso0424 3182 3182 iso0424 K[loc][","][424](r)
## iso0423 3183 3183 iso0423 K[loc][","][423](r)
## iso0422 3184 3184 iso0422 K[loc][","][422](r)
## iso0421 3185 3185 iso0421 K[loc][","][421](r)
## iso0420 3186 3186 iso0420 K[loc][","][420](r)
## iso0419 3187 3187 iso0419 K[loc][","][419](r)
## iso0418 3188 3188 iso0418 K[loc][","][418](r)
## iso0417 3189 3189 iso0417 K[loc][","][417](r)
## iso0416 3190 3190 iso0416 K[loc][","][416](r)
## iso0415 3191 3191 iso0415 K[loc][","][415](r)
## iso0414 3192 3192 iso0414 K[loc][","][414](r)
## iso0413 3193 3193 iso0413 K[loc][","][413](r)
## iso0412 3194 3194 iso0412 K[loc][","][412](r)
## iso0411 3195 3195 iso0411 K[loc][","][411](r)
## iso0410 3196 3196 iso0410 K[loc][","][410](r)
## iso0409 3197 3197 iso0409 K[loc][","][409](r)
## iso0408 3198 3198 iso0408 K[loc][","][408](r)
## iso0407 3199 3199 iso0407 K[loc][","][407](r)
## iso0406 3200 3200 iso0406 K[loc][","][406](r)
## iso0405 3201 3201 iso0405 K[loc][","][405](r)
## iso0404 3202 3202 iso0404 K[loc][","][404](r)
## iso0403 3203 3203 iso0403 K[loc][","][403](r)
## iso0402 3204 3204 iso0402 K[loc][","][402](r)
## iso0401 3205 3205 iso0401 K[loc][","][401](r)
## iso0400 3206 3206 iso0400 K[loc][","][400](r)
## iso0399 3207 3207 iso0399 K[loc][","][399](r)
## iso0398 3208 3208 iso0398 K[loc][","][398](r)
## iso0397 3209 3209 iso0397 K[loc][","][397](r)
## iso0396 3210 3210 iso0396 K[loc][","][396](r)
## iso0395 3211 3211 iso0395 K[loc][","][395](r)
## iso0394 3212 3212 iso0394 K[loc][","][394](r)
## iso0393 3213 3213 iso0393 K[loc][","][393](r)
## iso0392 3214 3214 iso0392 K[loc][","][392](r)
## iso0391 3215 3215 iso0391 K[loc][","][391](r)
## iso0390 3216 3216 iso0390 K[loc][","][390](r)
## iso0389 3217 3217 iso0389 K[loc][","][389](r)
## iso0388 3218 3218 iso0388 K[loc][","][388](r)
## iso0387 3219 3219 iso0387 K[loc][","][387](r)
## iso0386 3220 3220 iso0386 K[loc][","][386](r)
## iso0385 3221 3221 iso0385 K[loc][","][385](r)
## iso0384 3222 3222 iso0384 K[loc][","][384](r)
## iso0383 3223 3223 iso0383 K[loc][","][383](r)
## iso0382 3224 3224 iso0382 K[loc][","][382](r)
## iso0381 3225 3225 iso0381 K[loc][","][381](r)
## iso0380 3226 3226 iso0380 K[loc][","][380](r)
## iso0379 3227 3227 iso0379 K[loc][","][379](r)
## iso0378 3228 3228 iso0378 K[loc][","][378](r)
## iso0377 3229 3229 iso0377 K[loc][","][377](r)
## iso0376 3230 3230 iso0376 K[loc][","][376](r)
## iso0375 3231 3231 iso0375 K[loc][","][375](r)
## iso0374 3232 3232 iso0374 K[loc][","][374](r)
## iso0373 3233 3233 iso0373 K[loc][","][373](r)
## iso0372 3234 3234 iso0372 K[loc][","][372](r)
## iso0371 3235 3235 iso0371 K[loc][","][371](r)
## iso0370 3236 3236 iso0370 K[loc][","][370](r)
## iso0369 3237 3237 iso0369 K[loc][","][369](r)
## iso0368 3238 3238 iso0368 K[loc][","][368](r)
## iso0367 3239 3239 iso0367 K[loc][","][367](r)
## iso0366 3240 3240 iso0366 K[loc][","][366](r)
## iso0365 3241 3241 iso0365 K[loc][","][365](r)
## iso0364 3242 3242 iso0364 K[loc][","][364](r)
## iso0363 3243 3243 iso0363 K[loc][","][363](r)
## iso0362 3244 3244 iso0362 K[loc][","][362](r)
## iso0361 3245 3245 iso0361 K[loc][","][361](r)
## iso0360 3246 3246 iso0360 K[loc][","][360](r)
## iso0359 3247 3247 iso0359 K[loc][","][359](r)
## iso0358 3248 3248 iso0358 K[loc][","][358](r)
## iso0357 3249 3249 iso0357 K[loc][","][357](r)
## iso0356 3250 3250 iso0356 K[loc][","][356](r)
## iso0355 3251 3251 iso0355 K[loc][","][355](r)
## iso0354 3252 3252 iso0354 K[loc][","][354](r)
## iso0353 3253 3253 iso0353 K[loc][","][353](r)
## iso0352 3254 3254 iso0352 K[loc][","][352](r)
## iso0351 3255 3255 iso0351 K[loc][","][351](r)
## iso0350 3256 3256 iso0350 K[loc][","][350](r)
## iso0349 3257 3257 iso0349 K[loc][","][349](r)
## iso0348 3258 3258 iso0348 K[loc][","][348](r)
## iso0347 3259 3259 iso0347 K[loc][","][347](r)
## iso0346 3260 3260 iso0346 K[loc][","][346](r)
## iso0345 3261 3261 iso0345 K[loc][","][345](r)
## iso0344 3262 3262 iso0344 K[loc][","][344](r)
## iso0343 3263 3263 iso0343 K[loc][","][343](r)
## iso0342 3264 3264 iso0342 K[loc][","][342](r)
## iso0341 3265 3265 iso0341 K[loc][","][341](r)
## iso0340 3266 3266 iso0340 K[loc][","][340](r)
## iso0339 3267 3267 iso0339 K[loc][","][339](r)
## iso0338 3268 3268 iso0338 K[loc][","][338](r)
## iso0337 3269 3269 iso0337 K[loc][","][337](r)
## iso0336 3270 3270 iso0336 K[loc][","][336](r)
## iso0335 3271 3271 iso0335 K[loc][","][335](r)
## iso0334 3272 3272 iso0334 K[loc][","][334](r)
## iso0333 3273 3273 iso0333 K[loc][","][333](r)
## iso0332 3274 3274 iso0332 K[loc][","][332](r)
## iso0331 3275 3275 iso0331 K[loc][","][331](r)
## iso0330 3276 3276 iso0330 K[loc][","][330](r)
## iso0329 3277 3277 iso0329 K[loc][","][329](r)
## iso0328 3278 3278 iso0328 K[loc][","][328](r)
## iso0327 3279 3279 iso0327 K[loc][","][327](r)
## iso0326 3280 3280 iso0326 K[loc][","][326](r)
## iso0325 3281 3281 iso0325 K[loc][","][325](r)
## iso0324 3282 3282 iso0324 K[loc][","][324](r)
## iso0323 3283 3283 iso0323 K[loc][","][323](r)
## iso0322 3284 3284 iso0322 K[loc][","][322](r)
## iso0321 3285 3285 iso0321 K[loc][","][321](r)
## iso0320 3286 3286 iso0320 K[loc][","][320](r)
## iso0319 3287 3287 iso0319 K[loc][","][319](r)
## iso0318 3288 3288 iso0318 K[loc][","][318](r)
## iso0317 3289 3289 iso0317 K[loc][","][317](r)
## iso0316 3290 3290 iso0316 K[loc][","][316](r)
## iso0315 3291 3291 iso0315 K[loc][","][315](r)
## iso0314 3292 3292 iso0314 K[loc][","][314](r)
## iso0313 3293 3293 iso0313 K[loc][","][313](r)
## iso0312 3294 3294 iso0312 K[loc][","][312](r)
## iso0311 3295 3295 iso0311 K[loc][","][311](r)
## iso0310 3296 3296 iso0310 K[loc][","][310](r)
## iso0309 3297 3297 iso0309 K[loc][","][309](r)
## iso0308 3298 3298 iso0308 K[loc][","][308](r)
## iso0307 3299 3299 iso0307 K[loc][","][307](r)
## iso0306 3300 3300 iso0306 K[loc][","][306](r)
## iso0305 3301 3301 iso0305 K[loc][","][305](r)
## iso0304 3302 3302 iso0304 K[loc][","][304](r)
## iso0303 3303 3303 iso0303 K[loc][","][303](r)
## iso0302 3304 3304 iso0302 K[loc][","][302](r)
## iso0301 3305 3305 iso0301 K[loc][","][301](r)
## iso0300 3306 3306 iso0300 K[loc][","][300](r)
## iso0299 3307 3307 iso0299 K[loc][","][299](r)
## iso0298 3308 3308 iso0298 K[loc][","][298](r)
## iso0297 3309 3309 iso0297 K[loc][","][297](r)
## iso0296 3310 3310 iso0296 K[loc][","][296](r)
## iso0295 3311 3311 iso0295 K[loc][","][295](r)
## iso0294 3312 3312 iso0294 K[loc][","][294](r)
## iso0293 3313 3313 iso0293 K[loc][","][293](r)
## iso0292 3314 3314 iso0292 K[loc][","][292](r)
## iso0291 3315 3315 iso0291 K[loc][","][291](r)
## iso0290 3316 3316 iso0290 K[loc][","][290](r)
## iso0289 3317 3317 iso0289 K[loc][","][289](r)
## iso0288 3318 3318 iso0288 K[loc][","][288](r)
## iso0287 3319 3319 iso0287 K[loc][","][287](r)
## iso0286 3320 3320 iso0286 K[loc][","][286](r)
## iso0285 3321 3321 iso0285 K[loc][","][285](r)
## iso0284 3322 3322 iso0284 K[loc][","][284](r)
## iso0283 3323 3323 iso0283 K[loc][","][283](r)
## iso0282 3324 3324 iso0282 K[loc][","][282](r)
## iso0281 3325 3325 iso0281 K[loc][","][281](r)
## iso0280 3326 3326 iso0280 K[loc][","][280](r)
## iso0279 3327 3327 iso0279 K[loc][","][279](r)
## iso0278 3328 3328 iso0278 K[loc][","][278](r)
## iso0277 3329 3329 iso0277 K[loc][","][277](r)
## iso0276 3330 3330 iso0276 K[loc][","][276](r)
## iso0275 3331 3331 iso0275 K[loc][","][275](r)
## iso0274 3332 3332 iso0274 K[loc][","][274](r)
## iso0273 3333 3333 iso0273 K[loc][","][273](r)
## iso0272 3334 3334 iso0272 K[loc][","][272](r)
## iso0271 3335 3335 iso0271 K[loc][","][271](r)
## iso0270 3336 3336 iso0270 K[loc][","][270](r)
## iso0269 3337 3337 iso0269 K[loc][","][269](r)
## iso0268 3338 3338 iso0268 K[loc][","][268](r)
## iso0267 3339 3339 iso0267 K[loc][","][267](r)
## iso0266 3340 3340 iso0266 K[loc][","][266](r)
## iso0265 3341 3341 iso0265 K[loc][","][265](r)
## iso0264 3342 3342 iso0264 K[loc][","][264](r)
## iso0263 3343 3343 iso0263 K[loc][","][263](r)
## iso0262 3344 3344 iso0262 K[loc][","][262](r)
## iso0261 3345 3345 iso0261 K[loc][","][261](r)
## iso0260 3346 3346 iso0260 K[loc][","][260](r)
## iso0259 3347 3347 iso0259 K[loc][","][259](r)
## iso0258 3348 3348 iso0258 K[loc][","][258](r)
## iso0257 3349 3349 iso0257 K[loc][","][257](r)
## iso0256 3350 3350 iso0256 K[loc][","][256](r)
## iso0255 3351 3351 iso0255 K[loc][","][255](r)
## iso0254 3352 3352 iso0254 K[loc][","][254](r)
## iso0253 3353 3353 iso0253 K[loc][","][253](r)
## iso0252 3354 3354 iso0252 K[loc][","][252](r)
## iso0251 3355 3355 iso0251 K[loc][","][251](r)
## iso0250 3356 3356 iso0250 K[loc][","][250](r)
## iso0249 3357 3357 iso0249 K[loc][","][249](r)
## iso0248 3358 3358 iso0248 K[loc][","][248](r)
## iso0247 3359 3359 iso0247 K[loc][","][247](r)
## iso0246 3360 3360 iso0246 K[loc][","][246](r)
## iso0245 3361 3361 iso0245 K[loc][","][245](r)
## iso0244 3362 3362 iso0244 K[loc][","][244](r)
## iso0243 3363 3363 iso0243 K[loc][","][243](r)
## iso0242 3364 3364 iso0242 K[loc][","][242](r)
## iso0241 3365 3365 iso0241 K[loc][","][241](r)
## iso0240 3366 3366 iso0240 K[loc][","][240](r)
## iso0239 3367 3367 iso0239 K[loc][","][239](r)
## iso0238 3368 3368 iso0238 K[loc][","][238](r)
## iso0237 3369 3369 iso0237 K[loc][","][237](r)
## iso0236 3370 3370 iso0236 K[loc][","][236](r)
## iso0235 3371 3371 iso0235 K[loc][","][235](r)
## iso0234 3372 3372 iso0234 K[loc][","][234](r)
## iso0233 3373 3373 iso0233 K[loc][","][233](r)
## iso0232 3374 3374 iso0232 K[loc][","][232](r)
## iso0231 3375 3375 iso0231 K[loc][","][231](r)
## iso0230 3376 3376 iso0230 K[loc][","][230](r)
## iso0229 3377 3377 iso0229 K[loc][","][229](r)
## iso0228 3378 3378 iso0228 K[loc][","][228](r)
## iso0227 3379 3379 iso0227 K[loc][","][227](r)
## iso0226 3380 3380 iso0226 K[loc][","][226](r)
## iso0225 3381 3381 iso0225 K[loc][","][225](r)
## iso0224 3382 3382 iso0224 K[loc][","][224](r)
## iso0223 3383 3383 iso0223 K[loc][","][223](r)
## iso0222 3384 3384 iso0222 K[loc][","][222](r)
## iso0221 3385 3385 iso0221 K[loc][","][221](r)
## iso0220 3386 3386 iso0220 K[loc][","][220](r)
## iso0219 3387 3387 iso0219 K[loc][","][219](r)
## iso0218 3388 3388 iso0218 K[loc][","][218](r)
## iso0217 3389 3389 iso0217 K[loc][","][217](r)
## iso0216 3390 3390 iso0216 K[loc][","][216](r)
## iso0215 3391 3391 iso0215 K[loc][","][215](r)
## iso0214 3392 3392 iso0214 K[loc][","][214](r)
## iso0213 3393 3393 iso0213 K[loc][","][213](r)
## iso0212 3394 3394 iso0212 K[loc][","][212](r)
## iso0211 3395 3395 iso0211 K[loc][","][211](r)
## iso0210 3396 3396 iso0210 K[loc][","][210](r)
## iso0209 3397 3397 iso0209 K[loc][","][209](r)
## iso0208 3398 3398 iso0208 K[loc][","][208](r)
## iso0207 3399 3399 iso0207 K[loc][","][207](r)
## iso0206 3400 3400 iso0206 K[loc][","][206](r)
## iso0205 3401 3401 iso0205 K[loc][","][205](r)
## iso0204 3402 3402 iso0204 K[loc][","][204](r)
## iso0203 3403 3403 iso0203 K[loc][","][203](r)
## iso0202 3404 3404 iso0202 K[loc][","][202](r)
## iso0201 3405 3405 iso0201 K[loc][","][201](r)
## iso0200 3406 3406 iso0200 K[loc][","][200](r)
## iso0199 3407 3407 iso0199 K[loc][","][199](r)
## iso0198 3408 3408 iso0198 K[loc][","][198](r)
## iso0197 3409 3409 iso0197 K[loc][","][197](r)
## iso0196 3410 3410 iso0196 K[loc][","][196](r)
## iso0195 3411 3411 iso0195 K[loc][","][195](r)
## iso0194 3412 3412 iso0194 K[loc][","][194](r)
## iso0193 3413 3413 iso0193 K[loc][","][193](r)
## iso0192 3414 3414 iso0192 K[loc][","][192](r)
## iso0191 3415 3415 iso0191 K[loc][","][191](r)
## iso0190 3416 3416 iso0190 K[loc][","][190](r)
## iso0189 3417 3417 iso0189 K[loc][","][189](r)
## iso0188 3418 3418 iso0188 K[loc][","][188](r)
## iso0187 3419 3419 iso0187 K[loc][","][187](r)
## iso0186 3420 3420 iso0186 K[loc][","][186](r)
## iso0185 3421 3421 iso0185 K[loc][","][185](r)
## iso0184 3422 3422 iso0184 K[loc][","][184](r)
## iso0183 3423 3423 iso0183 K[loc][","][183](r)
## iso0182 3424 3424 iso0182 K[loc][","][182](r)
## iso0181 3425 3425 iso0181 K[loc][","][181](r)
## iso0180 3426 3426 iso0180 K[loc][","][180](r)
## iso0179 3427 3427 iso0179 K[loc][","][179](r)
## iso0178 3428 3428 iso0178 K[loc][","][178](r)
## iso0177 3429 3429 iso0177 K[loc][","][177](r)
## iso0176 3430 3430 iso0176 K[loc][","][176](r)
## iso0175 3431 3431 iso0175 K[loc][","][175](r)
## iso0174 3432 3432 iso0174 K[loc][","][174](r)
## iso0173 3433 3433 iso0173 K[loc][","][173](r)
## iso0172 3434 3434 iso0172 K[loc][","][172](r)
## iso0171 3435 3435 iso0171 K[loc][","][171](r)
## iso0170 3436 3436 iso0170 K[loc][","][170](r)
## iso0169 3437 3437 iso0169 K[loc][","][169](r)
## iso0168 3438 3438 iso0168 K[loc][","][168](r)
## iso0167 3439 3439 iso0167 K[loc][","][167](r)
## iso0166 3440 3440 iso0166 K[loc][","][166](r)
## iso0165 3441 3441 iso0165 K[loc][","][165](r)
## iso0164 3442 3442 iso0164 K[loc][","][164](r)
## iso0163 3443 3443 iso0163 K[loc][","][163](r)
## iso0162 3444 3444 iso0162 K[loc][","][162](r)
## iso0161 3445 3445 iso0161 K[loc][","][161](r)
## iso0160 3446 3446 iso0160 K[loc][","][160](r)
## iso0159 3447 3447 iso0159 K[loc][","][159](r)
## iso0158 3448 3448 iso0158 K[loc][","][158](r)
## iso0157 3449 3449 iso0157 K[loc][","][157](r)
## iso0156 3450 3450 iso0156 K[loc][","][156](r)
## iso0155 3451 3451 iso0155 K[loc][","][155](r)
## iso0154 3452 3452 iso0154 K[loc][","][154](r)
## iso0153 3453 3453 iso0153 K[loc][","][153](r)
## iso0152 3454 3454 iso0152 K[loc][","][152](r)
## iso0151 3455 3455 iso0151 K[loc][","][151](r)
## iso0150 3456 3456 iso0150 K[loc][","][150](r)
## iso0149 3457 3457 iso0149 K[loc][","][149](r)
## iso0148 3458 3458 iso0148 K[loc][","][148](r)
## iso0147 3459 3459 iso0147 K[loc][","][147](r)
## iso0146 3460 3460 iso0146 K[loc][","][146](r)
## iso0145 3461 3461 iso0145 K[loc][","][145](r)
## iso0144 3462 3462 iso0144 K[loc][","][144](r)
## iso0143 3463 3463 iso0143 K[loc][","][143](r)
## iso0142 3464 3464 iso0142 K[loc][","][142](r)
## iso0141 3465 3465 iso0141 K[loc][","][141](r)
## iso0140 3466 3466 iso0140 K[loc][","][140](r)
## iso0139 3467 3467 iso0139 K[loc][","][139](r)
## iso0138 3468 3468 iso0138 K[loc][","][138](r)
## iso0137 3469 3469 iso0137 K[loc][","][137](r)
## iso0136 3470 3470 iso0136 K[loc][","][136](r)
## iso0135 3471 3471 iso0135 K[loc][","][135](r)
## iso0134 3472 3472 iso0134 K[loc][","][134](r)
## iso0133 3473 3473 iso0133 K[loc][","][133](r)
## iso0132 3474 3474 iso0132 K[loc][","][132](r)
## iso0131 3475 3475 iso0131 K[loc][","][131](r)
## iso0130 3476 3476 iso0130 K[loc][","][130](r)
## iso0129 3477 3477 iso0129 K[loc][","][129](r)
## iso0128 3478 3478 iso0128 K[loc][","][128](r)
## iso0127 3479 3479 iso0127 K[loc][","][127](r)
## iso0126 3480 3480 iso0126 K[loc][","][126](r)
## iso0125 3481 3481 iso0125 K[loc][","][125](r)
## iso0124 3482 3482 iso0124 K[loc][","][124](r)
## iso0123 3483 3483 iso0123 K[loc][","][123](r)
## iso0122 3484 3484 iso0122 K[loc][","][122](r)
## iso0121 3485 3485 iso0121 K[loc][","][121](r)
## iso0120 3486 3486 iso0120 K[loc][","][120](r)
## iso0119 3487 3487 iso0119 K[loc][","][119](r)
## iso0118 3488 3488 iso0118 K[loc][","][118](r)
## iso0117 3489 3489 iso0117 K[loc][","][117](r)
## iso0116 3490 3490 iso0116 K[loc][","][116](r)
## iso0115 3491 3491 iso0115 K[loc][","][115](r)
## iso0114 3492 3492 iso0114 K[loc][","][114](r)
## iso0113 3493 3493 iso0113 K[loc][","][113](r)
## iso0112 3494 3494 iso0112 K[loc][","][112](r)
## iso0111 3495 3495 iso0111 K[loc][","][111](r)
## iso0110 3496 3496 iso0110 K[loc][","][110](r)
## iso0109 3497 3497 iso0109 K[loc][","][109](r)
## iso0108 3498 3498 iso0108 K[loc][","][108](r)
## iso0107 3499 3499 iso0107 K[loc][","][107](r)
## iso0106 3500 3500 iso0106 K[loc][","][106](r)
## iso0105 3501 3501 iso0105 K[loc][","][105](r)
## iso0104 3502 3502 iso0104 K[loc][","][104](r)
## iso0103 3503 3503 iso0103 K[loc][","][103](r)
## iso0102 3504 3504 iso0102 K[loc][","][102](r)
## iso0101 3505 3505 iso0101 K[loc][","][101](r)
## iso0100 3506 3506 iso0100 K[loc][","][100](r)
## iso0099 3507 3507 iso0099 K[loc][","][99](r)
## iso0098 3508 3508 iso0098 K[loc][","][98](r)
## iso0097 3509 3509 iso0097 K[loc][","][97](r)
## iso0096 3510 3510 iso0096 K[loc][","][96](r)
## iso0095 3511 3511 iso0095 K[loc][","][95](r)
## iso0094 3512 3512 iso0094 K[loc][","][94](r)
## iso0093 3513 3513 iso0093 K[loc][","][93](r)
## iso0092 3514 3514 iso0092 K[loc][","][92](r)
## iso0091 3515 3515 iso0091 K[loc][","][91](r)
## iso0090 3516 3516 iso0090 K[loc][","][90](r)
## iso0089 3517 3517 iso0089 K[loc][","][89](r)
## iso0088 3518 3518 iso0088 K[loc][","][88](r)
## iso0087 3519 3519 iso0087 K[loc][","][87](r)
## iso0086 3520 3520 iso0086 K[loc][","][86](r)
## iso0085 3521 3521 iso0085 K[loc][","][85](r)
## iso0084 3522 3522 iso0084 K[loc][","][84](r)
## iso0083 3523 3523 iso0083 K[loc][","][83](r)
## iso0082 3524 3524 iso0082 K[loc][","][82](r)
## iso0081 3525 3525 iso0081 K[loc][","][81](r)
## iso0080 3526 3526 iso0080 K[loc][","][80](r)
## iso0079 3527 3527 iso0079 K[loc][","][79](r)
## iso0078 3528 3528 iso0078 K[loc][","][78](r)
## iso0077 3529 3529 iso0077 K[loc][","][77](r)
## iso0076 3530 3530 iso0076 K[loc][","][76](r)
## iso0075 3531 3531 iso0075 K[loc][","][75](r)
## iso0074 3532 3532 iso0074 K[loc][","][74](r)
## iso0073 3533 3533 iso0073 K[loc][","][73](r)
## iso0072 3534 3534 iso0072 K[loc][","][72](r)
## iso0071 3535 3535 iso0071 K[loc][","][71](r)
## iso0070 3536 3536 iso0070 K[loc][","][70](r)
## iso0069 3537 3537 iso0069 K[loc][","][69](r)
## iso0068 3538 3538 iso0068 K[loc][","][68](r)
## iso0067 3539 3539 iso0067 K[loc][","][67](r)
## iso0066 3540 3540 iso0066 K[loc][","][66](r)
## iso0065 3541 3541 iso0065 K[loc][","][65](r)
## iso0064 3542 3542 iso0064 K[loc][","][64](r)
## iso0063 3543 3543 iso0063 K[loc][","][63](r)
## iso0062 3544 3544 iso0062 K[loc][","][62](r)
## iso0061 3545 3545 iso0061 K[loc][","][61](r)
## iso0060 3546 3546 iso0060 K[loc][","][60](r)
## iso0059 3547 3547 iso0059 K[loc][","][59](r)
## iso0058 3548 3548 iso0058 K[loc][","][58](r)
## iso0057 3549 3549 iso0057 K[loc][","][57](r)
## iso0056 3550 3550 iso0056 K[loc][","][56](r)
## iso0055 3551 3551 iso0055 K[loc][","][55](r)
## iso0054 3552 3552 iso0054 K[loc][","][54](r)
## iso0053 3553 3553 iso0053 K[loc][","][53](r)
## iso0052 3554 3554 iso0052 K[loc][","][52](r)
## iso0051 3555 3555 iso0051 K[loc][","][51](r)
## iso0050 3556 3556 iso0050 K[loc][","][50](r)
## iso0049 3557 3557 iso0049 K[loc][","][49](r)
## iso0048 3558 3558 iso0048 K[loc][","][48](r)
## iso0047 3559 3559 iso0047 K[loc][","][47](r)
## iso0046 3560 3560 iso0046 K[loc][","][46](r)
## iso0045 3561 3561 iso0045 K[loc][","][45](r)
## iso0044 3562 3562 iso0044 K[loc][","][44](r)
## iso0043 3563 3563 iso0043 K[loc][","][43](r)
## iso0042 3564 3564 iso0042 K[loc][","][42](r)
## iso0041 3565 3565 iso0041 K[loc][","][41](r)
## iso0040 3566 3566 iso0040 K[loc][","][40](r)
## iso0039 3567 3567 iso0039 K[loc][","][39](r)
## iso0038 3568 3568 iso0038 K[loc][","][38](r)
## iso0037 3569 3569 iso0037 K[loc][","][37](r)
## iso0036 3570 3570 iso0036 K[loc][","][36](r)
## iso0035 3571 3571 iso0035 K[loc][","][35](r)
## iso0034 3572 3572 iso0034 K[loc][","][34](r)
## iso0033 3573 3573 iso0033 K[loc][","][33](r)
## iso0032 3574 3574 iso0032 K[loc][","][32](r)
## iso0031 3575 3575 iso0031 K[loc][","][31](r)
## iso0030 3576 3576 iso0030 K[loc][","][30](r)
## iso0029 3577 3577 iso0029 K[loc][","][29](r)
## iso0028 3578 3578 iso0028 K[loc][","][28](r)
## iso0027 3579 3579 iso0027 K[loc][","][27](r)
## iso0026 3580 3580 iso0026 K[loc][","][26](r)
## iso0025 3581 3581 iso0025 K[loc][","][25](r)
## iso0024 3582 3582 iso0024 K[loc][","][24](r)
## iso0023 3583 3583 iso0023 K[loc][","][23](r)
## iso0022 3584 3584 iso0022 K[loc][","][22](r)
## iso0021 3585 3585 iso0021 K[loc][","][21](r)
## iso0020 3586 3586 iso0020 K[loc][","][20](r)
## iso0019 3587 3587 iso0019 K[loc][","][19](r)
## iso0018 3588 3588 iso0018 K[loc][","][18](r)
## iso0017 3589 3589 iso0017 K[loc][","][17](r)
## iso0016 3590 3590 iso0016 K[loc][","][16](r)
## iso0015 3591 3591 iso0015 K[loc][","][15](r)
## iso0014 3592 3592 iso0014 K[loc][","][14](r)
## iso0013 3593 3593 iso0013 K[loc][","][13](r)
## iso0012 3594 3594 iso0012 K[loc][","][12](r)
## iso0011 3595 3595 iso0011 K[loc][","][11](r)
## iso0010 3596 3596 iso0010 K[loc][","][10](r)
## iso0009 3597 3597 iso0009 K[loc][","][9](r)
## iso0008 3598 3598 iso0008 K[loc][","][8](r)
## iso0007 3599 3599 iso0007 K[loc][","][7](r)
## iso0006 3600 3600 iso0006 K[loc][","][6](r)
## iso0005 3601 3601 iso0005 K[loc][","][5](r)
## iso0004 3602 3602 iso0004 K[loc][","][4](r)
## iso0003 3603 3603 iso0003 K[loc][","][3](r)
## iso0002 3604 3604 iso0002 K[loc][","][2](r)
## iso0001 3605 3605 iso0001 K[loc][","][1](r)
## meaning
## theo theoretical Poisson K[loc](r)
## iso3604 Ripley isotropic correction estimate of K[loc](r) for point 3604
## iso3603 Ripley isotropic correction estimate of K[loc](r) for point 3603
## iso3602 Ripley isotropic correction estimate of K[loc](r) for point 3602
## iso3601 Ripley isotropic correction estimate of K[loc](r) for point 3601
## iso3600 Ripley isotropic correction estimate of K[loc](r) for point 3600
## iso3599 Ripley isotropic correction estimate of K[loc](r) for point 3599
## iso3598 Ripley isotropic correction estimate of K[loc](r) for point 3598
## iso3597 Ripley isotropic correction estimate of K[loc](r) for point 3597
## iso3596 Ripley isotropic correction estimate of K[loc](r) for point 3596
## iso3595 Ripley isotropic correction estimate of K[loc](r) for point 3595
## iso3594 Ripley isotropic correction estimate of K[loc](r) for point 3594
## iso3593 Ripley isotropic correction estimate of K[loc](r) for point 3593
## iso3592 Ripley isotropic correction estimate of K[loc](r) for point 3592
## iso3591 Ripley isotropic correction estimate of K[loc](r) for point 3591
## iso3590 Ripley isotropic correction estimate of K[loc](r) for point 3590
## iso3589 Ripley isotropic correction estimate of K[loc](r) for point 3589
## iso3588 Ripley isotropic correction estimate of K[loc](r) for point 3588
## iso3587 Ripley isotropic correction estimate of K[loc](r) for point 3587
## iso3586 Ripley isotropic correction estimate of K[loc](r) for point 3586
## iso3585 Ripley isotropic correction estimate of K[loc](r) for point 3585
## iso3584 Ripley isotropic correction estimate of K[loc](r) for point 3584
## iso3583 Ripley isotropic correction estimate of K[loc](r) for point 3583
## iso3582 Ripley isotropic correction estimate of K[loc](r) for point 3582
## iso3581 Ripley isotropic correction estimate of K[loc](r) for point 3581
## iso3580 Ripley isotropic correction estimate of K[loc](r) for point 3580
## iso3579 Ripley isotropic correction estimate of K[loc](r) for point 3579
## iso3578 Ripley isotropic correction estimate of K[loc](r) for point 3578
## iso3577 Ripley isotropic correction estimate of K[loc](r) for point 3577
## iso3576 Ripley isotropic correction estimate of K[loc](r) for point 3576
## iso3575 Ripley isotropic correction estimate of K[loc](r) for point 3575
## iso3574 Ripley isotropic correction estimate of K[loc](r) for point 3574
## iso3573 Ripley isotropic correction estimate of K[loc](r) for point 3573
## iso3572 Ripley isotropic correction estimate of K[loc](r) for point 3572
## iso3571 Ripley isotropic correction estimate of K[loc](r) for point 3571
## iso3570 Ripley isotropic correction estimate of K[loc](r) for point 3570
## iso3569 Ripley isotropic correction estimate of K[loc](r) for point 3569
## iso3568 Ripley isotropic correction estimate of K[loc](r) for point 3568
## iso3567 Ripley isotropic correction estimate of K[loc](r) for point 3567
## iso3566 Ripley isotropic correction estimate of K[loc](r) for point 3566
## iso3565 Ripley isotropic correction estimate of K[loc](r) for point 3565
## iso3564 Ripley isotropic correction estimate of K[loc](r) for point 3564
## iso3563 Ripley isotropic correction estimate of K[loc](r) for point 3563
## iso3562 Ripley isotropic correction estimate of K[loc](r) for point 3562
## iso3561 Ripley isotropic correction estimate of K[loc](r) for point 3561
## iso3560 Ripley isotropic correction estimate of K[loc](r) for point 3560
## iso3559 Ripley isotropic correction estimate of K[loc](r) for point 3559
## iso3558 Ripley isotropic correction estimate of K[loc](r) for point 3558
## iso3557 Ripley isotropic correction estimate of K[loc](r) for point 3557
## iso3556 Ripley isotropic correction estimate of K[loc](r) for point 3556
## iso3555 Ripley isotropic correction estimate of K[loc](r) for point 3555
## iso3554 Ripley isotropic correction estimate of K[loc](r) for point 3554
## iso3553 Ripley isotropic correction estimate of K[loc](r) for point 3553
## iso3552 Ripley isotropic correction estimate of K[loc](r) for point 3552
## iso3551 Ripley isotropic correction estimate of K[loc](r) for point 3551
## iso3550 Ripley isotropic correction estimate of K[loc](r) for point 3550
## iso3549 Ripley isotropic correction estimate of K[loc](r) for point 3549
## iso3548 Ripley isotropic correction estimate of K[loc](r) for point 3548
## iso3547 Ripley isotropic correction estimate of K[loc](r) for point 3547
## iso3546 Ripley isotropic correction estimate of K[loc](r) for point 3546
## iso3545 Ripley isotropic correction estimate of K[loc](r) for point 3545
## iso3544 Ripley isotropic correction estimate of K[loc](r) for point 3544
## iso3543 Ripley isotropic correction estimate of K[loc](r) for point 3543
## iso3542 Ripley isotropic correction estimate of K[loc](r) for point 3542
## iso3541 Ripley isotropic correction estimate of K[loc](r) for point 3541
## iso3540 Ripley isotropic correction estimate of K[loc](r) for point 3540
## iso3539 Ripley isotropic correction estimate of K[loc](r) for point 3539
## iso3538 Ripley isotropic correction estimate of K[loc](r) for point 3538
## iso3537 Ripley isotropic correction estimate of K[loc](r) for point 3537
## iso3536 Ripley isotropic correction estimate of K[loc](r) for point 3536
## iso3535 Ripley isotropic correction estimate of K[loc](r) for point 3535
## iso3534 Ripley isotropic correction estimate of K[loc](r) for point 3534
## iso3533 Ripley isotropic correction estimate of K[loc](r) for point 3533
## iso3532 Ripley isotropic correction estimate of K[loc](r) for point 3532
## iso3531 Ripley isotropic correction estimate of K[loc](r) for point 3531
## iso3530 Ripley isotropic correction estimate of K[loc](r) for point 3530
## iso3529 Ripley isotropic correction estimate of K[loc](r) for point 3529
## iso3528 Ripley isotropic correction estimate of K[loc](r) for point 3528
## iso3527 Ripley isotropic correction estimate of K[loc](r) for point 3527
## iso3526 Ripley isotropic correction estimate of K[loc](r) for point 3526
## iso3525 Ripley isotropic correction estimate of K[loc](r) for point 3525
## iso3524 Ripley isotropic correction estimate of K[loc](r) for point 3524
## iso3523 Ripley isotropic correction estimate of K[loc](r) for point 3523
## iso3522 Ripley isotropic correction estimate of K[loc](r) for point 3522
## iso3521 Ripley isotropic correction estimate of K[loc](r) for point 3521
## iso3520 Ripley isotropic correction estimate of K[loc](r) for point 3520
## iso3519 Ripley isotropic correction estimate of K[loc](r) for point 3519
## iso3518 Ripley isotropic correction estimate of K[loc](r) for point 3518
## iso3517 Ripley isotropic correction estimate of K[loc](r) for point 3517
## iso3516 Ripley isotropic correction estimate of K[loc](r) for point 3516
## iso3515 Ripley isotropic correction estimate of K[loc](r) for point 3515
## iso3514 Ripley isotropic correction estimate of K[loc](r) for point 3514
## iso3513 Ripley isotropic correction estimate of K[loc](r) for point 3513
## iso3512 Ripley isotropic correction estimate of K[loc](r) for point 3512
## iso3511 Ripley isotropic correction estimate of K[loc](r) for point 3511
## iso3510 Ripley isotropic correction estimate of K[loc](r) for point 3510
## iso3509 Ripley isotropic correction estimate of K[loc](r) for point 3509
## iso3508 Ripley isotropic correction estimate of K[loc](r) for point 3508
## iso3507 Ripley isotropic correction estimate of K[loc](r) for point 3507
## iso3506 Ripley isotropic correction estimate of K[loc](r) for point 3506
## iso3505 Ripley isotropic correction estimate of K[loc](r) for point 3505
## iso3504 Ripley isotropic correction estimate of K[loc](r) for point 3504
## iso3503 Ripley isotropic correction estimate of K[loc](r) for point 3503
## iso3502 Ripley isotropic correction estimate of K[loc](r) for point 3502
## iso3501 Ripley isotropic correction estimate of K[loc](r) for point 3501
## iso3500 Ripley isotropic correction estimate of K[loc](r) for point 3500
## iso3499 Ripley isotropic correction estimate of K[loc](r) for point 3499
## iso3498 Ripley isotropic correction estimate of K[loc](r) for point 3498
## iso3497 Ripley isotropic correction estimate of K[loc](r) for point 3497
## iso3496 Ripley isotropic correction estimate of K[loc](r) for point 3496
## iso3495 Ripley isotropic correction estimate of K[loc](r) for point 3495
## iso3494 Ripley isotropic correction estimate of K[loc](r) for point 3494
## iso3493 Ripley isotropic correction estimate of K[loc](r) for point 3493
## iso3492 Ripley isotropic correction estimate of K[loc](r) for point 3492
## iso3491 Ripley isotropic correction estimate of K[loc](r) for point 3491
## iso3490 Ripley isotropic correction estimate of K[loc](r) for point 3490
## iso3489 Ripley isotropic correction estimate of K[loc](r) for point 3489
## iso3488 Ripley isotropic correction estimate of K[loc](r) for point 3488
## iso3487 Ripley isotropic correction estimate of K[loc](r) for point 3487
## iso3486 Ripley isotropic correction estimate of K[loc](r) for point 3486
## iso3485 Ripley isotropic correction estimate of K[loc](r) for point 3485
## iso3484 Ripley isotropic correction estimate of K[loc](r) for point 3484
## iso3483 Ripley isotropic correction estimate of K[loc](r) for point 3483
## iso3482 Ripley isotropic correction estimate of K[loc](r) for point 3482
## iso3481 Ripley isotropic correction estimate of K[loc](r) for point 3481
## iso3480 Ripley isotropic correction estimate of K[loc](r) for point 3480
## iso3479 Ripley isotropic correction estimate of K[loc](r) for point 3479
## iso3478 Ripley isotropic correction estimate of K[loc](r) for point 3478
## iso3477 Ripley isotropic correction estimate of K[loc](r) for point 3477
## iso3476 Ripley isotropic correction estimate of K[loc](r) for point 3476
## iso3475 Ripley isotropic correction estimate of K[loc](r) for point 3475
## iso3474 Ripley isotropic correction estimate of K[loc](r) for point 3474
## iso3473 Ripley isotropic correction estimate of K[loc](r) for point 3473
## iso3472 Ripley isotropic correction estimate of K[loc](r) for point 3472
## iso3471 Ripley isotropic correction estimate of K[loc](r) for point 3471
## iso3470 Ripley isotropic correction estimate of K[loc](r) for point 3470
## iso3469 Ripley isotropic correction estimate of K[loc](r) for point 3469
## iso3468 Ripley isotropic correction estimate of K[loc](r) for point 3468
## iso3467 Ripley isotropic correction estimate of K[loc](r) for point 3467
## iso3466 Ripley isotropic correction estimate of K[loc](r) for point 3466
## iso3465 Ripley isotropic correction estimate of K[loc](r) for point 3465
## iso3464 Ripley isotropic correction estimate of K[loc](r) for point 3464
## iso3463 Ripley isotropic correction estimate of K[loc](r) for point 3463
## iso3462 Ripley isotropic correction estimate of K[loc](r) for point 3462
## iso3461 Ripley isotropic correction estimate of K[loc](r) for point 3461
## iso3460 Ripley isotropic correction estimate of K[loc](r) for point 3460
## iso3459 Ripley isotropic correction estimate of K[loc](r) for point 3459
## iso3458 Ripley isotropic correction estimate of K[loc](r) for point 3458
## iso3457 Ripley isotropic correction estimate of K[loc](r) for point 3457
## iso3456 Ripley isotropic correction estimate of K[loc](r) for point 3456
## iso3455 Ripley isotropic correction estimate of K[loc](r) for point 3455
## iso3454 Ripley isotropic correction estimate of K[loc](r) for point 3454
## iso3453 Ripley isotropic correction estimate of K[loc](r) for point 3453
## iso3452 Ripley isotropic correction estimate of K[loc](r) for point 3452
## iso3451 Ripley isotropic correction estimate of K[loc](r) for point 3451
## iso3450 Ripley isotropic correction estimate of K[loc](r) for point 3450
## iso3449 Ripley isotropic correction estimate of K[loc](r) for point 3449
## iso3448 Ripley isotropic correction estimate of K[loc](r) for point 3448
## iso3447 Ripley isotropic correction estimate of K[loc](r) for point 3447
## iso3446 Ripley isotropic correction estimate of K[loc](r) for point 3446
## iso3445 Ripley isotropic correction estimate of K[loc](r) for point 3445
## iso3444 Ripley isotropic correction estimate of K[loc](r) for point 3444
## iso3443 Ripley isotropic correction estimate of K[loc](r) for point 3443
## iso3442 Ripley isotropic correction estimate of K[loc](r) for point 3442
## iso3441 Ripley isotropic correction estimate of K[loc](r) for point 3441
## iso3440 Ripley isotropic correction estimate of K[loc](r) for point 3440
## iso3439 Ripley isotropic correction estimate of K[loc](r) for point 3439
## iso3438 Ripley isotropic correction estimate of K[loc](r) for point 3438
## iso3437 Ripley isotropic correction estimate of K[loc](r) for point 3437
## iso3436 Ripley isotropic correction estimate of K[loc](r) for point 3436
## iso3435 Ripley isotropic correction estimate of K[loc](r) for point 3435
## iso3434 Ripley isotropic correction estimate of K[loc](r) for point 3434
## iso3433 Ripley isotropic correction estimate of K[loc](r) for point 3433
## iso3432 Ripley isotropic correction estimate of K[loc](r) for point 3432
## iso3431 Ripley isotropic correction estimate of K[loc](r) for point 3431
## iso3430 Ripley isotropic correction estimate of K[loc](r) for point 3430
## iso3429 Ripley isotropic correction estimate of K[loc](r) for point 3429
## iso3428 Ripley isotropic correction estimate of K[loc](r) for point 3428
## iso3427 Ripley isotropic correction estimate of K[loc](r) for point 3427
## iso3426 Ripley isotropic correction estimate of K[loc](r) for point 3426
## iso3425 Ripley isotropic correction estimate of K[loc](r) for point 3425
## iso3424 Ripley isotropic correction estimate of K[loc](r) for point 3424
## iso3423 Ripley isotropic correction estimate of K[loc](r) for point 3423
## iso3422 Ripley isotropic correction estimate of K[loc](r) for point 3422
## iso3421 Ripley isotropic correction estimate of K[loc](r) for point 3421
## iso3420 Ripley isotropic correction estimate of K[loc](r) for point 3420
## iso3419 Ripley isotropic correction estimate of K[loc](r) for point 3419
## iso3418 Ripley isotropic correction estimate of K[loc](r) for point 3418
## iso3417 Ripley isotropic correction estimate of K[loc](r) for point 3417
## iso3416 Ripley isotropic correction estimate of K[loc](r) for point 3416
## iso3415 Ripley isotropic correction estimate of K[loc](r) for point 3415
## iso3414 Ripley isotropic correction estimate of K[loc](r) for point 3414
## iso3413 Ripley isotropic correction estimate of K[loc](r) for point 3413
## iso3412 Ripley isotropic correction estimate of K[loc](r) for point 3412
## iso3411 Ripley isotropic correction estimate of K[loc](r) for point 3411
## iso3410 Ripley isotropic correction estimate of K[loc](r) for point 3410
## iso3409 Ripley isotropic correction estimate of K[loc](r) for point 3409
## iso3408 Ripley isotropic correction estimate of K[loc](r) for point 3408
## iso3407 Ripley isotropic correction estimate of K[loc](r) for point 3407
## iso3406 Ripley isotropic correction estimate of K[loc](r) for point 3406
## iso3405 Ripley isotropic correction estimate of K[loc](r) for point 3405
## iso3404 Ripley isotropic correction estimate of K[loc](r) for point 3404
## iso3403 Ripley isotropic correction estimate of K[loc](r) for point 3403
## iso3402 Ripley isotropic correction estimate of K[loc](r) for point 3402
## iso3401 Ripley isotropic correction estimate of K[loc](r) for point 3401
## iso3400 Ripley isotropic correction estimate of K[loc](r) for point 3400
## iso3399 Ripley isotropic correction estimate of K[loc](r) for point 3399
## iso3398 Ripley isotropic correction estimate of K[loc](r) for point 3398
## iso3397 Ripley isotropic correction estimate of K[loc](r) for point 3397
## iso3396 Ripley isotropic correction estimate of K[loc](r) for point 3396
## iso3395 Ripley isotropic correction estimate of K[loc](r) for point 3395
## iso3394 Ripley isotropic correction estimate of K[loc](r) for point 3394
## iso3393 Ripley isotropic correction estimate of K[loc](r) for point 3393
## iso3392 Ripley isotropic correction estimate of K[loc](r) for point 3392
## iso3391 Ripley isotropic correction estimate of K[loc](r) for point 3391
## iso3390 Ripley isotropic correction estimate of K[loc](r) for point 3390
## iso3389 Ripley isotropic correction estimate of K[loc](r) for point 3389
## iso3388 Ripley isotropic correction estimate of K[loc](r) for point 3388
## iso3387 Ripley isotropic correction estimate of K[loc](r) for point 3387
## iso3386 Ripley isotropic correction estimate of K[loc](r) for point 3386
## iso3385 Ripley isotropic correction estimate of K[loc](r) for point 3385
## iso3384 Ripley isotropic correction estimate of K[loc](r) for point 3384
## iso3383 Ripley isotropic correction estimate of K[loc](r) for point 3383
## iso3382 Ripley isotropic correction estimate of K[loc](r) for point 3382
## iso3381 Ripley isotropic correction estimate of K[loc](r) for point 3381
## iso3380 Ripley isotropic correction estimate of K[loc](r) for point 3380
## iso3379 Ripley isotropic correction estimate of K[loc](r) for point 3379
## iso3378 Ripley isotropic correction estimate of K[loc](r) for point 3378
## iso3377 Ripley isotropic correction estimate of K[loc](r) for point 3377
## iso3376 Ripley isotropic correction estimate of K[loc](r) for point 3376
## iso3375 Ripley isotropic correction estimate of K[loc](r) for point 3375
## iso3374 Ripley isotropic correction estimate of K[loc](r) for point 3374
## iso3373 Ripley isotropic correction estimate of K[loc](r) for point 3373
## iso3372 Ripley isotropic correction estimate of K[loc](r) for point 3372
## iso3371 Ripley isotropic correction estimate of K[loc](r) for point 3371
## iso3370 Ripley isotropic correction estimate of K[loc](r) for point 3370
## iso3369 Ripley isotropic correction estimate of K[loc](r) for point 3369
## iso3368 Ripley isotropic correction estimate of K[loc](r) for point 3368
## iso3367 Ripley isotropic correction estimate of K[loc](r) for point 3367
## iso3366 Ripley isotropic correction estimate of K[loc](r) for point 3366
## iso3365 Ripley isotropic correction estimate of K[loc](r) for point 3365
## iso3364 Ripley isotropic correction estimate of K[loc](r) for point 3364
## iso3363 Ripley isotropic correction estimate of K[loc](r) for point 3363
## iso3362 Ripley isotropic correction estimate of K[loc](r) for point 3362
## iso3361 Ripley isotropic correction estimate of K[loc](r) for point 3361
## iso3360 Ripley isotropic correction estimate of K[loc](r) for point 3360
## iso3359 Ripley isotropic correction estimate of K[loc](r) for point 3359
## iso3358 Ripley isotropic correction estimate of K[loc](r) for point 3358
## iso3357 Ripley isotropic correction estimate of K[loc](r) for point 3357
## iso3356 Ripley isotropic correction estimate of K[loc](r) for point 3356
## iso3355 Ripley isotropic correction estimate of K[loc](r) for point 3355
## iso3354 Ripley isotropic correction estimate of K[loc](r) for point 3354
## iso3353 Ripley isotropic correction estimate of K[loc](r) for point 3353
## iso3352 Ripley isotropic correction estimate of K[loc](r) for point 3352
## iso3351 Ripley isotropic correction estimate of K[loc](r) for point 3351
## iso3350 Ripley isotropic correction estimate of K[loc](r) for point 3350
## iso3349 Ripley isotropic correction estimate of K[loc](r) for point 3349
## iso3348 Ripley isotropic correction estimate of K[loc](r) for point 3348
## iso3347 Ripley isotropic correction estimate of K[loc](r) for point 3347
## iso3346 Ripley isotropic correction estimate of K[loc](r) for point 3346
## iso3345 Ripley isotropic correction estimate of K[loc](r) for point 3345
## iso3344 Ripley isotropic correction estimate of K[loc](r) for point 3344
## iso3343 Ripley isotropic correction estimate of K[loc](r) for point 3343
## iso3342 Ripley isotropic correction estimate of K[loc](r) for point 3342
## iso3341 Ripley isotropic correction estimate of K[loc](r) for point 3341
## iso3340 Ripley isotropic correction estimate of K[loc](r) for point 3340
## iso3339 Ripley isotropic correction estimate of K[loc](r) for point 3339
## iso3338 Ripley isotropic correction estimate of K[loc](r) for point 3338
## iso3337 Ripley isotropic correction estimate of K[loc](r) for point 3337
## iso3336 Ripley isotropic correction estimate of K[loc](r) for point 3336
## iso3335 Ripley isotropic correction estimate of K[loc](r) for point 3335
## iso3334 Ripley isotropic correction estimate of K[loc](r) for point 3334
## iso3333 Ripley isotropic correction estimate of K[loc](r) for point 3333
## iso3332 Ripley isotropic correction estimate of K[loc](r) for point 3332
## iso3331 Ripley isotropic correction estimate of K[loc](r) for point 3331
## iso3330 Ripley isotropic correction estimate of K[loc](r) for point 3330
## iso3329 Ripley isotropic correction estimate of K[loc](r) for point 3329
## iso3328 Ripley isotropic correction estimate of K[loc](r) for point 3328
## iso3327 Ripley isotropic correction estimate of K[loc](r) for point 3327
## iso3326 Ripley isotropic correction estimate of K[loc](r) for point 3326
## iso3325 Ripley isotropic correction estimate of K[loc](r) for point 3325
## iso3324 Ripley isotropic correction estimate of K[loc](r) for point 3324
## iso3323 Ripley isotropic correction estimate of K[loc](r) for point 3323
## iso3322 Ripley isotropic correction estimate of K[loc](r) for point 3322
## iso3321 Ripley isotropic correction estimate of K[loc](r) for point 3321
## iso3320 Ripley isotropic correction estimate of K[loc](r) for point 3320
## iso3319 Ripley isotropic correction estimate of K[loc](r) for point 3319
## iso3318 Ripley isotropic correction estimate of K[loc](r) for point 3318
## iso3317 Ripley isotropic correction estimate of K[loc](r) for point 3317
## iso3316 Ripley isotropic correction estimate of K[loc](r) for point 3316
## iso3315 Ripley isotropic correction estimate of K[loc](r) for point 3315
## iso3314 Ripley isotropic correction estimate of K[loc](r) for point 3314
## iso3313 Ripley isotropic correction estimate of K[loc](r) for point 3313
## iso3312 Ripley isotropic correction estimate of K[loc](r) for point 3312
## iso3311 Ripley isotropic correction estimate of K[loc](r) for point 3311
## iso3310 Ripley isotropic correction estimate of K[loc](r) for point 3310
## iso3309 Ripley isotropic correction estimate of K[loc](r) for point 3309
## iso3308 Ripley isotropic correction estimate of K[loc](r) for point 3308
## iso3307 Ripley isotropic correction estimate of K[loc](r) for point 3307
## iso3306 Ripley isotropic correction estimate of K[loc](r) for point 3306
## iso3305 Ripley isotropic correction estimate of K[loc](r) for point 3305
## iso3304 Ripley isotropic correction estimate of K[loc](r) for point 3304
## iso3303 Ripley isotropic correction estimate of K[loc](r) for point 3303
## iso3302 Ripley isotropic correction estimate of K[loc](r) for point 3302
## iso3301 Ripley isotropic correction estimate of K[loc](r) for point 3301
## iso3300 Ripley isotropic correction estimate of K[loc](r) for point 3300
## iso3299 Ripley isotropic correction estimate of K[loc](r) for point 3299
## iso3298 Ripley isotropic correction estimate of K[loc](r) for point 3298
## iso3297 Ripley isotropic correction estimate of K[loc](r) for point 3297
## iso3296 Ripley isotropic correction estimate of K[loc](r) for point 3296
## iso3295 Ripley isotropic correction estimate of K[loc](r) for point 3295
## iso3294 Ripley isotropic correction estimate of K[loc](r) for point 3294
## iso3293 Ripley isotropic correction estimate of K[loc](r) for point 3293
## iso3292 Ripley isotropic correction estimate of K[loc](r) for point 3292
## iso3291 Ripley isotropic correction estimate of K[loc](r) for point 3291
## iso3290 Ripley isotropic correction estimate of K[loc](r) for point 3290
## iso3289 Ripley isotropic correction estimate of K[loc](r) for point 3289
## iso3288 Ripley isotropic correction estimate of K[loc](r) for point 3288
## iso3287 Ripley isotropic correction estimate of K[loc](r) for point 3287
## iso3286 Ripley isotropic correction estimate of K[loc](r) for point 3286
## iso3285 Ripley isotropic correction estimate of K[loc](r) for point 3285
## iso3284 Ripley isotropic correction estimate of K[loc](r) for point 3284
## iso3283 Ripley isotropic correction estimate of K[loc](r) for point 3283
## iso3282 Ripley isotropic correction estimate of K[loc](r) for point 3282
## iso3281 Ripley isotropic correction estimate of K[loc](r) for point 3281
## iso3280 Ripley isotropic correction estimate of K[loc](r) for point 3280
## iso3279 Ripley isotropic correction estimate of K[loc](r) for point 3279
## iso3278 Ripley isotropic correction estimate of K[loc](r) for point 3278
## iso3277 Ripley isotropic correction estimate of K[loc](r) for point 3277
## iso3276 Ripley isotropic correction estimate of K[loc](r) for point 3276
## iso3275 Ripley isotropic correction estimate of K[loc](r) for point 3275
## iso3274 Ripley isotropic correction estimate of K[loc](r) for point 3274
## iso3273 Ripley isotropic correction estimate of K[loc](r) for point 3273
## iso3272 Ripley isotropic correction estimate of K[loc](r) for point 3272
## iso3271 Ripley isotropic correction estimate of K[loc](r) for point 3271
## iso3270 Ripley isotropic correction estimate of K[loc](r) for point 3270
## iso3269 Ripley isotropic correction estimate of K[loc](r) for point 3269
## iso3268 Ripley isotropic correction estimate of K[loc](r) for point 3268
## iso3267 Ripley isotropic correction estimate of K[loc](r) for point 3267
## iso3266 Ripley isotropic correction estimate of K[loc](r) for point 3266
## iso3265 Ripley isotropic correction estimate of K[loc](r) for point 3265
## iso3264 Ripley isotropic correction estimate of K[loc](r) for point 3264
## iso3263 Ripley isotropic correction estimate of K[loc](r) for point 3263
## iso3262 Ripley isotropic correction estimate of K[loc](r) for point 3262
## iso3261 Ripley isotropic correction estimate of K[loc](r) for point 3261
## iso3260 Ripley isotropic correction estimate of K[loc](r) for point 3260
## iso3259 Ripley isotropic correction estimate of K[loc](r) for point 3259
## iso3258 Ripley isotropic correction estimate of K[loc](r) for point 3258
## iso3257 Ripley isotropic correction estimate of K[loc](r) for point 3257
## iso3256 Ripley isotropic correction estimate of K[loc](r) for point 3256
## iso3255 Ripley isotropic correction estimate of K[loc](r) for point 3255
## iso3254 Ripley isotropic correction estimate of K[loc](r) for point 3254
## iso3253 Ripley isotropic correction estimate of K[loc](r) for point 3253
## iso3252 Ripley isotropic correction estimate of K[loc](r) for point 3252
## iso3251 Ripley isotropic correction estimate of K[loc](r) for point 3251
## iso3250 Ripley isotropic correction estimate of K[loc](r) for point 3250
## iso3249 Ripley isotropic correction estimate of K[loc](r) for point 3249
## iso3248 Ripley isotropic correction estimate of K[loc](r) for point 3248
## iso3247 Ripley isotropic correction estimate of K[loc](r) for point 3247
## iso3246 Ripley isotropic correction estimate of K[loc](r) for point 3246
## iso3245 Ripley isotropic correction estimate of K[loc](r) for point 3245
## iso3244 Ripley isotropic correction estimate of K[loc](r) for point 3244
## iso3243 Ripley isotropic correction estimate of K[loc](r) for point 3243
## iso3242 Ripley isotropic correction estimate of K[loc](r) for point 3242
## iso3241 Ripley isotropic correction estimate of K[loc](r) for point 3241
## iso3240 Ripley isotropic correction estimate of K[loc](r) for point 3240
## iso3239 Ripley isotropic correction estimate of K[loc](r) for point 3239
## iso3238 Ripley isotropic correction estimate of K[loc](r) for point 3238
## iso3237 Ripley isotropic correction estimate of K[loc](r) for point 3237
## iso3236 Ripley isotropic correction estimate of K[loc](r) for point 3236
## iso3235 Ripley isotropic correction estimate of K[loc](r) for point 3235
## iso3234 Ripley isotropic correction estimate of K[loc](r) for point 3234
## iso3233 Ripley isotropic correction estimate of K[loc](r) for point 3233
## iso3232 Ripley isotropic correction estimate of K[loc](r) for point 3232
## iso3231 Ripley isotropic correction estimate of K[loc](r) for point 3231
## iso3230 Ripley isotropic correction estimate of K[loc](r) for point 3230
## iso3229 Ripley isotropic correction estimate of K[loc](r) for point 3229
## iso3228 Ripley isotropic correction estimate of K[loc](r) for point 3228
## iso3227 Ripley isotropic correction estimate of K[loc](r) for point 3227
## iso3226 Ripley isotropic correction estimate of K[loc](r) for point 3226
## iso3225 Ripley isotropic correction estimate of K[loc](r) for point 3225
## iso3224 Ripley isotropic correction estimate of K[loc](r) for point 3224
## iso3223 Ripley isotropic correction estimate of K[loc](r) for point 3223
## iso3222 Ripley isotropic correction estimate of K[loc](r) for point 3222
## iso3221 Ripley isotropic correction estimate of K[loc](r) for point 3221
## iso3220 Ripley isotropic correction estimate of K[loc](r) for point 3220
## iso3219 Ripley isotropic correction estimate of K[loc](r) for point 3219
## iso3218 Ripley isotropic correction estimate of K[loc](r) for point 3218
## iso3217 Ripley isotropic correction estimate of K[loc](r) for point 3217
## iso3216 Ripley isotropic correction estimate of K[loc](r) for point 3216
## iso3215 Ripley isotropic correction estimate of K[loc](r) for point 3215
## iso3214 Ripley isotropic correction estimate of K[loc](r) for point 3214
## iso3213 Ripley isotropic correction estimate of K[loc](r) for point 3213
## iso3212 Ripley isotropic correction estimate of K[loc](r) for point 3212
## iso3211 Ripley isotropic correction estimate of K[loc](r) for point 3211
## iso3210 Ripley isotropic correction estimate of K[loc](r) for point 3210
## iso3209 Ripley isotropic correction estimate of K[loc](r) for point 3209
## iso3208 Ripley isotropic correction estimate of K[loc](r) for point 3208
## iso3207 Ripley isotropic correction estimate of K[loc](r) for point 3207
## iso3206 Ripley isotropic correction estimate of K[loc](r) for point 3206
## iso3205 Ripley isotropic correction estimate of K[loc](r) for point 3205
## iso3204 Ripley isotropic correction estimate of K[loc](r) for point 3204
## iso3203 Ripley isotropic correction estimate of K[loc](r) for point 3203
## iso3202 Ripley isotropic correction estimate of K[loc](r) for point 3202
## iso3201 Ripley isotropic correction estimate of K[loc](r) for point 3201
## iso3200 Ripley isotropic correction estimate of K[loc](r) for point 3200
## iso3199 Ripley isotropic correction estimate of K[loc](r) for point 3199
## iso3198 Ripley isotropic correction estimate of K[loc](r) for point 3198
## iso3197 Ripley isotropic correction estimate of K[loc](r) for point 3197
## iso3196 Ripley isotropic correction estimate of K[loc](r) for point 3196
## iso3195 Ripley isotropic correction estimate of K[loc](r) for point 3195
## iso3194 Ripley isotropic correction estimate of K[loc](r) for point 3194
## iso3193 Ripley isotropic correction estimate of K[loc](r) for point 3193
## iso3192 Ripley isotropic correction estimate of K[loc](r) for point 3192
## iso3191 Ripley isotropic correction estimate of K[loc](r) for point 3191
## iso3190 Ripley isotropic correction estimate of K[loc](r) for point 3190
## iso3189 Ripley isotropic correction estimate of K[loc](r) for point 3189
## iso3188 Ripley isotropic correction estimate of K[loc](r) for point 3188
## iso3187 Ripley isotropic correction estimate of K[loc](r) for point 3187
## iso3186 Ripley isotropic correction estimate of K[loc](r) for point 3186
## iso3185 Ripley isotropic correction estimate of K[loc](r) for point 3185
## iso3184 Ripley isotropic correction estimate of K[loc](r) for point 3184
## iso3183 Ripley isotropic correction estimate of K[loc](r) for point 3183
## iso3182 Ripley isotropic correction estimate of K[loc](r) for point 3182
## iso3181 Ripley isotropic correction estimate of K[loc](r) for point 3181
## iso3180 Ripley isotropic correction estimate of K[loc](r) for point 3180
## iso3179 Ripley isotropic correction estimate of K[loc](r) for point 3179
## iso3178 Ripley isotropic correction estimate of K[loc](r) for point 3178
## iso3177 Ripley isotropic correction estimate of K[loc](r) for point 3177
## iso3176 Ripley isotropic correction estimate of K[loc](r) for point 3176
## iso3175 Ripley isotropic correction estimate of K[loc](r) for point 3175
## iso3174 Ripley isotropic correction estimate of K[loc](r) for point 3174
## iso3173 Ripley isotropic correction estimate of K[loc](r) for point 3173
## iso3172 Ripley isotropic correction estimate of K[loc](r) for point 3172
## iso3171 Ripley isotropic correction estimate of K[loc](r) for point 3171
## iso3170 Ripley isotropic correction estimate of K[loc](r) for point 3170
## iso3169 Ripley isotropic correction estimate of K[loc](r) for point 3169
## iso3168 Ripley isotropic correction estimate of K[loc](r) for point 3168
## iso3167 Ripley isotropic correction estimate of K[loc](r) for point 3167
## iso3166 Ripley isotropic correction estimate of K[loc](r) for point 3166
## iso3165 Ripley isotropic correction estimate of K[loc](r) for point 3165
## iso3164 Ripley isotropic correction estimate of K[loc](r) for point 3164
## iso3163 Ripley isotropic correction estimate of K[loc](r) for point 3163
## iso3162 Ripley isotropic correction estimate of K[loc](r) for point 3162
## iso3161 Ripley isotropic correction estimate of K[loc](r) for point 3161
## iso3160 Ripley isotropic correction estimate of K[loc](r) for point 3160
## iso3159 Ripley isotropic correction estimate of K[loc](r) for point 3159
## iso3158 Ripley isotropic correction estimate of K[loc](r) for point 3158
## iso3157 Ripley isotropic correction estimate of K[loc](r) for point 3157
## iso3156 Ripley isotropic correction estimate of K[loc](r) for point 3156
## iso3155 Ripley isotropic correction estimate of K[loc](r) for point 3155
## iso3154 Ripley isotropic correction estimate of K[loc](r) for point 3154
## iso3153 Ripley isotropic correction estimate of K[loc](r) for point 3153
## iso3152 Ripley isotropic correction estimate of K[loc](r) for point 3152
## iso3151 Ripley isotropic correction estimate of K[loc](r) for point 3151
## iso3150 Ripley isotropic correction estimate of K[loc](r) for point 3150
## iso3149 Ripley isotropic correction estimate of K[loc](r) for point 3149
## iso3148 Ripley isotropic correction estimate of K[loc](r) for point 3148
## iso3147 Ripley isotropic correction estimate of K[loc](r) for point 3147
## iso3146 Ripley isotropic correction estimate of K[loc](r) for point 3146
## iso3145 Ripley isotropic correction estimate of K[loc](r) for point 3145
## iso3144 Ripley isotropic correction estimate of K[loc](r) for point 3144
## iso3143 Ripley isotropic correction estimate of K[loc](r) for point 3143
## iso3142 Ripley isotropic correction estimate of K[loc](r) for point 3142
## iso3141 Ripley isotropic correction estimate of K[loc](r) for point 3141
## iso3140 Ripley isotropic correction estimate of K[loc](r) for point 3140
## iso3139 Ripley isotropic correction estimate of K[loc](r) for point 3139
## iso3138 Ripley isotropic correction estimate of K[loc](r) for point 3138
## iso3137 Ripley isotropic correction estimate of K[loc](r) for point 3137
## iso3136 Ripley isotropic correction estimate of K[loc](r) for point 3136
## iso3135 Ripley isotropic correction estimate of K[loc](r) for point 3135
## iso3134 Ripley isotropic correction estimate of K[loc](r) for point 3134
## iso3133 Ripley isotropic correction estimate of K[loc](r) for point 3133
## iso3132 Ripley isotropic correction estimate of K[loc](r) for point 3132
## iso3131 Ripley isotropic correction estimate of K[loc](r) for point 3131
## iso3130 Ripley isotropic correction estimate of K[loc](r) for point 3130
## iso3129 Ripley isotropic correction estimate of K[loc](r) for point 3129
## iso3128 Ripley isotropic correction estimate of K[loc](r) for point 3128
## iso3127 Ripley isotropic correction estimate of K[loc](r) for point 3127
## iso3126 Ripley isotropic correction estimate of K[loc](r) for point 3126
## iso3125 Ripley isotropic correction estimate of K[loc](r) for point 3125
## iso3124 Ripley isotropic correction estimate of K[loc](r) for point 3124
## iso3123 Ripley isotropic correction estimate of K[loc](r) for point 3123
## iso3122 Ripley isotropic correction estimate of K[loc](r) for point 3122
## iso3121 Ripley isotropic correction estimate of K[loc](r) for point 3121
## iso3120 Ripley isotropic correction estimate of K[loc](r) for point 3120
## iso3119 Ripley isotropic correction estimate of K[loc](r) for point 3119
## iso3118 Ripley isotropic correction estimate of K[loc](r) for point 3118
## iso3117 Ripley isotropic correction estimate of K[loc](r) for point 3117
## iso3116 Ripley isotropic correction estimate of K[loc](r) for point 3116
## iso3115 Ripley isotropic correction estimate of K[loc](r) for point 3115
## iso3114 Ripley isotropic correction estimate of K[loc](r) for point 3114
## iso3113 Ripley isotropic correction estimate of K[loc](r) for point 3113
## iso3112 Ripley isotropic correction estimate of K[loc](r) for point 3112
## iso3111 Ripley isotropic correction estimate of K[loc](r) for point 3111
## iso3110 Ripley isotropic correction estimate of K[loc](r) for point 3110
## iso3109 Ripley isotropic correction estimate of K[loc](r) for point 3109
## iso3108 Ripley isotropic correction estimate of K[loc](r) for point 3108
## iso3107 Ripley isotropic correction estimate of K[loc](r) for point 3107
## iso3106 Ripley isotropic correction estimate of K[loc](r) for point 3106
## iso3105 Ripley isotropic correction estimate of K[loc](r) for point 3105
## iso3104 Ripley isotropic correction estimate of K[loc](r) for point 3104
## iso3103 Ripley isotropic correction estimate of K[loc](r) for point 3103
## iso3102 Ripley isotropic correction estimate of K[loc](r) for point 3102
## iso3101 Ripley isotropic correction estimate of K[loc](r) for point 3101
## iso3100 Ripley isotropic correction estimate of K[loc](r) for point 3100
## iso3099 Ripley isotropic correction estimate of K[loc](r) for point 3099
## iso3098 Ripley isotropic correction estimate of K[loc](r) for point 3098
## iso3097 Ripley isotropic correction estimate of K[loc](r) for point 3097
## iso3096 Ripley isotropic correction estimate of K[loc](r) for point 3096
## iso3095 Ripley isotropic correction estimate of K[loc](r) for point 3095
## iso3094 Ripley isotropic correction estimate of K[loc](r) for point 3094
## iso3093 Ripley isotropic correction estimate of K[loc](r) for point 3093
## iso3092 Ripley isotropic correction estimate of K[loc](r) for point 3092
## iso3091 Ripley isotropic correction estimate of K[loc](r) for point 3091
## iso3090 Ripley isotropic correction estimate of K[loc](r) for point 3090
## iso3089 Ripley isotropic correction estimate of K[loc](r) for point 3089
## iso3088 Ripley isotropic correction estimate of K[loc](r) for point 3088
## iso3087 Ripley isotropic correction estimate of K[loc](r) for point 3087
## iso3086 Ripley isotropic correction estimate of K[loc](r) for point 3086
## iso3085 Ripley isotropic correction estimate of K[loc](r) for point 3085
## iso3084 Ripley isotropic correction estimate of K[loc](r) for point 3084
## iso3083 Ripley isotropic correction estimate of K[loc](r) for point 3083
## iso3082 Ripley isotropic correction estimate of K[loc](r) for point 3082
## iso3081 Ripley isotropic correction estimate of K[loc](r) for point 3081
## iso3080 Ripley isotropic correction estimate of K[loc](r) for point 3080
## iso3079 Ripley isotropic correction estimate of K[loc](r) for point 3079
## iso3078 Ripley isotropic correction estimate of K[loc](r) for point 3078
## iso3077 Ripley isotropic correction estimate of K[loc](r) for point 3077
## iso3076 Ripley isotropic correction estimate of K[loc](r) for point 3076
## iso3075 Ripley isotropic correction estimate of K[loc](r) for point 3075
## iso3074 Ripley isotropic correction estimate of K[loc](r) for point 3074
## iso3073 Ripley isotropic correction estimate of K[loc](r) for point 3073
## iso3072 Ripley isotropic correction estimate of K[loc](r) for point 3072
## iso3071 Ripley isotropic correction estimate of K[loc](r) for point 3071
## iso3070 Ripley isotropic correction estimate of K[loc](r) for point 3070
## iso3069 Ripley isotropic correction estimate of K[loc](r) for point 3069
## iso3068 Ripley isotropic correction estimate of K[loc](r) for point 3068
## iso3067 Ripley isotropic correction estimate of K[loc](r) for point 3067
## iso3066 Ripley isotropic correction estimate of K[loc](r) for point 3066
## iso3065 Ripley isotropic correction estimate of K[loc](r) for point 3065
## iso3064 Ripley isotropic correction estimate of K[loc](r) for point 3064
## iso3063 Ripley isotropic correction estimate of K[loc](r) for point 3063
## iso3062 Ripley isotropic correction estimate of K[loc](r) for point 3062
## iso3061 Ripley isotropic correction estimate of K[loc](r) for point 3061
## iso3060 Ripley isotropic correction estimate of K[loc](r) for point 3060
## iso3059 Ripley isotropic correction estimate of K[loc](r) for point 3059
## iso3058 Ripley isotropic correction estimate of K[loc](r) for point 3058
## iso3057 Ripley isotropic correction estimate of K[loc](r) for point 3057
## iso3056 Ripley isotropic correction estimate of K[loc](r) for point 3056
## iso3055 Ripley isotropic correction estimate of K[loc](r) for point 3055
## iso3054 Ripley isotropic correction estimate of K[loc](r) for point 3054
## iso3053 Ripley isotropic correction estimate of K[loc](r) for point 3053
## iso3052 Ripley isotropic correction estimate of K[loc](r) for point 3052
## iso3051 Ripley isotropic correction estimate of K[loc](r) for point 3051
## iso3050 Ripley isotropic correction estimate of K[loc](r) for point 3050
## iso3049 Ripley isotropic correction estimate of K[loc](r) for point 3049
## iso3048 Ripley isotropic correction estimate of K[loc](r) for point 3048
## iso3047 Ripley isotropic correction estimate of K[loc](r) for point 3047
## iso3046 Ripley isotropic correction estimate of K[loc](r) for point 3046
## iso3045 Ripley isotropic correction estimate of K[loc](r) for point 3045
## iso3044 Ripley isotropic correction estimate of K[loc](r) for point 3044
## iso3043 Ripley isotropic correction estimate of K[loc](r) for point 3043
## iso3042 Ripley isotropic correction estimate of K[loc](r) for point 3042
## iso3041 Ripley isotropic correction estimate of K[loc](r) for point 3041
## iso3040 Ripley isotropic correction estimate of K[loc](r) for point 3040
## iso3039 Ripley isotropic correction estimate of K[loc](r) for point 3039
## iso3038 Ripley isotropic correction estimate of K[loc](r) for point 3038
## iso3037 Ripley isotropic correction estimate of K[loc](r) for point 3037
## iso3036 Ripley isotropic correction estimate of K[loc](r) for point 3036
## iso3035 Ripley isotropic correction estimate of K[loc](r) for point 3035
## iso3034 Ripley isotropic correction estimate of K[loc](r) for point 3034
## iso3033 Ripley isotropic correction estimate of K[loc](r) for point 3033
## iso3032 Ripley isotropic correction estimate of K[loc](r) for point 3032
## iso3031 Ripley isotropic correction estimate of K[loc](r) for point 3031
## iso3030 Ripley isotropic correction estimate of K[loc](r) for point 3030
## iso3029 Ripley isotropic correction estimate of K[loc](r) for point 3029
## iso3028 Ripley isotropic correction estimate of K[loc](r) for point 3028
## iso3027 Ripley isotropic correction estimate of K[loc](r) for point 3027
## iso3026 Ripley isotropic correction estimate of K[loc](r) for point 3026
## iso3025 Ripley isotropic correction estimate of K[loc](r) for point 3025
## iso3024 Ripley isotropic correction estimate of K[loc](r) for point 3024
## iso3023 Ripley isotropic correction estimate of K[loc](r) for point 3023
## iso3022 Ripley isotropic correction estimate of K[loc](r) for point 3022
## iso3021 Ripley isotropic correction estimate of K[loc](r) for point 3021
## iso3020 Ripley isotropic correction estimate of K[loc](r) for point 3020
## iso3019 Ripley isotropic correction estimate of K[loc](r) for point 3019
## iso3018 Ripley isotropic correction estimate of K[loc](r) for point 3018
## iso3017 Ripley isotropic correction estimate of K[loc](r) for point 3017
## iso3016 Ripley isotropic correction estimate of K[loc](r) for point 3016
## iso3015 Ripley isotropic correction estimate of K[loc](r) for point 3015
## iso3014 Ripley isotropic correction estimate of K[loc](r) for point 3014
## iso3013 Ripley isotropic correction estimate of K[loc](r) for point 3013
## iso3012 Ripley isotropic correction estimate of K[loc](r) for point 3012
## iso3011 Ripley isotropic correction estimate of K[loc](r) for point 3011
## iso3010 Ripley isotropic correction estimate of K[loc](r) for point 3010
## iso3009 Ripley isotropic correction estimate of K[loc](r) for point 3009
## iso3008 Ripley isotropic correction estimate of K[loc](r) for point 3008
## iso3007 Ripley isotropic correction estimate of K[loc](r) for point 3007
## iso3006 Ripley isotropic correction estimate of K[loc](r) for point 3006
## iso3005 Ripley isotropic correction estimate of K[loc](r) for point 3005
## iso3004 Ripley isotropic correction estimate of K[loc](r) for point 3004
## iso3003 Ripley isotropic correction estimate of K[loc](r) for point 3003
## iso3002 Ripley isotropic correction estimate of K[loc](r) for point 3002
## iso3001 Ripley isotropic correction estimate of K[loc](r) for point 3001
## iso3000 Ripley isotropic correction estimate of K[loc](r) for point 3000
## iso2999 Ripley isotropic correction estimate of K[loc](r) for point 2999
## iso2998 Ripley isotropic correction estimate of K[loc](r) for point 2998
## iso2997 Ripley isotropic correction estimate of K[loc](r) for point 2997
## iso2996 Ripley isotropic correction estimate of K[loc](r) for point 2996
## iso2995 Ripley isotropic correction estimate of K[loc](r) for point 2995
## iso2994 Ripley isotropic correction estimate of K[loc](r) for point 2994
## iso2993 Ripley isotropic correction estimate of K[loc](r) for point 2993
## iso2992 Ripley isotropic correction estimate of K[loc](r) for point 2992
## iso2991 Ripley isotropic correction estimate of K[loc](r) for point 2991
## iso2990 Ripley isotropic correction estimate of K[loc](r) for point 2990
## iso2989 Ripley isotropic correction estimate of K[loc](r) for point 2989
## iso2988 Ripley isotropic correction estimate of K[loc](r) for point 2988
## iso2987 Ripley isotropic correction estimate of K[loc](r) for point 2987
## iso2986 Ripley isotropic correction estimate of K[loc](r) for point 2986
## iso2985 Ripley isotropic correction estimate of K[loc](r) for point 2985
## iso2984 Ripley isotropic correction estimate of K[loc](r) for point 2984
## iso2983 Ripley isotropic correction estimate of K[loc](r) for point 2983
## iso2982 Ripley isotropic correction estimate of K[loc](r) for point 2982
## iso2981 Ripley isotropic correction estimate of K[loc](r) for point 2981
## iso2980 Ripley isotropic correction estimate of K[loc](r) for point 2980
## iso2979 Ripley isotropic correction estimate of K[loc](r) for point 2979
## iso2978 Ripley isotropic correction estimate of K[loc](r) for point 2978
## iso2977 Ripley isotropic correction estimate of K[loc](r) for point 2977
## iso2976 Ripley isotropic correction estimate of K[loc](r) for point 2976
## iso2975 Ripley isotropic correction estimate of K[loc](r) for point 2975
## iso2974 Ripley isotropic correction estimate of K[loc](r) for point 2974
## iso2973 Ripley isotropic correction estimate of K[loc](r) for point 2973
## iso2972 Ripley isotropic correction estimate of K[loc](r) for point 2972
## iso2971 Ripley isotropic correction estimate of K[loc](r) for point 2971
## iso2970 Ripley isotropic correction estimate of K[loc](r) for point 2970
## iso2969 Ripley isotropic correction estimate of K[loc](r) for point 2969
## iso2968 Ripley isotropic correction estimate of K[loc](r) for point 2968
## iso2967 Ripley isotropic correction estimate of K[loc](r) for point 2967
## iso2966 Ripley isotropic correction estimate of K[loc](r) for point 2966
## iso2965 Ripley isotropic correction estimate of K[loc](r) for point 2965
## iso2964 Ripley isotropic correction estimate of K[loc](r) for point 2964
## iso2963 Ripley isotropic correction estimate of K[loc](r) for point 2963
## iso2962 Ripley isotropic correction estimate of K[loc](r) for point 2962
## iso2961 Ripley isotropic correction estimate of K[loc](r) for point 2961
## iso2960 Ripley isotropic correction estimate of K[loc](r) for point 2960
## iso2959 Ripley isotropic correction estimate of K[loc](r) for point 2959
## iso2958 Ripley isotropic correction estimate of K[loc](r) for point 2958
## iso2957 Ripley isotropic correction estimate of K[loc](r) for point 2957
## iso2956 Ripley isotropic correction estimate of K[loc](r) for point 2956
## iso2955 Ripley isotropic correction estimate of K[loc](r) for point 2955
## iso2954 Ripley isotropic correction estimate of K[loc](r) for point 2954
## iso2953 Ripley isotropic correction estimate of K[loc](r) for point 2953
## iso2952 Ripley isotropic correction estimate of K[loc](r) for point 2952
## iso2951 Ripley isotropic correction estimate of K[loc](r) for point 2951
## iso2950 Ripley isotropic correction estimate of K[loc](r) for point 2950
## iso2949 Ripley isotropic correction estimate of K[loc](r) for point 2949
## iso2948 Ripley isotropic correction estimate of K[loc](r) for point 2948
## iso2947 Ripley isotropic correction estimate of K[loc](r) for point 2947
## iso2946 Ripley isotropic correction estimate of K[loc](r) for point 2946
## iso2945 Ripley isotropic correction estimate of K[loc](r) for point 2945
## iso2944 Ripley isotropic correction estimate of K[loc](r) for point 2944
## iso2943 Ripley isotropic correction estimate of K[loc](r) for point 2943
## iso2942 Ripley isotropic correction estimate of K[loc](r) for point 2942
## iso2941 Ripley isotropic correction estimate of K[loc](r) for point 2941
## iso2940 Ripley isotropic correction estimate of K[loc](r) for point 2940
## iso2939 Ripley isotropic correction estimate of K[loc](r) for point 2939
## iso2938 Ripley isotropic correction estimate of K[loc](r) for point 2938
## iso2937 Ripley isotropic correction estimate of K[loc](r) for point 2937
## iso2936 Ripley isotropic correction estimate of K[loc](r) for point 2936
## iso2935 Ripley isotropic correction estimate of K[loc](r) for point 2935
## iso2934 Ripley isotropic correction estimate of K[loc](r) for point 2934
## iso2933 Ripley isotropic correction estimate of K[loc](r) for point 2933
## iso2932 Ripley isotropic correction estimate of K[loc](r) for point 2932
## iso2931 Ripley isotropic correction estimate of K[loc](r) for point 2931
## iso2930 Ripley isotropic correction estimate of K[loc](r) for point 2930
## iso2929 Ripley isotropic correction estimate of K[loc](r) for point 2929
## iso2928 Ripley isotropic correction estimate of K[loc](r) for point 2928
## iso2927 Ripley isotropic correction estimate of K[loc](r) for point 2927
## iso2926 Ripley isotropic correction estimate of K[loc](r) for point 2926
## iso2925 Ripley isotropic correction estimate of K[loc](r) for point 2925
## iso2924 Ripley isotropic correction estimate of K[loc](r) for point 2924
## iso2923 Ripley isotropic correction estimate of K[loc](r) for point 2923
## iso2922 Ripley isotropic correction estimate of K[loc](r) for point 2922
## iso2921 Ripley isotropic correction estimate of K[loc](r) for point 2921
## iso2920 Ripley isotropic correction estimate of K[loc](r) for point 2920
## iso2919 Ripley isotropic correction estimate of K[loc](r) for point 2919
## iso2918 Ripley isotropic correction estimate of K[loc](r) for point 2918
## iso2917 Ripley isotropic correction estimate of K[loc](r) for point 2917
## iso2916 Ripley isotropic correction estimate of K[loc](r) for point 2916
## iso2915 Ripley isotropic correction estimate of K[loc](r) for point 2915
## iso2914 Ripley isotropic correction estimate of K[loc](r) for point 2914
## iso2913 Ripley isotropic correction estimate of K[loc](r) for point 2913
## iso2912 Ripley isotropic correction estimate of K[loc](r) for point 2912
## iso2911 Ripley isotropic correction estimate of K[loc](r) for point 2911
## iso2910 Ripley isotropic correction estimate of K[loc](r) for point 2910
## iso2909 Ripley isotropic correction estimate of K[loc](r) for point 2909
## iso2908 Ripley isotropic correction estimate of K[loc](r) for point 2908
## iso2907 Ripley isotropic correction estimate of K[loc](r) for point 2907
## iso2906 Ripley isotropic correction estimate of K[loc](r) for point 2906
## iso2905 Ripley isotropic correction estimate of K[loc](r) for point 2905
## iso2904 Ripley isotropic correction estimate of K[loc](r) for point 2904
## iso2903 Ripley isotropic correction estimate of K[loc](r) for point 2903
## iso2902 Ripley isotropic correction estimate of K[loc](r) for point 2902
## iso2901 Ripley isotropic correction estimate of K[loc](r) for point 2901
## iso2900 Ripley isotropic correction estimate of K[loc](r) for point 2900
## iso2899 Ripley isotropic correction estimate of K[loc](r) for point 2899
## iso2898 Ripley isotropic correction estimate of K[loc](r) for point 2898
## iso2897 Ripley isotropic correction estimate of K[loc](r) for point 2897
## iso2896 Ripley isotropic correction estimate of K[loc](r) for point 2896
## iso2895 Ripley isotropic correction estimate of K[loc](r) for point 2895
## iso2894 Ripley isotropic correction estimate of K[loc](r) for point 2894
## iso2893 Ripley isotropic correction estimate of K[loc](r) for point 2893
## iso2892 Ripley isotropic correction estimate of K[loc](r) for point 2892
## iso2891 Ripley isotropic correction estimate of K[loc](r) for point 2891
## iso2890 Ripley isotropic correction estimate of K[loc](r) for point 2890
## iso2889 Ripley isotropic correction estimate of K[loc](r) for point 2889
## iso2888 Ripley isotropic correction estimate of K[loc](r) for point 2888
## iso2887 Ripley isotropic correction estimate of K[loc](r) for point 2887
## iso2886 Ripley isotropic correction estimate of K[loc](r) for point 2886
## iso2885 Ripley isotropic correction estimate of K[loc](r) for point 2885
## iso2884 Ripley isotropic correction estimate of K[loc](r) for point 2884
## iso2883 Ripley isotropic correction estimate of K[loc](r) for point 2883
## iso2882 Ripley isotropic correction estimate of K[loc](r) for point 2882
## iso2881 Ripley isotropic correction estimate of K[loc](r) for point 2881
## iso2880 Ripley isotropic correction estimate of K[loc](r) for point 2880
## iso2879 Ripley isotropic correction estimate of K[loc](r) for point 2879
## iso2878 Ripley isotropic correction estimate of K[loc](r) for point 2878
## iso2877 Ripley isotropic correction estimate of K[loc](r) for point 2877
## iso2876 Ripley isotropic correction estimate of K[loc](r) for point 2876
## iso2875 Ripley isotropic correction estimate of K[loc](r) for point 2875
## iso2874 Ripley isotropic correction estimate of K[loc](r) for point 2874
## iso2873 Ripley isotropic correction estimate of K[loc](r) for point 2873
## iso2872 Ripley isotropic correction estimate of K[loc](r) for point 2872
## iso2871 Ripley isotropic correction estimate of K[loc](r) for point 2871
## iso2870 Ripley isotropic correction estimate of K[loc](r) for point 2870
## iso2869 Ripley isotropic correction estimate of K[loc](r) for point 2869
## iso2868 Ripley isotropic correction estimate of K[loc](r) for point 2868
## iso2867 Ripley isotropic correction estimate of K[loc](r) for point 2867
## iso2866 Ripley isotropic correction estimate of K[loc](r) for point 2866
## iso2865 Ripley isotropic correction estimate of K[loc](r) for point 2865
## iso2864 Ripley isotropic correction estimate of K[loc](r) for point 2864
## iso2863 Ripley isotropic correction estimate of K[loc](r) for point 2863
## iso2862 Ripley isotropic correction estimate of K[loc](r) for point 2862
## iso2861 Ripley isotropic correction estimate of K[loc](r) for point 2861
## iso2860 Ripley isotropic correction estimate of K[loc](r) for point 2860
## iso2859 Ripley isotropic correction estimate of K[loc](r) for point 2859
## iso2858 Ripley isotropic correction estimate of K[loc](r) for point 2858
## iso2857 Ripley isotropic correction estimate of K[loc](r) for point 2857
## iso2856 Ripley isotropic correction estimate of K[loc](r) for point 2856
## iso2855 Ripley isotropic correction estimate of K[loc](r) for point 2855
## iso2854 Ripley isotropic correction estimate of K[loc](r) for point 2854
## iso2853 Ripley isotropic correction estimate of K[loc](r) for point 2853
## iso2852 Ripley isotropic correction estimate of K[loc](r) for point 2852
## iso2851 Ripley isotropic correction estimate of K[loc](r) for point 2851
## iso2850 Ripley isotropic correction estimate of K[loc](r) for point 2850
## iso2849 Ripley isotropic correction estimate of K[loc](r) for point 2849
## iso2848 Ripley isotropic correction estimate of K[loc](r) for point 2848
## iso2847 Ripley isotropic correction estimate of K[loc](r) for point 2847
## iso2846 Ripley isotropic correction estimate of K[loc](r) for point 2846
## iso2845 Ripley isotropic correction estimate of K[loc](r) for point 2845
## iso2844 Ripley isotropic correction estimate of K[loc](r) for point 2844
## iso2843 Ripley isotropic correction estimate of K[loc](r) for point 2843
## iso2842 Ripley isotropic correction estimate of K[loc](r) for point 2842
## iso2841 Ripley isotropic correction estimate of K[loc](r) for point 2841
## iso2840 Ripley isotropic correction estimate of K[loc](r) for point 2840
## iso2839 Ripley isotropic correction estimate of K[loc](r) for point 2839
## iso2838 Ripley isotropic correction estimate of K[loc](r) for point 2838
## iso2837 Ripley isotropic correction estimate of K[loc](r) for point 2837
## iso2836 Ripley isotropic correction estimate of K[loc](r) for point 2836
## iso2835 Ripley isotropic correction estimate of K[loc](r) for point 2835
## iso2834 Ripley isotropic correction estimate of K[loc](r) for point 2834
## iso2833 Ripley isotropic correction estimate of K[loc](r) for point 2833
## iso2832 Ripley isotropic correction estimate of K[loc](r) for point 2832
## iso2831 Ripley isotropic correction estimate of K[loc](r) for point 2831
## iso2830 Ripley isotropic correction estimate of K[loc](r) for point 2830
## iso2829 Ripley isotropic correction estimate of K[loc](r) for point 2829
## iso2828 Ripley isotropic correction estimate of K[loc](r) for point 2828
## iso2827 Ripley isotropic correction estimate of K[loc](r) for point 2827
## iso2826 Ripley isotropic correction estimate of K[loc](r) for point 2826
## iso2825 Ripley isotropic correction estimate of K[loc](r) for point 2825
## iso2824 Ripley isotropic correction estimate of K[loc](r) for point 2824
## iso2823 Ripley isotropic correction estimate of K[loc](r) for point 2823
## iso2822 Ripley isotropic correction estimate of K[loc](r) for point 2822
## iso2821 Ripley isotropic correction estimate of K[loc](r) for point 2821
## iso2820 Ripley isotropic correction estimate of K[loc](r) for point 2820
## iso2819 Ripley isotropic correction estimate of K[loc](r) for point 2819
## iso2818 Ripley isotropic correction estimate of K[loc](r) for point 2818
## iso2817 Ripley isotropic correction estimate of K[loc](r) for point 2817
## iso2816 Ripley isotropic correction estimate of K[loc](r) for point 2816
## iso2815 Ripley isotropic correction estimate of K[loc](r) for point 2815
## iso2814 Ripley isotropic correction estimate of K[loc](r) for point 2814
## iso2813 Ripley isotropic correction estimate of K[loc](r) for point 2813
## iso2812 Ripley isotropic correction estimate of K[loc](r) for point 2812
## iso2811 Ripley isotropic correction estimate of K[loc](r) for point 2811
## iso2810 Ripley isotropic correction estimate of K[loc](r) for point 2810
## iso2809 Ripley isotropic correction estimate of K[loc](r) for point 2809
## iso2808 Ripley isotropic correction estimate of K[loc](r) for point 2808
## iso2807 Ripley isotropic correction estimate of K[loc](r) for point 2807
## iso2806 Ripley isotropic correction estimate of K[loc](r) for point 2806
## iso2805 Ripley isotropic correction estimate of K[loc](r) for point 2805
## iso2804 Ripley isotropic correction estimate of K[loc](r) for point 2804
## iso2803 Ripley isotropic correction estimate of K[loc](r) for point 2803
## iso2802 Ripley isotropic correction estimate of K[loc](r) for point 2802
## iso2801 Ripley isotropic correction estimate of K[loc](r) for point 2801
## iso2800 Ripley isotropic correction estimate of K[loc](r) for point 2800
## iso2799 Ripley isotropic correction estimate of K[loc](r) for point 2799
## iso2798 Ripley isotropic correction estimate of K[loc](r) for point 2798
## iso2797 Ripley isotropic correction estimate of K[loc](r) for point 2797
## iso2796 Ripley isotropic correction estimate of K[loc](r) for point 2796
## iso2795 Ripley isotropic correction estimate of K[loc](r) for point 2795
## iso2794 Ripley isotropic correction estimate of K[loc](r) for point 2794
## iso2793 Ripley isotropic correction estimate of K[loc](r) for point 2793
## iso2792 Ripley isotropic correction estimate of K[loc](r) for point 2792
## iso2791 Ripley isotropic correction estimate of K[loc](r) for point 2791
## iso2790 Ripley isotropic correction estimate of K[loc](r) for point 2790
## iso2789 Ripley isotropic correction estimate of K[loc](r) for point 2789
## iso2788 Ripley isotropic correction estimate of K[loc](r) for point 2788
## iso2787 Ripley isotropic correction estimate of K[loc](r) for point 2787
## iso2786 Ripley isotropic correction estimate of K[loc](r) for point 2786
## iso2785 Ripley isotropic correction estimate of K[loc](r) for point 2785
## iso2784 Ripley isotropic correction estimate of K[loc](r) for point 2784
## iso2783 Ripley isotropic correction estimate of K[loc](r) for point 2783
## iso2782 Ripley isotropic correction estimate of K[loc](r) for point 2782
## iso2781 Ripley isotropic correction estimate of K[loc](r) for point 2781
## iso2780 Ripley isotropic correction estimate of K[loc](r) for point 2780
## iso2779 Ripley isotropic correction estimate of K[loc](r) for point 2779
## iso2778 Ripley isotropic correction estimate of K[loc](r) for point 2778
## iso2777 Ripley isotropic correction estimate of K[loc](r) for point 2777
## iso2776 Ripley isotropic correction estimate of K[loc](r) for point 2776
## iso2775 Ripley isotropic correction estimate of K[loc](r) for point 2775
## iso2774 Ripley isotropic correction estimate of K[loc](r) for point 2774
## iso2773 Ripley isotropic correction estimate of K[loc](r) for point 2773
## iso2772 Ripley isotropic correction estimate of K[loc](r) for point 2772
## iso2771 Ripley isotropic correction estimate of K[loc](r) for point 2771
## iso2770 Ripley isotropic correction estimate of K[loc](r) for point 2770
## iso2769 Ripley isotropic correction estimate of K[loc](r) for point 2769
## iso2768 Ripley isotropic correction estimate of K[loc](r) for point 2768
## iso2767 Ripley isotropic correction estimate of K[loc](r) for point 2767
## iso2766 Ripley isotropic correction estimate of K[loc](r) for point 2766
## iso2765 Ripley isotropic correction estimate of K[loc](r) for point 2765
## iso2764 Ripley isotropic correction estimate of K[loc](r) for point 2764
## iso2763 Ripley isotropic correction estimate of K[loc](r) for point 2763
## iso2762 Ripley isotropic correction estimate of K[loc](r) for point 2762
## iso2761 Ripley isotropic correction estimate of K[loc](r) for point 2761
## iso2760 Ripley isotropic correction estimate of K[loc](r) for point 2760
## iso2759 Ripley isotropic correction estimate of K[loc](r) for point 2759
## iso2758 Ripley isotropic correction estimate of K[loc](r) for point 2758
## iso2757 Ripley isotropic correction estimate of K[loc](r) for point 2757
## iso2756 Ripley isotropic correction estimate of K[loc](r) for point 2756
## iso2755 Ripley isotropic correction estimate of K[loc](r) for point 2755
## iso2754 Ripley isotropic correction estimate of K[loc](r) for point 2754
## iso2753 Ripley isotropic correction estimate of K[loc](r) for point 2753
## iso2752 Ripley isotropic correction estimate of K[loc](r) for point 2752
## iso2751 Ripley isotropic correction estimate of K[loc](r) for point 2751
## iso2750 Ripley isotropic correction estimate of K[loc](r) for point 2750
## iso2749 Ripley isotropic correction estimate of K[loc](r) for point 2749
## iso2748 Ripley isotropic correction estimate of K[loc](r) for point 2748
## iso2747 Ripley isotropic correction estimate of K[loc](r) for point 2747
## iso2746 Ripley isotropic correction estimate of K[loc](r) for point 2746
## iso2745 Ripley isotropic correction estimate of K[loc](r) for point 2745
## iso2744 Ripley isotropic correction estimate of K[loc](r) for point 2744
## iso2743 Ripley isotropic correction estimate of K[loc](r) for point 2743
## iso2742 Ripley isotropic correction estimate of K[loc](r) for point 2742
## iso2741 Ripley isotropic correction estimate of K[loc](r) for point 2741
## iso2740 Ripley isotropic correction estimate of K[loc](r) for point 2740
## iso2739 Ripley isotropic correction estimate of K[loc](r) for point 2739
## iso2738 Ripley isotropic correction estimate of K[loc](r) for point 2738
## iso2737 Ripley isotropic correction estimate of K[loc](r) for point 2737
## iso2736 Ripley isotropic correction estimate of K[loc](r) for point 2736
## iso2735 Ripley isotropic correction estimate of K[loc](r) for point 2735
## iso2734 Ripley isotropic correction estimate of K[loc](r) for point 2734
## iso2733 Ripley isotropic correction estimate of K[loc](r) for point 2733
## iso2732 Ripley isotropic correction estimate of K[loc](r) for point 2732
## iso2731 Ripley isotropic correction estimate of K[loc](r) for point 2731
## iso2730 Ripley isotropic correction estimate of K[loc](r) for point 2730
## iso2729 Ripley isotropic correction estimate of K[loc](r) for point 2729
## iso2728 Ripley isotropic correction estimate of K[loc](r) for point 2728
## iso2727 Ripley isotropic correction estimate of K[loc](r) for point 2727
## iso2726 Ripley isotropic correction estimate of K[loc](r) for point 2726
## iso2725 Ripley isotropic correction estimate of K[loc](r) for point 2725
## iso2724 Ripley isotropic correction estimate of K[loc](r) for point 2724
## iso2723 Ripley isotropic correction estimate of K[loc](r) for point 2723
## iso2722 Ripley isotropic correction estimate of K[loc](r) for point 2722
## iso2721 Ripley isotropic correction estimate of K[loc](r) for point 2721
## iso2720 Ripley isotropic correction estimate of K[loc](r) for point 2720
## iso2719 Ripley isotropic correction estimate of K[loc](r) for point 2719
## iso2718 Ripley isotropic correction estimate of K[loc](r) for point 2718
## iso2717 Ripley isotropic correction estimate of K[loc](r) for point 2717
## iso2716 Ripley isotropic correction estimate of K[loc](r) for point 2716
## iso2715 Ripley isotropic correction estimate of K[loc](r) for point 2715
## iso2714 Ripley isotropic correction estimate of K[loc](r) for point 2714
## iso2713 Ripley isotropic correction estimate of K[loc](r) for point 2713
## iso2712 Ripley isotropic correction estimate of K[loc](r) for point 2712
## iso2711 Ripley isotropic correction estimate of K[loc](r) for point 2711
## iso2710 Ripley isotropic correction estimate of K[loc](r) for point 2710
## iso2709 Ripley isotropic correction estimate of K[loc](r) for point 2709
## iso2708 Ripley isotropic correction estimate of K[loc](r) for point 2708
## iso2707 Ripley isotropic correction estimate of K[loc](r) for point 2707
## iso2706 Ripley isotropic correction estimate of K[loc](r) for point 2706
## iso2705 Ripley isotropic correction estimate of K[loc](r) for point 2705
## iso2704 Ripley isotropic correction estimate of K[loc](r) for point 2704
## iso2703 Ripley isotropic correction estimate of K[loc](r) for point 2703
## iso2702 Ripley isotropic correction estimate of K[loc](r) for point 2702
## iso2701 Ripley isotropic correction estimate of K[loc](r) for point 2701
## iso2700 Ripley isotropic correction estimate of K[loc](r) for point 2700
## iso2699 Ripley isotropic correction estimate of K[loc](r) for point 2699
## iso2698 Ripley isotropic correction estimate of K[loc](r) for point 2698
## iso2697 Ripley isotropic correction estimate of K[loc](r) for point 2697
## iso2696 Ripley isotropic correction estimate of K[loc](r) for point 2696
## iso2695 Ripley isotropic correction estimate of K[loc](r) for point 2695
## iso2694 Ripley isotropic correction estimate of K[loc](r) for point 2694
## iso2693 Ripley isotropic correction estimate of K[loc](r) for point 2693
## iso2692 Ripley isotropic correction estimate of K[loc](r) for point 2692
## iso2691 Ripley isotropic correction estimate of K[loc](r) for point 2691
## iso2690 Ripley isotropic correction estimate of K[loc](r) for point 2690
## iso2689 Ripley isotropic correction estimate of K[loc](r) for point 2689
## iso2688 Ripley isotropic correction estimate of K[loc](r) for point 2688
## iso2687 Ripley isotropic correction estimate of K[loc](r) for point 2687
## iso2686 Ripley isotropic correction estimate of K[loc](r) for point 2686
## iso2685 Ripley isotropic correction estimate of K[loc](r) for point 2685
## iso2684 Ripley isotropic correction estimate of K[loc](r) for point 2684
## iso2683 Ripley isotropic correction estimate of K[loc](r) for point 2683
## iso2682 Ripley isotropic correction estimate of K[loc](r) for point 2682
## iso2681 Ripley isotropic correction estimate of K[loc](r) for point 2681
## iso2680 Ripley isotropic correction estimate of K[loc](r) for point 2680
## iso2679 Ripley isotropic correction estimate of K[loc](r) for point 2679
## iso2678 Ripley isotropic correction estimate of K[loc](r) for point 2678
## iso2677 Ripley isotropic correction estimate of K[loc](r) for point 2677
## iso2676 Ripley isotropic correction estimate of K[loc](r) for point 2676
## iso2675 Ripley isotropic correction estimate of K[loc](r) for point 2675
## iso2674 Ripley isotropic correction estimate of K[loc](r) for point 2674
## iso2673 Ripley isotropic correction estimate of K[loc](r) for point 2673
## iso2672 Ripley isotropic correction estimate of K[loc](r) for point 2672
## iso2671 Ripley isotropic correction estimate of K[loc](r) for point 2671
## iso2670 Ripley isotropic correction estimate of K[loc](r) for point 2670
## iso2669 Ripley isotropic correction estimate of K[loc](r) for point 2669
## iso2668 Ripley isotropic correction estimate of K[loc](r) for point 2668
## iso2667 Ripley isotropic correction estimate of K[loc](r) for point 2667
## iso2666 Ripley isotropic correction estimate of K[loc](r) for point 2666
## iso2665 Ripley isotropic correction estimate of K[loc](r) for point 2665
## iso2664 Ripley isotropic correction estimate of K[loc](r) for point 2664
## iso2663 Ripley isotropic correction estimate of K[loc](r) for point 2663
## iso2662 Ripley isotropic correction estimate of K[loc](r) for point 2662
## iso2661 Ripley isotropic correction estimate of K[loc](r) for point 2661
## iso2660 Ripley isotropic correction estimate of K[loc](r) for point 2660
## iso2659 Ripley isotropic correction estimate of K[loc](r) for point 2659
## iso2658 Ripley isotropic correction estimate of K[loc](r) for point 2658
## iso2657 Ripley isotropic correction estimate of K[loc](r) for point 2657
## iso2656 Ripley isotropic correction estimate of K[loc](r) for point 2656
## iso2655 Ripley isotropic correction estimate of K[loc](r) for point 2655
## iso2654 Ripley isotropic correction estimate of K[loc](r) for point 2654
## iso2653 Ripley isotropic correction estimate of K[loc](r) for point 2653
## iso2652 Ripley isotropic correction estimate of K[loc](r) for point 2652
## iso2651 Ripley isotropic correction estimate of K[loc](r) for point 2651
## iso2650 Ripley isotropic correction estimate of K[loc](r) for point 2650
## iso2649 Ripley isotropic correction estimate of K[loc](r) for point 2649
## iso2648 Ripley isotropic correction estimate of K[loc](r) for point 2648
## iso2647 Ripley isotropic correction estimate of K[loc](r) for point 2647
## iso2646 Ripley isotropic correction estimate of K[loc](r) for point 2646
## iso2645 Ripley isotropic correction estimate of K[loc](r) for point 2645
## iso2644 Ripley isotropic correction estimate of K[loc](r) for point 2644
## iso2643 Ripley isotropic correction estimate of K[loc](r) for point 2643
## iso2642 Ripley isotropic correction estimate of K[loc](r) for point 2642
## iso2641 Ripley isotropic correction estimate of K[loc](r) for point 2641
## iso2640 Ripley isotropic correction estimate of K[loc](r) for point 2640
## iso2639 Ripley isotropic correction estimate of K[loc](r) for point 2639
## iso2638 Ripley isotropic correction estimate of K[loc](r) for point 2638
## iso2637 Ripley isotropic correction estimate of K[loc](r) for point 2637
## iso2636 Ripley isotropic correction estimate of K[loc](r) for point 2636
## iso2635 Ripley isotropic correction estimate of K[loc](r) for point 2635
## iso2634 Ripley isotropic correction estimate of K[loc](r) for point 2634
## iso2633 Ripley isotropic correction estimate of K[loc](r) for point 2633
## iso2632 Ripley isotropic correction estimate of K[loc](r) for point 2632
## iso2631 Ripley isotropic correction estimate of K[loc](r) for point 2631
## iso2630 Ripley isotropic correction estimate of K[loc](r) for point 2630
## iso2629 Ripley isotropic correction estimate of K[loc](r) for point 2629
## iso2628 Ripley isotropic correction estimate of K[loc](r) for point 2628
## iso2627 Ripley isotropic correction estimate of K[loc](r) for point 2627
## iso2626 Ripley isotropic correction estimate of K[loc](r) for point 2626
## iso2625 Ripley isotropic correction estimate of K[loc](r) for point 2625
## iso2624 Ripley isotropic correction estimate of K[loc](r) for point 2624
## iso2623 Ripley isotropic correction estimate of K[loc](r) for point 2623
## iso2622 Ripley isotropic correction estimate of K[loc](r) for point 2622
## iso2621 Ripley isotropic correction estimate of K[loc](r) for point 2621
## iso2620 Ripley isotropic correction estimate of K[loc](r) for point 2620
## iso2619 Ripley isotropic correction estimate of K[loc](r) for point 2619
## iso2618 Ripley isotropic correction estimate of K[loc](r) for point 2618
## iso2617 Ripley isotropic correction estimate of K[loc](r) for point 2617
## iso2616 Ripley isotropic correction estimate of K[loc](r) for point 2616
## iso2615 Ripley isotropic correction estimate of K[loc](r) for point 2615
## iso2614 Ripley isotropic correction estimate of K[loc](r) for point 2614
## iso2613 Ripley isotropic correction estimate of K[loc](r) for point 2613
## iso2612 Ripley isotropic correction estimate of K[loc](r) for point 2612
## iso2611 Ripley isotropic correction estimate of K[loc](r) for point 2611
## iso2610 Ripley isotropic correction estimate of K[loc](r) for point 2610
## iso2609 Ripley isotropic correction estimate of K[loc](r) for point 2609
## iso2608 Ripley isotropic correction estimate of K[loc](r) for point 2608
## iso2607 Ripley isotropic correction estimate of K[loc](r) for point 2607
## iso2606 Ripley isotropic correction estimate of K[loc](r) for point 2606
## iso2605 Ripley isotropic correction estimate of K[loc](r) for point 2605
## iso2604 Ripley isotropic correction estimate of K[loc](r) for point 2604
## iso2603 Ripley isotropic correction estimate of K[loc](r) for point 2603
## iso2602 Ripley isotropic correction estimate of K[loc](r) for point 2602
## iso2601 Ripley isotropic correction estimate of K[loc](r) for point 2601
## iso2600 Ripley isotropic correction estimate of K[loc](r) for point 2600
## iso2599 Ripley isotropic correction estimate of K[loc](r) for point 2599
## iso2598 Ripley isotropic correction estimate of K[loc](r) for point 2598
## iso2597 Ripley isotropic correction estimate of K[loc](r) for point 2597
## iso2596 Ripley isotropic correction estimate of K[loc](r) for point 2596
## iso2595 Ripley isotropic correction estimate of K[loc](r) for point 2595
## iso2594 Ripley isotropic correction estimate of K[loc](r) for point 2594
## iso2593 Ripley isotropic correction estimate of K[loc](r) for point 2593
## iso2592 Ripley isotropic correction estimate of K[loc](r) for point 2592
## iso2591 Ripley isotropic correction estimate of K[loc](r) for point 2591
## iso2590 Ripley isotropic correction estimate of K[loc](r) for point 2590
## iso2589 Ripley isotropic correction estimate of K[loc](r) for point 2589
## iso2588 Ripley isotropic correction estimate of K[loc](r) for point 2588
## iso2587 Ripley isotropic correction estimate of K[loc](r) for point 2587
## iso2586 Ripley isotropic correction estimate of K[loc](r) for point 2586
## iso2585 Ripley isotropic correction estimate of K[loc](r) for point 2585
## iso2584 Ripley isotropic correction estimate of K[loc](r) for point 2584
## iso2583 Ripley isotropic correction estimate of K[loc](r) for point 2583
## iso2582 Ripley isotropic correction estimate of K[loc](r) for point 2582
## iso2581 Ripley isotropic correction estimate of K[loc](r) for point 2581
## iso2580 Ripley isotropic correction estimate of K[loc](r) for point 2580
## iso2579 Ripley isotropic correction estimate of K[loc](r) for point 2579
## iso2578 Ripley isotropic correction estimate of K[loc](r) for point 2578
## iso2577 Ripley isotropic correction estimate of K[loc](r) for point 2577
## iso2576 Ripley isotropic correction estimate of K[loc](r) for point 2576
## iso2575 Ripley isotropic correction estimate of K[loc](r) for point 2575
## iso2574 Ripley isotropic correction estimate of K[loc](r) for point 2574
## iso2573 Ripley isotropic correction estimate of K[loc](r) for point 2573
## iso2572 Ripley isotropic correction estimate of K[loc](r) for point 2572
## iso2571 Ripley isotropic correction estimate of K[loc](r) for point 2571
## iso2570 Ripley isotropic correction estimate of K[loc](r) for point 2570
## iso2569 Ripley isotropic correction estimate of K[loc](r) for point 2569
## iso2568 Ripley isotropic correction estimate of K[loc](r) for point 2568
## iso2567 Ripley isotropic correction estimate of K[loc](r) for point 2567
## iso2566 Ripley isotropic correction estimate of K[loc](r) for point 2566
## iso2565 Ripley isotropic correction estimate of K[loc](r) for point 2565
## iso2564 Ripley isotropic correction estimate of K[loc](r) for point 2564
## iso2563 Ripley isotropic correction estimate of K[loc](r) for point 2563
## iso2562 Ripley isotropic correction estimate of K[loc](r) for point 2562
## iso2561 Ripley isotropic correction estimate of K[loc](r) for point 2561
## iso2560 Ripley isotropic correction estimate of K[loc](r) for point 2560
## iso2559 Ripley isotropic correction estimate of K[loc](r) for point 2559
## iso2558 Ripley isotropic correction estimate of K[loc](r) for point 2558
## iso2557 Ripley isotropic correction estimate of K[loc](r) for point 2557
## iso2556 Ripley isotropic correction estimate of K[loc](r) for point 2556
## iso2555 Ripley isotropic correction estimate of K[loc](r) for point 2555
## iso2554 Ripley isotropic correction estimate of K[loc](r) for point 2554
## iso2553 Ripley isotropic correction estimate of K[loc](r) for point 2553
## iso2552 Ripley isotropic correction estimate of K[loc](r) for point 2552
## iso2551 Ripley isotropic correction estimate of K[loc](r) for point 2551
## iso2550 Ripley isotropic correction estimate of K[loc](r) for point 2550
## iso2549 Ripley isotropic correction estimate of K[loc](r) for point 2549
## iso2548 Ripley isotropic correction estimate of K[loc](r) for point 2548
## iso2547 Ripley isotropic correction estimate of K[loc](r) for point 2547
## iso2546 Ripley isotropic correction estimate of K[loc](r) for point 2546
## iso2545 Ripley isotropic correction estimate of K[loc](r) for point 2545
## iso2544 Ripley isotropic correction estimate of K[loc](r) for point 2544
## iso2543 Ripley isotropic correction estimate of K[loc](r) for point 2543
## iso2542 Ripley isotropic correction estimate of K[loc](r) for point 2542
## iso2541 Ripley isotropic correction estimate of K[loc](r) for point 2541
## iso2540 Ripley isotropic correction estimate of K[loc](r) for point 2540
## iso2539 Ripley isotropic correction estimate of K[loc](r) for point 2539
## iso2538 Ripley isotropic correction estimate of K[loc](r) for point 2538
## iso2537 Ripley isotropic correction estimate of K[loc](r) for point 2537
## iso2536 Ripley isotropic correction estimate of K[loc](r) for point 2536
## iso2535 Ripley isotropic correction estimate of K[loc](r) for point 2535
## iso2534 Ripley isotropic correction estimate of K[loc](r) for point 2534
## iso2533 Ripley isotropic correction estimate of K[loc](r) for point 2533
## iso2532 Ripley isotropic correction estimate of K[loc](r) for point 2532
## iso2531 Ripley isotropic correction estimate of K[loc](r) for point 2531
## iso2530 Ripley isotropic correction estimate of K[loc](r) for point 2530
## iso2529 Ripley isotropic correction estimate of K[loc](r) for point 2529
## iso2528 Ripley isotropic correction estimate of K[loc](r) for point 2528
## iso2527 Ripley isotropic correction estimate of K[loc](r) for point 2527
## iso2526 Ripley isotropic correction estimate of K[loc](r) for point 2526
## iso2525 Ripley isotropic correction estimate of K[loc](r) for point 2525
## iso2524 Ripley isotropic correction estimate of K[loc](r) for point 2524
## iso2523 Ripley isotropic correction estimate of K[loc](r) for point 2523
## iso2522 Ripley isotropic correction estimate of K[loc](r) for point 2522
## iso2521 Ripley isotropic correction estimate of K[loc](r) for point 2521
## iso2520 Ripley isotropic correction estimate of K[loc](r) for point 2520
## iso2519 Ripley isotropic correction estimate of K[loc](r) for point 2519
## iso2518 Ripley isotropic correction estimate of K[loc](r) for point 2518
## iso2517 Ripley isotropic correction estimate of K[loc](r) for point 2517
## iso2516 Ripley isotropic correction estimate of K[loc](r) for point 2516
## iso2515 Ripley isotropic correction estimate of K[loc](r) for point 2515
## iso2514 Ripley isotropic correction estimate of K[loc](r) for point 2514
## iso2513 Ripley isotropic correction estimate of K[loc](r) for point 2513
## iso2512 Ripley isotropic correction estimate of K[loc](r) for point 2512
## iso2511 Ripley isotropic correction estimate of K[loc](r) for point 2511
## iso2510 Ripley isotropic correction estimate of K[loc](r) for point 2510
## iso2509 Ripley isotropic correction estimate of K[loc](r) for point 2509
## iso2508 Ripley isotropic correction estimate of K[loc](r) for point 2508
## iso2507 Ripley isotropic correction estimate of K[loc](r) for point 2507
## iso2506 Ripley isotropic correction estimate of K[loc](r) for point 2506
## iso2505 Ripley isotropic correction estimate of K[loc](r) for point 2505
## iso2504 Ripley isotropic correction estimate of K[loc](r) for point 2504
## iso2503 Ripley isotropic correction estimate of K[loc](r) for point 2503
## iso2502 Ripley isotropic correction estimate of K[loc](r) for point 2502
## iso2501 Ripley isotropic correction estimate of K[loc](r) for point 2501
## iso2500 Ripley isotropic correction estimate of K[loc](r) for point 2500
## iso2499 Ripley isotropic correction estimate of K[loc](r) for point 2499
## iso2498 Ripley isotropic correction estimate of K[loc](r) for point 2498
## iso2497 Ripley isotropic correction estimate of K[loc](r) for point 2497
## iso2496 Ripley isotropic correction estimate of K[loc](r) for point 2496
## iso2495 Ripley isotropic correction estimate of K[loc](r) for point 2495
## iso2494 Ripley isotropic correction estimate of K[loc](r) for point 2494
## iso2493 Ripley isotropic correction estimate of K[loc](r) for point 2493
## iso2492 Ripley isotropic correction estimate of K[loc](r) for point 2492
## iso2491 Ripley isotropic correction estimate of K[loc](r) for point 2491
## iso2490 Ripley isotropic correction estimate of K[loc](r) for point 2490
## iso2489 Ripley isotropic correction estimate of K[loc](r) for point 2489
## iso2488 Ripley isotropic correction estimate of K[loc](r) for point 2488
## iso2487 Ripley isotropic correction estimate of K[loc](r) for point 2487
## iso2486 Ripley isotropic correction estimate of K[loc](r) for point 2486
## iso2485 Ripley isotropic correction estimate of K[loc](r) for point 2485
## iso2484 Ripley isotropic correction estimate of K[loc](r) for point 2484
## iso2483 Ripley isotropic correction estimate of K[loc](r) for point 2483
## iso2482 Ripley isotropic correction estimate of K[loc](r) for point 2482
## iso2481 Ripley isotropic correction estimate of K[loc](r) for point 2481
## iso2480 Ripley isotropic correction estimate of K[loc](r) for point 2480
## iso2479 Ripley isotropic correction estimate of K[loc](r) for point 2479
## iso2478 Ripley isotropic correction estimate of K[loc](r) for point 2478
## iso2477 Ripley isotropic correction estimate of K[loc](r) for point 2477
## iso2476 Ripley isotropic correction estimate of K[loc](r) for point 2476
## iso2475 Ripley isotropic correction estimate of K[loc](r) for point 2475
## iso2474 Ripley isotropic correction estimate of K[loc](r) for point 2474
## iso2473 Ripley isotropic correction estimate of K[loc](r) for point 2473
## iso2472 Ripley isotropic correction estimate of K[loc](r) for point 2472
## iso2471 Ripley isotropic correction estimate of K[loc](r) for point 2471
## iso2470 Ripley isotropic correction estimate of K[loc](r) for point 2470
## iso2469 Ripley isotropic correction estimate of K[loc](r) for point 2469
## iso2468 Ripley isotropic correction estimate of K[loc](r) for point 2468
## iso2467 Ripley isotropic correction estimate of K[loc](r) for point 2467
## iso2466 Ripley isotropic correction estimate of K[loc](r) for point 2466
## iso2465 Ripley isotropic correction estimate of K[loc](r) for point 2465
## iso2464 Ripley isotropic correction estimate of K[loc](r) for point 2464
## iso2463 Ripley isotropic correction estimate of K[loc](r) for point 2463
## iso2462 Ripley isotropic correction estimate of K[loc](r) for point 2462
## iso2461 Ripley isotropic correction estimate of K[loc](r) for point 2461
## iso2460 Ripley isotropic correction estimate of K[loc](r) for point 2460
## iso2459 Ripley isotropic correction estimate of K[loc](r) for point 2459
## iso2458 Ripley isotropic correction estimate of K[loc](r) for point 2458
## iso2457 Ripley isotropic correction estimate of K[loc](r) for point 2457
## iso2456 Ripley isotropic correction estimate of K[loc](r) for point 2456
## iso2455 Ripley isotropic correction estimate of K[loc](r) for point 2455
## iso2454 Ripley isotropic correction estimate of K[loc](r) for point 2454
## iso2453 Ripley isotropic correction estimate of K[loc](r) for point 2453
## iso2452 Ripley isotropic correction estimate of K[loc](r) for point 2452
## iso2451 Ripley isotropic correction estimate of K[loc](r) for point 2451
## iso2450 Ripley isotropic correction estimate of K[loc](r) for point 2450
## iso2449 Ripley isotropic correction estimate of K[loc](r) for point 2449
## iso2448 Ripley isotropic correction estimate of K[loc](r) for point 2448
## iso2447 Ripley isotropic correction estimate of K[loc](r) for point 2447
## iso2446 Ripley isotropic correction estimate of K[loc](r) for point 2446
## iso2445 Ripley isotropic correction estimate of K[loc](r) for point 2445
## iso2444 Ripley isotropic correction estimate of K[loc](r) for point 2444
## iso2443 Ripley isotropic correction estimate of K[loc](r) for point 2443
## iso2442 Ripley isotropic correction estimate of K[loc](r) for point 2442
## iso2441 Ripley isotropic correction estimate of K[loc](r) for point 2441
## iso2440 Ripley isotropic correction estimate of K[loc](r) for point 2440
## iso2439 Ripley isotropic correction estimate of K[loc](r) for point 2439
## iso2438 Ripley isotropic correction estimate of K[loc](r) for point 2438
## iso2437 Ripley isotropic correction estimate of K[loc](r) for point 2437
## iso2436 Ripley isotropic correction estimate of K[loc](r) for point 2436
## iso2435 Ripley isotropic correction estimate of K[loc](r) for point 2435
## iso2434 Ripley isotropic correction estimate of K[loc](r) for point 2434
## iso2433 Ripley isotropic correction estimate of K[loc](r) for point 2433
## iso2432 Ripley isotropic correction estimate of K[loc](r) for point 2432
## iso2431 Ripley isotropic correction estimate of K[loc](r) for point 2431
## iso2430 Ripley isotropic correction estimate of K[loc](r) for point 2430
## iso2429 Ripley isotropic correction estimate of K[loc](r) for point 2429
## iso2428 Ripley isotropic correction estimate of K[loc](r) for point 2428
## iso2427 Ripley isotropic correction estimate of K[loc](r) for point 2427
## iso2426 Ripley isotropic correction estimate of K[loc](r) for point 2426
## iso2425 Ripley isotropic correction estimate of K[loc](r) for point 2425
## iso2424 Ripley isotropic correction estimate of K[loc](r) for point 2424
## iso2423 Ripley isotropic correction estimate of K[loc](r) for point 2423
## iso2422 Ripley isotropic correction estimate of K[loc](r) for point 2422
## iso2421 Ripley isotropic correction estimate of K[loc](r) for point 2421
## iso2420 Ripley isotropic correction estimate of K[loc](r) for point 2420
## iso2419 Ripley isotropic correction estimate of K[loc](r) for point 2419
## iso2418 Ripley isotropic correction estimate of K[loc](r) for point 2418
## iso2417 Ripley isotropic correction estimate of K[loc](r) for point 2417
## iso2416 Ripley isotropic correction estimate of K[loc](r) for point 2416
## iso2415 Ripley isotropic correction estimate of K[loc](r) for point 2415
## iso2414 Ripley isotropic correction estimate of K[loc](r) for point 2414
## iso2413 Ripley isotropic correction estimate of K[loc](r) for point 2413
## iso2412 Ripley isotropic correction estimate of K[loc](r) for point 2412
## iso2411 Ripley isotropic correction estimate of K[loc](r) for point 2411
## iso2410 Ripley isotropic correction estimate of K[loc](r) for point 2410
## iso2409 Ripley isotropic correction estimate of K[loc](r) for point 2409
## iso2408 Ripley isotropic correction estimate of K[loc](r) for point 2408
## iso2407 Ripley isotropic correction estimate of K[loc](r) for point 2407
## iso2406 Ripley isotropic correction estimate of K[loc](r) for point 2406
## iso2405 Ripley isotropic correction estimate of K[loc](r) for point 2405
## iso2404 Ripley isotropic correction estimate of K[loc](r) for point 2404
## iso2403 Ripley isotropic correction estimate of K[loc](r) for point 2403
## iso2402 Ripley isotropic correction estimate of K[loc](r) for point 2402
## iso2401 Ripley isotropic correction estimate of K[loc](r) for point 2401
## iso2400 Ripley isotropic correction estimate of K[loc](r) for point 2400
## iso2399 Ripley isotropic correction estimate of K[loc](r) for point 2399
## iso2398 Ripley isotropic correction estimate of K[loc](r) for point 2398
## iso2397 Ripley isotropic correction estimate of K[loc](r) for point 2397
## iso2396 Ripley isotropic correction estimate of K[loc](r) for point 2396
## iso2395 Ripley isotropic correction estimate of K[loc](r) for point 2395
## iso2394 Ripley isotropic correction estimate of K[loc](r) for point 2394
## iso2393 Ripley isotropic correction estimate of K[loc](r) for point 2393
## iso2392 Ripley isotropic correction estimate of K[loc](r) for point 2392
## iso2391 Ripley isotropic correction estimate of K[loc](r) for point 2391
## iso2390 Ripley isotropic correction estimate of K[loc](r) for point 2390
## iso2389 Ripley isotropic correction estimate of K[loc](r) for point 2389
## iso2388 Ripley isotropic correction estimate of K[loc](r) for point 2388
## iso2387 Ripley isotropic correction estimate of K[loc](r) for point 2387
## iso2386 Ripley isotropic correction estimate of K[loc](r) for point 2386
## iso2385 Ripley isotropic correction estimate of K[loc](r) for point 2385
## iso2384 Ripley isotropic correction estimate of K[loc](r) for point 2384
## iso2383 Ripley isotropic correction estimate of K[loc](r) for point 2383
## iso2382 Ripley isotropic correction estimate of K[loc](r) for point 2382
## iso2381 Ripley isotropic correction estimate of K[loc](r) for point 2381
## iso2380 Ripley isotropic correction estimate of K[loc](r) for point 2380
## iso2379 Ripley isotropic correction estimate of K[loc](r) for point 2379
## iso2378 Ripley isotropic correction estimate of K[loc](r) for point 2378
## iso2377 Ripley isotropic correction estimate of K[loc](r) for point 2377
## iso2376 Ripley isotropic correction estimate of K[loc](r) for point 2376
## iso2375 Ripley isotropic correction estimate of K[loc](r) for point 2375
## iso2374 Ripley isotropic correction estimate of K[loc](r) for point 2374
## iso2373 Ripley isotropic correction estimate of K[loc](r) for point 2373
## iso2372 Ripley isotropic correction estimate of K[loc](r) for point 2372
## iso2371 Ripley isotropic correction estimate of K[loc](r) for point 2371
## iso2370 Ripley isotropic correction estimate of K[loc](r) for point 2370
## iso2369 Ripley isotropic correction estimate of K[loc](r) for point 2369
## iso2368 Ripley isotropic correction estimate of K[loc](r) for point 2368
## iso2367 Ripley isotropic correction estimate of K[loc](r) for point 2367
## iso2366 Ripley isotropic correction estimate of K[loc](r) for point 2366
## iso2365 Ripley isotropic correction estimate of K[loc](r) for point 2365
## iso2364 Ripley isotropic correction estimate of K[loc](r) for point 2364
## iso2363 Ripley isotropic correction estimate of K[loc](r) for point 2363
## iso2362 Ripley isotropic correction estimate of K[loc](r) for point 2362
## iso2361 Ripley isotropic correction estimate of K[loc](r) for point 2361
## iso2360 Ripley isotropic correction estimate of K[loc](r) for point 2360
## iso2359 Ripley isotropic correction estimate of K[loc](r) for point 2359
## iso2358 Ripley isotropic correction estimate of K[loc](r) for point 2358
## iso2357 Ripley isotropic correction estimate of K[loc](r) for point 2357
## iso2356 Ripley isotropic correction estimate of K[loc](r) for point 2356
## iso2355 Ripley isotropic correction estimate of K[loc](r) for point 2355
## iso2354 Ripley isotropic correction estimate of K[loc](r) for point 2354
## iso2353 Ripley isotropic correction estimate of K[loc](r) for point 2353
## iso2352 Ripley isotropic correction estimate of K[loc](r) for point 2352
## iso2351 Ripley isotropic correction estimate of K[loc](r) for point 2351
## iso2350 Ripley isotropic correction estimate of K[loc](r) for point 2350
## iso2349 Ripley isotropic correction estimate of K[loc](r) for point 2349
## iso2348 Ripley isotropic correction estimate of K[loc](r) for point 2348
## iso2347 Ripley isotropic correction estimate of K[loc](r) for point 2347
## iso2346 Ripley isotropic correction estimate of K[loc](r) for point 2346
## iso2345 Ripley isotropic correction estimate of K[loc](r) for point 2345
## iso2344 Ripley isotropic correction estimate of K[loc](r) for point 2344
## iso2343 Ripley isotropic correction estimate of K[loc](r) for point 2343
## iso2342 Ripley isotropic correction estimate of K[loc](r) for point 2342
## iso2341 Ripley isotropic correction estimate of K[loc](r) for point 2341
## iso2340 Ripley isotropic correction estimate of K[loc](r) for point 2340
## iso2339 Ripley isotropic correction estimate of K[loc](r) for point 2339
## iso2338 Ripley isotropic correction estimate of K[loc](r) for point 2338
## iso2337 Ripley isotropic correction estimate of K[loc](r) for point 2337
## iso2336 Ripley isotropic correction estimate of K[loc](r) for point 2336
## iso2335 Ripley isotropic correction estimate of K[loc](r) for point 2335
## iso2334 Ripley isotropic correction estimate of K[loc](r) for point 2334
## iso2333 Ripley isotropic correction estimate of K[loc](r) for point 2333
## iso2332 Ripley isotropic correction estimate of K[loc](r) for point 2332
## iso2331 Ripley isotropic correction estimate of K[loc](r) for point 2331
## iso2330 Ripley isotropic correction estimate of K[loc](r) for point 2330
## iso2329 Ripley isotropic correction estimate of K[loc](r) for point 2329
## iso2328 Ripley isotropic correction estimate of K[loc](r) for point 2328
## iso2327 Ripley isotropic correction estimate of K[loc](r) for point 2327
## iso2326 Ripley isotropic correction estimate of K[loc](r) for point 2326
## iso2325 Ripley isotropic correction estimate of K[loc](r) for point 2325
## iso2324 Ripley isotropic correction estimate of K[loc](r) for point 2324
## iso2323 Ripley isotropic correction estimate of K[loc](r) for point 2323
## iso2322 Ripley isotropic correction estimate of K[loc](r) for point 2322
## iso2321 Ripley isotropic correction estimate of K[loc](r) for point 2321
## iso2320 Ripley isotropic correction estimate of K[loc](r) for point 2320
## iso2319 Ripley isotropic correction estimate of K[loc](r) for point 2319
## iso2318 Ripley isotropic correction estimate of K[loc](r) for point 2318
## iso2317 Ripley isotropic correction estimate of K[loc](r) for point 2317
## iso2316 Ripley isotropic correction estimate of K[loc](r) for point 2316
## iso2315 Ripley isotropic correction estimate of K[loc](r) for point 2315
## iso2314 Ripley isotropic correction estimate of K[loc](r) for point 2314
## iso2313 Ripley isotropic correction estimate of K[loc](r) for point 2313
## iso2312 Ripley isotropic correction estimate of K[loc](r) for point 2312
## iso2311 Ripley isotropic correction estimate of K[loc](r) for point 2311
## iso2310 Ripley isotropic correction estimate of K[loc](r) for point 2310
## iso2309 Ripley isotropic correction estimate of K[loc](r) for point 2309
## iso2308 Ripley isotropic correction estimate of K[loc](r) for point 2308
## iso2307 Ripley isotropic correction estimate of K[loc](r) for point 2307
## iso2306 Ripley isotropic correction estimate of K[loc](r) for point 2306
## iso2305 Ripley isotropic correction estimate of K[loc](r) for point 2305
## iso2304 Ripley isotropic correction estimate of K[loc](r) for point 2304
## iso2303 Ripley isotropic correction estimate of K[loc](r) for point 2303
## iso2302 Ripley isotropic correction estimate of K[loc](r) for point 2302
## iso2301 Ripley isotropic correction estimate of K[loc](r) for point 2301
## iso2300 Ripley isotropic correction estimate of K[loc](r) for point 2300
## iso2299 Ripley isotropic correction estimate of K[loc](r) for point 2299
## iso2298 Ripley isotropic correction estimate of K[loc](r) for point 2298
## iso2297 Ripley isotropic correction estimate of K[loc](r) for point 2297
## iso2296 Ripley isotropic correction estimate of K[loc](r) for point 2296
## iso2295 Ripley isotropic correction estimate of K[loc](r) for point 2295
## iso2294 Ripley isotropic correction estimate of K[loc](r) for point 2294
## iso2293 Ripley isotropic correction estimate of K[loc](r) for point 2293
## iso2292 Ripley isotropic correction estimate of K[loc](r) for point 2292
## iso2291 Ripley isotropic correction estimate of K[loc](r) for point 2291
## iso2290 Ripley isotropic correction estimate of K[loc](r) for point 2290
## iso2289 Ripley isotropic correction estimate of K[loc](r) for point 2289
## iso2288 Ripley isotropic correction estimate of K[loc](r) for point 2288
## iso2287 Ripley isotropic correction estimate of K[loc](r) for point 2287
## iso2286 Ripley isotropic correction estimate of K[loc](r) for point 2286
## iso2285 Ripley isotropic correction estimate of K[loc](r) for point 2285
## iso2284 Ripley isotropic correction estimate of K[loc](r) for point 2284
## iso2283 Ripley isotropic correction estimate of K[loc](r) for point 2283
## iso2282 Ripley isotropic correction estimate of K[loc](r) for point 2282
## iso2281 Ripley isotropic correction estimate of K[loc](r) for point 2281
## iso2280 Ripley isotropic correction estimate of K[loc](r) for point 2280
## iso2279 Ripley isotropic correction estimate of K[loc](r) for point 2279
## iso2278 Ripley isotropic correction estimate of K[loc](r) for point 2278
## iso2277 Ripley isotropic correction estimate of K[loc](r) for point 2277
## iso2276 Ripley isotropic correction estimate of K[loc](r) for point 2276
## iso2275 Ripley isotropic correction estimate of K[loc](r) for point 2275
## iso2274 Ripley isotropic correction estimate of K[loc](r) for point 2274
## iso2273 Ripley isotropic correction estimate of K[loc](r) for point 2273
## iso2272 Ripley isotropic correction estimate of K[loc](r) for point 2272
## iso2271 Ripley isotropic correction estimate of K[loc](r) for point 2271
## iso2270 Ripley isotropic correction estimate of K[loc](r) for point 2270
## iso2269 Ripley isotropic correction estimate of K[loc](r) for point 2269
## iso2268 Ripley isotropic correction estimate of K[loc](r) for point 2268
## iso2267 Ripley isotropic correction estimate of K[loc](r) for point 2267
## iso2266 Ripley isotropic correction estimate of K[loc](r) for point 2266
## iso2265 Ripley isotropic correction estimate of K[loc](r) for point 2265
## iso2264 Ripley isotropic correction estimate of K[loc](r) for point 2264
## iso2263 Ripley isotropic correction estimate of K[loc](r) for point 2263
## iso2262 Ripley isotropic correction estimate of K[loc](r) for point 2262
## iso2261 Ripley isotropic correction estimate of K[loc](r) for point 2261
## iso2260 Ripley isotropic correction estimate of K[loc](r) for point 2260
## iso2259 Ripley isotropic correction estimate of K[loc](r) for point 2259
## iso2258 Ripley isotropic correction estimate of K[loc](r) for point 2258
## iso2257 Ripley isotropic correction estimate of K[loc](r) for point 2257
## iso2256 Ripley isotropic correction estimate of K[loc](r) for point 2256
## iso2255 Ripley isotropic correction estimate of K[loc](r) for point 2255
## iso2254 Ripley isotropic correction estimate of K[loc](r) for point 2254
## iso2253 Ripley isotropic correction estimate of K[loc](r) for point 2253
## iso2252 Ripley isotropic correction estimate of K[loc](r) for point 2252
## iso2251 Ripley isotropic correction estimate of K[loc](r) for point 2251
## iso2250 Ripley isotropic correction estimate of K[loc](r) for point 2250
## iso2249 Ripley isotropic correction estimate of K[loc](r) for point 2249
## iso2248 Ripley isotropic correction estimate of K[loc](r) for point 2248
## iso2247 Ripley isotropic correction estimate of K[loc](r) for point 2247
## iso2246 Ripley isotropic correction estimate of K[loc](r) for point 2246
## iso2245 Ripley isotropic correction estimate of K[loc](r) for point 2245
## iso2244 Ripley isotropic correction estimate of K[loc](r) for point 2244
## iso2243 Ripley isotropic correction estimate of K[loc](r) for point 2243
## iso2242 Ripley isotropic correction estimate of K[loc](r) for point 2242
## iso2241 Ripley isotropic correction estimate of K[loc](r) for point 2241
## iso2240 Ripley isotropic correction estimate of K[loc](r) for point 2240
## iso2239 Ripley isotropic correction estimate of K[loc](r) for point 2239
## iso2238 Ripley isotropic correction estimate of K[loc](r) for point 2238
## iso2237 Ripley isotropic correction estimate of K[loc](r) for point 2237
## iso2236 Ripley isotropic correction estimate of K[loc](r) for point 2236
## iso2235 Ripley isotropic correction estimate of K[loc](r) for point 2235
## iso2234 Ripley isotropic correction estimate of K[loc](r) for point 2234
## iso2233 Ripley isotropic correction estimate of K[loc](r) for point 2233
## iso2232 Ripley isotropic correction estimate of K[loc](r) for point 2232
## iso2231 Ripley isotropic correction estimate of K[loc](r) for point 2231
## iso2230 Ripley isotropic correction estimate of K[loc](r) for point 2230
## iso2229 Ripley isotropic correction estimate of K[loc](r) for point 2229
## iso2228 Ripley isotropic correction estimate of K[loc](r) for point 2228
## iso2227 Ripley isotropic correction estimate of K[loc](r) for point 2227
## iso2226 Ripley isotropic correction estimate of K[loc](r) for point 2226
## iso2225 Ripley isotropic correction estimate of K[loc](r) for point 2225
## iso2224 Ripley isotropic correction estimate of K[loc](r) for point 2224
## iso2223 Ripley isotropic correction estimate of K[loc](r) for point 2223
## iso2222 Ripley isotropic correction estimate of K[loc](r) for point 2222
## iso2221 Ripley isotropic correction estimate of K[loc](r) for point 2221
## iso2220 Ripley isotropic correction estimate of K[loc](r) for point 2220
## iso2219 Ripley isotropic correction estimate of K[loc](r) for point 2219
## iso2218 Ripley isotropic correction estimate of K[loc](r) for point 2218
## iso2217 Ripley isotropic correction estimate of K[loc](r) for point 2217
## iso2216 Ripley isotropic correction estimate of K[loc](r) for point 2216
## iso2215 Ripley isotropic correction estimate of K[loc](r) for point 2215
## iso2214 Ripley isotropic correction estimate of K[loc](r) for point 2214
## iso2213 Ripley isotropic correction estimate of K[loc](r) for point 2213
## iso2212 Ripley isotropic correction estimate of K[loc](r) for point 2212
## iso2211 Ripley isotropic correction estimate of K[loc](r) for point 2211
## iso2210 Ripley isotropic correction estimate of K[loc](r) for point 2210
## iso2209 Ripley isotropic correction estimate of K[loc](r) for point 2209
## iso2208 Ripley isotropic correction estimate of K[loc](r) for point 2208
## iso2207 Ripley isotropic correction estimate of K[loc](r) for point 2207
## iso2206 Ripley isotropic correction estimate of K[loc](r) for point 2206
## iso2205 Ripley isotropic correction estimate of K[loc](r) for point 2205
## iso2204 Ripley isotropic correction estimate of K[loc](r) for point 2204
## iso2203 Ripley isotropic correction estimate of K[loc](r) for point 2203
## iso2202 Ripley isotropic correction estimate of K[loc](r) for point 2202
## iso2201 Ripley isotropic correction estimate of K[loc](r) for point 2201
## iso2200 Ripley isotropic correction estimate of K[loc](r) for point 2200
## iso2199 Ripley isotropic correction estimate of K[loc](r) for point 2199
## iso2198 Ripley isotropic correction estimate of K[loc](r) for point 2198
## iso2197 Ripley isotropic correction estimate of K[loc](r) for point 2197
## iso2196 Ripley isotropic correction estimate of K[loc](r) for point 2196
## iso2195 Ripley isotropic correction estimate of K[loc](r) for point 2195
## iso2194 Ripley isotropic correction estimate of K[loc](r) for point 2194
## iso2193 Ripley isotropic correction estimate of K[loc](r) for point 2193
## iso2192 Ripley isotropic correction estimate of K[loc](r) for point 2192
## iso2191 Ripley isotropic correction estimate of K[loc](r) for point 2191
## iso2190 Ripley isotropic correction estimate of K[loc](r) for point 2190
## iso2189 Ripley isotropic correction estimate of K[loc](r) for point 2189
## iso2188 Ripley isotropic correction estimate of K[loc](r) for point 2188
## iso2187 Ripley isotropic correction estimate of K[loc](r) for point 2187
## iso2186 Ripley isotropic correction estimate of K[loc](r) for point 2186
## iso2185 Ripley isotropic correction estimate of K[loc](r) for point 2185
## iso2184 Ripley isotropic correction estimate of K[loc](r) for point 2184
## iso2183 Ripley isotropic correction estimate of K[loc](r) for point 2183
## iso2182 Ripley isotropic correction estimate of K[loc](r) for point 2182
## iso2181 Ripley isotropic correction estimate of K[loc](r) for point 2181
## iso2180 Ripley isotropic correction estimate of K[loc](r) for point 2180
## iso2179 Ripley isotropic correction estimate of K[loc](r) for point 2179
## iso2178 Ripley isotropic correction estimate of K[loc](r) for point 2178
## iso2177 Ripley isotropic correction estimate of K[loc](r) for point 2177
## iso2176 Ripley isotropic correction estimate of K[loc](r) for point 2176
## iso2175 Ripley isotropic correction estimate of K[loc](r) for point 2175
## iso2174 Ripley isotropic correction estimate of K[loc](r) for point 2174
## iso2173 Ripley isotropic correction estimate of K[loc](r) for point 2173
## iso2172 Ripley isotropic correction estimate of K[loc](r) for point 2172
## iso2171 Ripley isotropic correction estimate of K[loc](r) for point 2171
## iso2170 Ripley isotropic correction estimate of K[loc](r) for point 2170
## iso2169 Ripley isotropic correction estimate of K[loc](r) for point 2169
## iso2168 Ripley isotropic correction estimate of K[loc](r) for point 2168
## iso2167 Ripley isotropic correction estimate of K[loc](r) for point 2167
## iso2166 Ripley isotropic correction estimate of K[loc](r) for point 2166
## iso2165 Ripley isotropic correction estimate of K[loc](r) for point 2165
## iso2164 Ripley isotropic correction estimate of K[loc](r) for point 2164
## iso2163 Ripley isotropic correction estimate of K[loc](r) for point 2163
## iso2162 Ripley isotropic correction estimate of K[loc](r) for point 2162
## iso2161 Ripley isotropic correction estimate of K[loc](r) for point 2161
## iso2160 Ripley isotropic correction estimate of K[loc](r) for point 2160
## iso2159 Ripley isotropic correction estimate of K[loc](r) for point 2159
## iso2158 Ripley isotropic correction estimate of K[loc](r) for point 2158
## iso2157 Ripley isotropic correction estimate of K[loc](r) for point 2157
## iso2156 Ripley isotropic correction estimate of K[loc](r) for point 2156
## iso2155 Ripley isotropic correction estimate of K[loc](r) for point 2155
## iso2154 Ripley isotropic correction estimate of K[loc](r) for point 2154
## iso2153 Ripley isotropic correction estimate of K[loc](r) for point 2153
## iso2152 Ripley isotropic correction estimate of K[loc](r) for point 2152
## iso2151 Ripley isotropic correction estimate of K[loc](r) for point 2151
## iso2150 Ripley isotropic correction estimate of K[loc](r) for point 2150
## iso2149 Ripley isotropic correction estimate of K[loc](r) for point 2149
## iso2148 Ripley isotropic correction estimate of K[loc](r) for point 2148
## iso2147 Ripley isotropic correction estimate of K[loc](r) for point 2147
## iso2146 Ripley isotropic correction estimate of K[loc](r) for point 2146
## iso2145 Ripley isotropic correction estimate of K[loc](r) for point 2145
## iso2144 Ripley isotropic correction estimate of K[loc](r) for point 2144
## iso2143 Ripley isotropic correction estimate of K[loc](r) for point 2143
## iso2142 Ripley isotropic correction estimate of K[loc](r) for point 2142
## iso2141 Ripley isotropic correction estimate of K[loc](r) for point 2141
## iso2140 Ripley isotropic correction estimate of K[loc](r) for point 2140
## iso2139 Ripley isotropic correction estimate of K[loc](r) for point 2139
## iso2138 Ripley isotropic correction estimate of K[loc](r) for point 2138
## iso2137 Ripley isotropic correction estimate of K[loc](r) for point 2137
## iso2136 Ripley isotropic correction estimate of K[loc](r) for point 2136
## iso2135 Ripley isotropic correction estimate of K[loc](r) for point 2135
## iso2134 Ripley isotropic correction estimate of K[loc](r) for point 2134
## iso2133 Ripley isotropic correction estimate of K[loc](r) for point 2133
## iso2132 Ripley isotropic correction estimate of K[loc](r) for point 2132
## iso2131 Ripley isotropic correction estimate of K[loc](r) for point 2131
## iso2130 Ripley isotropic correction estimate of K[loc](r) for point 2130
## iso2129 Ripley isotropic correction estimate of K[loc](r) for point 2129
## iso2128 Ripley isotropic correction estimate of K[loc](r) for point 2128
## iso2127 Ripley isotropic correction estimate of K[loc](r) for point 2127
## iso2126 Ripley isotropic correction estimate of K[loc](r) for point 2126
## iso2125 Ripley isotropic correction estimate of K[loc](r) for point 2125
## iso2124 Ripley isotropic correction estimate of K[loc](r) for point 2124
## iso2123 Ripley isotropic correction estimate of K[loc](r) for point 2123
## iso2122 Ripley isotropic correction estimate of K[loc](r) for point 2122
## iso2121 Ripley isotropic correction estimate of K[loc](r) for point 2121
## iso2120 Ripley isotropic correction estimate of K[loc](r) for point 2120
## iso2119 Ripley isotropic correction estimate of K[loc](r) for point 2119
## iso2118 Ripley isotropic correction estimate of K[loc](r) for point 2118
## iso2117 Ripley isotropic correction estimate of K[loc](r) for point 2117
## iso2116 Ripley isotropic correction estimate of K[loc](r) for point 2116
## iso2115 Ripley isotropic correction estimate of K[loc](r) for point 2115
## iso2114 Ripley isotropic correction estimate of K[loc](r) for point 2114
## iso2113 Ripley isotropic correction estimate of K[loc](r) for point 2113
## iso2112 Ripley isotropic correction estimate of K[loc](r) for point 2112
## iso2111 Ripley isotropic correction estimate of K[loc](r) for point 2111
## iso2110 Ripley isotropic correction estimate of K[loc](r) for point 2110
## iso2109 Ripley isotropic correction estimate of K[loc](r) for point 2109
## iso2108 Ripley isotropic correction estimate of K[loc](r) for point 2108
## iso2107 Ripley isotropic correction estimate of K[loc](r) for point 2107
## iso2106 Ripley isotropic correction estimate of K[loc](r) for point 2106
## iso2105 Ripley isotropic correction estimate of K[loc](r) for point 2105
## iso2104 Ripley isotropic correction estimate of K[loc](r) for point 2104
## iso2103 Ripley isotropic correction estimate of K[loc](r) for point 2103
## iso2102 Ripley isotropic correction estimate of K[loc](r) for point 2102
## iso2101 Ripley isotropic correction estimate of K[loc](r) for point 2101
## iso2100 Ripley isotropic correction estimate of K[loc](r) for point 2100
## iso2099 Ripley isotropic correction estimate of K[loc](r) for point 2099
## iso2098 Ripley isotropic correction estimate of K[loc](r) for point 2098
## iso2097 Ripley isotropic correction estimate of K[loc](r) for point 2097
## iso2096 Ripley isotropic correction estimate of K[loc](r) for point 2096
## iso2095 Ripley isotropic correction estimate of K[loc](r) for point 2095
## iso2094 Ripley isotropic correction estimate of K[loc](r) for point 2094
## iso2093 Ripley isotropic correction estimate of K[loc](r) for point 2093
## iso2092 Ripley isotropic correction estimate of K[loc](r) for point 2092
## iso2091 Ripley isotropic correction estimate of K[loc](r) for point 2091
## iso2090 Ripley isotropic correction estimate of K[loc](r) for point 2090
## iso2089 Ripley isotropic correction estimate of K[loc](r) for point 2089
## iso2088 Ripley isotropic correction estimate of K[loc](r) for point 2088
## iso2087 Ripley isotropic correction estimate of K[loc](r) for point 2087
## iso2086 Ripley isotropic correction estimate of K[loc](r) for point 2086
## iso2085 Ripley isotropic correction estimate of K[loc](r) for point 2085
## iso2084 Ripley isotropic correction estimate of K[loc](r) for point 2084
## iso2083 Ripley isotropic correction estimate of K[loc](r) for point 2083
## iso2082 Ripley isotropic correction estimate of K[loc](r) for point 2082
## iso2081 Ripley isotropic correction estimate of K[loc](r) for point 2081
## iso2080 Ripley isotropic correction estimate of K[loc](r) for point 2080
## iso2079 Ripley isotropic correction estimate of K[loc](r) for point 2079
## iso2078 Ripley isotropic correction estimate of K[loc](r) for point 2078
## iso2077 Ripley isotropic correction estimate of K[loc](r) for point 2077
## iso2076 Ripley isotropic correction estimate of K[loc](r) for point 2076
## iso2075 Ripley isotropic correction estimate of K[loc](r) for point 2075
## iso2074 Ripley isotropic correction estimate of K[loc](r) for point 2074
## iso2073 Ripley isotropic correction estimate of K[loc](r) for point 2073
## iso2072 Ripley isotropic correction estimate of K[loc](r) for point 2072
## iso2071 Ripley isotropic correction estimate of K[loc](r) for point 2071
## iso2070 Ripley isotropic correction estimate of K[loc](r) for point 2070
## iso2069 Ripley isotropic correction estimate of K[loc](r) for point 2069
## iso2068 Ripley isotropic correction estimate of K[loc](r) for point 2068
## iso2067 Ripley isotropic correction estimate of K[loc](r) for point 2067
## iso2066 Ripley isotropic correction estimate of K[loc](r) for point 2066
## iso2065 Ripley isotropic correction estimate of K[loc](r) for point 2065
## iso2064 Ripley isotropic correction estimate of K[loc](r) for point 2064
## iso2063 Ripley isotropic correction estimate of K[loc](r) for point 2063
## iso2062 Ripley isotropic correction estimate of K[loc](r) for point 2062
## iso2061 Ripley isotropic correction estimate of K[loc](r) for point 2061
## iso2060 Ripley isotropic correction estimate of K[loc](r) for point 2060
## iso2059 Ripley isotropic correction estimate of K[loc](r) for point 2059
## iso2058 Ripley isotropic correction estimate of K[loc](r) for point 2058
## iso2057 Ripley isotropic correction estimate of K[loc](r) for point 2057
## iso2056 Ripley isotropic correction estimate of K[loc](r) for point 2056
## iso2055 Ripley isotropic correction estimate of K[loc](r) for point 2055
## iso2054 Ripley isotropic correction estimate of K[loc](r) for point 2054
## iso2053 Ripley isotropic correction estimate of K[loc](r) for point 2053
## iso2052 Ripley isotropic correction estimate of K[loc](r) for point 2052
## iso2051 Ripley isotropic correction estimate of K[loc](r) for point 2051
## iso2050 Ripley isotropic correction estimate of K[loc](r) for point 2050
## iso2049 Ripley isotropic correction estimate of K[loc](r) for point 2049
## iso2048 Ripley isotropic correction estimate of K[loc](r) for point 2048
## iso2047 Ripley isotropic correction estimate of K[loc](r) for point 2047
## iso2046 Ripley isotropic correction estimate of K[loc](r) for point 2046
## iso2045 Ripley isotropic correction estimate of K[loc](r) for point 2045
## iso2044 Ripley isotropic correction estimate of K[loc](r) for point 2044
## iso2043 Ripley isotropic correction estimate of K[loc](r) for point 2043
## iso2042 Ripley isotropic correction estimate of K[loc](r) for point 2042
## iso2041 Ripley isotropic correction estimate of K[loc](r) for point 2041
## iso2040 Ripley isotropic correction estimate of K[loc](r) for point 2040
## iso2039 Ripley isotropic correction estimate of K[loc](r) for point 2039
## iso2038 Ripley isotropic correction estimate of K[loc](r) for point 2038
## iso2037 Ripley isotropic correction estimate of K[loc](r) for point 2037
## iso2036 Ripley isotropic correction estimate of K[loc](r) for point 2036
## iso2035 Ripley isotropic correction estimate of K[loc](r) for point 2035
## iso2034 Ripley isotropic correction estimate of K[loc](r) for point 2034
## iso2033 Ripley isotropic correction estimate of K[loc](r) for point 2033
## iso2032 Ripley isotropic correction estimate of K[loc](r) for point 2032
## iso2031 Ripley isotropic correction estimate of K[loc](r) for point 2031
## iso2030 Ripley isotropic correction estimate of K[loc](r) for point 2030
## iso2029 Ripley isotropic correction estimate of K[loc](r) for point 2029
## iso2028 Ripley isotropic correction estimate of K[loc](r) for point 2028
## iso2027 Ripley isotropic correction estimate of K[loc](r) for point 2027
## iso2026 Ripley isotropic correction estimate of K[loc](r) for point 2026
## iso2025 Ripley isotropic correction estimate of K[loc](r) for point 2025
## iso2024 Ripley isotropic correction estimate of K[loc](r) for point 2024
## iso2023 Ripley isotropic correction estimate of K[loc](r) for point 2023
## iso2022 Ripley isotropic correction estimate of K[loc](r) for point 2022
## iso2021 Ripley isotropic correction estimate of K[loc](r) for point 2021
## iso2020 Ripley isotropic correction estimate of K[loc](r) for point 2020
## iso2019 Ripley isotropic correction estimate of K[loc](r) for point 2019
## iso2018 Ripley isotropic correction estimate of K[loc](r) for point 2018
## iso2017 Ripley isotropic correction estimate of K[loc](r) for point 2017
## iso2016 Ripley isotropic correction estimate of K[loc](r) for point 2016
## iso2015 Ripley isotropic correction estimate of K[loc](r) for point 2015
## iso2014 Ripley isotropic correction estimate of K[loc](r) for point 2014
## iso2013 Ripley isotropic correction estimate of K[loc](r) for point 2013
## iso2012 Ripley isotropic correction estimate of K[loc](r) for point 2012
## iso2011 Ripley isotropic correction estimate of K[loc](r) for point 2011
## iso2010 Ripley isotropic correction estimate of K[loc](r) for point 2010
## iso2009 Ripley isotropic correction estimate of K[loc](r) for point 2009
## iso2008 Ripley isotropic correction estimate of K[loc](r) for point 2008
## iso2007 Ripley isotropic correction estimate of K[loc](r) for point 2007
## iso2006 Ripley isotropic correction estimate of K[loc](r) for point 2006
## iso2005 Ripley isotropic correction estimate of K[loc](r) for point 2005
## iso2004 Ripley isotropic correction estimate of K[loc](r) for point 2004
## iso2003 Ripley isotropic correction estimate of K[loc](r) for point 2003
## iso2002 Ripley isotropic correction estimate of K[loc](r) for point 2002
## iso2001 Ripley isotropic correction estimate of K[loc](r) for point 2001
## iso2000 Ripley isotropic correction estimate of K[loc](r) for point 2000
## iso1999 Ripley isotropic correction estimate of K[loc](r) for point 1999
## iso1998 Ripley isotropic correction estimate of K[loc](r) for point 1998
## iso1997 Ripley isotropic correction estimate of K[loc](r) for point 1997
## iso1996 Ripley isotropic correction estimate of K[loc](r) for point 1996
## iso1995 Ripley isotropic correction estimate of K[loc](r) for point 1995
## iso1994 Ripley isotropic correction estimate of K[loc](r) for point 1994
## iso1993 Ripley isotropic correction estimate of K[loc](r) for point 1993
## iso1992 Ripley isotropic correction estimate of K[loc](r) for point 1992
## iso1991 Ripley isotropic correction estimate of K[loc](r) for point 1991
## iso1990 Ripley isotropic correction estimate of K[loc](r) for point 1990
## iso1989 Ripley isotropic correction estimate of K[loc](r) for point 1989
## iso1988 Ripley isotropic correction estimate of K[loc](r) for point 1988
## iso1987 Ripley isotropic correction estimate of K[loc](r) for point 1987
## iso1986 Ripley isotropic correction estimate of K[loc](r) for point 1986
## iso1985 Ripley isotropic correction estimate of K[loc](r) for point 1985
## iso1984 Ripley isotropic correction estimate of K[loc](r) for point 1984
## iso1983 Ripley isotropic correction estimate of K[loc](r) for point 1983
## iso1982 Ripley isotropic correction estimate of K[loc](r) for point 1982
## iso1981 Ripley isotropic correction estimate of K[loc](r) for point 1981
## iso1980 Ripley isotropic correction estimate of K[loc](r) for point 1980
## iso1979 Ripley isotropic correction estimate of K[loc](r) for point 1979
## iso1978 Ripley isotropic correction estimate of K[loc](r) for point 1978
## iso1977 Ripley isotropic correction estimate of K[loc](r) for point 1977
## iso1976 Ripley isotropic correction estimate of K[loc](r) for point 1976
## iso1975 Ripley isotropic correction estimate of K[loc](r) for point 1975
## iso1974 Ripley isotropic correction estimate of K[loc](r) for point 1974
## iso1973 Ripley isotropic correction estimate of K[loc](r) for point 1973
## iso1972 Ripley isotropic correction estimate of K[loc](r) for point 1972
## iso1971 Ripley isotropic correction estimate of K[loc](r) for point 1971
## iso1970 Ripley isotropic correction estimate of K[loc](r) for point 1970
## iso1969 Ripley isotropic correction estimate of K[loc](r) for point 1969
## iso1968 Ripley isotropic correction estimate of K[loc](r) for point 1968
## iso1967 Ripley isotropic correction estimate of K[loc](r) for point 1967
## iso1966 Ripley isotropic correction estimate of K[loc](r) for point 1966
## iso1965 Ripley isotropic correction estimate of K[loc](r) for point 1965
## iso1964 Ripley isotropic correction estimate of K[loc](r) for point 1964
## iso1963 Ripley isotropic correction estimate of K[loc](r) for point 1963
## iso1962 Ripley isotropic correction estimate of K[loc](r) for point 1962
## iso1961 Ripley isotropic correction estimate of K[loc](r) for point 1961
## iso1960 Ripley isotropic correction estimate of K[loc](r) for point 1960
## iso1959 Ripley isotropic correction estimate of K[loc](r) for point 1959
## iso1958 Ripley isotropic correction estimate of K[loc](r) for point 1958
## iso1957 Ripley isotropic correction estimate of K[loc](r) for point 1957
## iso1956 Ripley isotropic correction estimate of K[loc](r) for point 1956
## iso1955 Ripley isotropic correction estimate of K[loc](r) for point 1955
## iso1954 Ripley isotropic correction estimate of K[loc](r) for point 1954
## iso1953 Ripley isotropic correction estimate of K[loc](r) for point 1953
## iso1952 Ripley isotropic correction estimate of K[loc](r) for point 1952
## iso1951 Ripley isotropic correction estimate of K[loc](r) for point 1951
## iso1950 Ripley isotropic correction estimate of K[loc](r) for point 1950
## iso1949 Ripley isotropic correction estimate of K[loc](r) for point 1949
## iso1948 Ripley isotropic correction estimate of K[loc](r) for point 1948
## iso1947 Ripley isotropic correction estimate of K[loc](r) for point 1947
## iso1946 Ripley isotropic correction estimate of K[loc](r) for point 1946
## iso1945 Ripley isotropic correction estimate of K[loc](r) for point 1945
## iso1944 Ripley isotropic correction estimate of K[loc](r) for point 1944
## iso1943 Ripley isotropic correction estimate of K[loc](r) for point 1943
## iso1942 Ripley isotropic correction estimate of K[loc](r) for point 1942
## iso1941 Ripley isotropic correction estimate of K[loc](r) for point 1941
## iso1940 Ripley isotropic correction estimate of K[loc](r) for point 1940
## iso1939 Ripley isotropic correction estimate of K[loc](r) for point 1939
## iso1938 Ripley isotropic correction estimate of K[loc](r) for point 1938
## iso1937 Ripley isotropic correction estimate of K[loc](r) for point 1937
## iso1936 Ripley isotropic correction estimate of K[loc](r) for point 1936
## iso1935 Ripley isotropic correction estimate of K[loc](r) for point 1935
## iso1934 Ripley isotropic correction estimate of K[loc](r) for point 1934
## iso1933 Ripley isotropic correction estimate of K[loc](r) for point 1933
## iso1932 Ripley isotropic correction estimate of K[loc](r) for point 1932
## iso1931 Ripley isotropic correction estimate of K[loc](r) for point 1931
## iso1930 Ripley isotropic correction estimate of K[loc](r) for point 1930
## iso1929 Ripley isotropic correction estimate of K[loc](r) for point 1929
## iso1928 Ripley isotropic correction estimate of K[loc](r) for point 1928
## iso1927 Ripley isotropic correction estimate of K[loc](r) for point 1927
## iso1926 Ripley isotropic correction estimate of K[loc](r) for point 1926
## iso1925 Ripley isotropic correction estimate of K[loc](r) for point 1925
## iso1924 Ripley isotropic correction estimate of K[loc](r) for point 1924
## iso1923 Ripley isotropic correction estimate of K[loc](r) for point 1923
## iso1922 Ripley isotropic correction estimate of K[loc](r) for point 1922
## iso1921 Ripley isotropic correction estimate of K[loc](r) for point 1921
## iso1920 Ripley isotropic correction estimate of K[loc](r) for point 1920
## iso1919 Ripley isotropic correction estimate of K[loc](r) for point 1919
## iso1918 Ripley isotropic correction estimate of K[loc](r) for point 1918
## iso1917 Ripley isotropic correction estimate of K[loc](r) for point 1917
## iso1916 Ripley isotropic correction estimate of K[loc](r) for point 1916
## iso1915 Ripley isotropic correction estimate of K[loc](r) for point 1915
## iso1914 Ripley isotropic correction estimate of K[loc](r) for point 1914
## iso1913 Ripley isotropic correction estimate of K[loc](r) for point 1913
## iso1912 Ripley isotropic correction estimate of K[loc](r) for point 1912
## iso1911 Ripley isotropic correction estimate of K[loc](r) for point 1911
## iso1910 Ripley isotropic correction estimate of K[loc](r) for point 1910
## iso1909 Ripley isotropic correction estimate of K[loc](r) for point 1909
## iso1908 Ripley isotropic correction estimate of K[loc](r) for point 1908
## iso1907 Ripley isotropic correction estimate of K[loc](r) for point 1907
## iso1906 Ripley isotropic correction estimate of K[loc](r) for point 1906
## iso1905 Ripley isotropic correction estimate of K[loc](r) for point 1905
## iso1904 Ripley isotropic correction estimate of K[loc](r) for point 1904
## iso1903 Ripley isotropic correction estimate of K[loc](r) for point 1903
## iso1902 Ripley isotropic correction estimate of K[loc](r) for point 1902
## iso1901 Ripley isotropic correction estimate of K[loc](r) for point 1901
## iso1900 Ripley isotropic correction estimate of K[loc](r) for point 1900
## iso1899 Ripley isotropic correction estimate of K[loc](r) for point 1899
## iso1898 Ripley isotropic correction estimate of K[loc](r) for point 1898
## iso1897 Ripley isotropic correction estimate of K[loc](r) for point 1897
## iso1896 Ripley isotropic correction estimate of K[loc](r) for point 1896
## iso1895 Ripley isotropic correction estimate of K[loc](r) for point 1895
## iso1894 Ripley isotropic correction estimate of K[loc](r) for point 1894
## iso1893 Ripley isotropic correction estimate of K[loc](r) for point 1893
## iso1892 Ripley isotropic correction estimate of K[loc](r) for point 1892
## iso1891 Ripley isotropic correction estimate of K[loc](r) for point 1891
## iso1890 Ripley isotropic correction estimate of K[loc](r) for point 1890
## iso1889 Ripley isotropic correction estimate of K[loc](r) for point 1889
## iso1888 Ripley isotropic correction estimate of K[loc](r) for point 1888
## iso1887 Ripley isotropic correction estimate of K[loc](r) for point 1887
## iso1886 Ripley isotropic correction estimate of K[loc](r) for point 1886
## iso1885 Ripley isotropic correction estimate of K[loc](r) for point 1885
## iso1884 Ripley isotropic correction estimate of K[loc](r) for point 1884
## iso1883 Ripley isotropic correction estimate of K[loc](r) for point 1883
## iso1882 Ripley isotropic correction estimate of K[loc](r) for point 1882
## iso1881 Ripley isotropic correction estimate of K[loc](r) for point 1881
## iso1880 Ripley isotropic correction estimate of K[loc](r) for point 1880
## iso1879 Ripley isotropic correction estimate of K[loc](r) for point 1879
## iso1878 Ripley isotropic correction estimate of K[loc](r) for point 1878
## iso1877 Ripley isotropic correction estimate of K[loc](r) for point 1877
## iso1876 Ripley isotropic correction estimate of K[loc](r) for point 1876
## iso1875 Ripley isotropic correction estimate of K[loc](r) for point 1875
## iso1874 Ripley isotropic correction estimate of K[loc](r) for point 1874
## iso1873 Ripley isotropic correction estimate of K[loc](r) for point 1873
## iso1872 Ripley isotropic correction estimate of K[loc](r) for point 1872
## iso1871 Ripley isotropic correction estimate of K[loc](r) for point 1871
## iso1870 Ripley isotropic correction estimate of K[loc](r) for point 1870
## iso1869 Ripley isotropic correction estimate of K[loc](r) for point 1869
## iso1868 Ripley isotropic correction estimate of K[loc](r) for point 1868
## iso1867 Ripley isotropic correction estimate of K[loc](r) for point 1867
## iso1866 Ripley isotropic correction estimate of K[loc](r) for point 1866
## iso1865 Ripley isotropic correction estimate of K[loc](r) for point 1865
## iso1864 Ripley isotropic correction estimate of K[loc](r) for point 1864
## iso1863 Ripley isotropic correction estimate of K[loc](r) for point 1863
## iso1862 Ripley isotropic correction estimate of K[loc](r) for point 1862
## iso1861 Ripley isotropic correction estimate of K[loc](r) for point 1861
## iso1860 Ripley isotropic correction estimate of K[loc](r) for point 1860
## iso1859 Ripley isotropic correction estimate of K[loc](r) for point 1859
## iso1858 Ripley isotropic correction estimate of K[loc](r) for point 1858
## iso1857 Ripley isotropic correction estimate of K[loc](r) for point 1857
## iso1856 Ripley isotropic correction estimate of K[loc](r) for point 1856
## iso1855 Ripley isotropic correction estimate of K[loc](r) for point 1855
## iso1854 Ripley isotropic correction estimate of K[loc](r) for point 1854
## iso1853 Ripley isotropic correction estimate of K[loc](r) for point 1853
## iso1852 Ripley isotropic correction estimate of K[loc](r) for point 1852
## iso1851 Ripley isotropic correction estimate of K[loc](r) for point 1851
## iso1850 Ripley isotropic correction estimate of K[loc](r) for point 1850
## iso1849 Ripley isotropic correction estimate of K[loc](r) for point 1849
## iso1848 Ripley isotropic correction estimate of K[loc](r) for point 1848
## iso1847 Ripley isotropic correction estimate of K[loc](r) for point 1847
## iso1846 Ripley isotropic correction estimate of K[loc](r) for point 1846
## iso1845 Ripley isotropic correction estimate of K[loc](r) for point 1845
## iso1844 Ripley isotropic correction estimate of K[loc](r) for point 1844
## iso1843 Ripley isotropic correction estimate of K[loc](r) for point 1843
## iso1842 Ripley isotropic correction estimate of K[loc](r) for point 1842
## iso1841 Ripley isotropic correction estimate of K[loc](r) for point 1841
## iso1840 Ripley isotropic correction estimate of K[loc](r) for point 1840
## iso1839 Ripley isotropic correction estimate of K[loc](r) for point 1839
## iso1838 Ripley isotropic correction estimate of K[loc](r) for point 1838
## iso1837 Ripley isotropic correction estimate of K[loc](r) for point 1837
## iso1836 Ripley isotropic correction estimate of K[loc](r) for point 1836
## iso1835 Ripley isotropic correction estimate of K[loc](r) for point 1835
## iso1834 Ripley isotropic correction estimate of K[loc](r) for point 1834
## iso1833 Ripley isotropic correction estimate of K[loc](r) for point 1833
## iso1832 Ripley isotropic correction estimate of K[loc](r) for point 1832
## iso1831 Ripley isotropic correction estimate of K[loc](r) for point 1831
## iso1830 Ripley isotropic correction estimate of K[loc](r) for point 1830
## iso1829 Ripley isotropic correction estimate of K[loc](r) for point 1829
## iso1828 Ripley isotropic correction estimate of K[loc](r) for point 1828
## iso1827 Ripley isotropic correction estimate of K[loc](r) for point 1827
## iso1826 Ripley isotropic correction estimate of K[loc](r) for point 1826
## iso1825 Ripley isotropic correction estimate of K[loc](r) for point 1825
## iso1824 Ripley isotropic correction estimate of K[loc](r) for point 1824
## iso1823 Ripley isotropic correction estimate of K[loc](r) for point 1823
## iso1822 Ripley isotropic correction estimate of K[loc](r) for point 1822
## iso1821 Ripley isotropic correction estimate of K[loc](r) for point 1821
## iso1820 Ripley isotropic correction estimate of K[loc](r) for point 1820
## iso1819 Ripley isotropic correction estimate of K[loc](r) for point 1819
## iso1818 Ripley isotropic correction estimate of K[loc](r) for point 1818
## iso1817 Ripley isotropic correction estimate of K[loc](r) for point 1817
## iso1816 Ripley isotropic correction estimate of K[loc](r) for point 1816
## iso1815 Ripley isotropic correction estimate of K[loc](r) for point 1815
## iso1814 Ripley isotropic correction estimate of K[loc](r) for point 1814
## iso1813 Ripley isotropic correction estimate of K[loc](r) for point 1813
## iso1812 Ripley isotropic correction estimate of K[loc](r) for point 1812
## iso1811 Ripley isotropic correction estimate of K[loc](r) for point 1811
## iso1810 Ripley isotropic correction estimate of K[loc](r) for point 1810
## iso1809 Ripley isotropic correction estimate of K[loc](r) for point 1809
## iso1808 Ripley isotropic correction estimate of K[loc](r) for point 1808
## iso1807 Ripley isotropic correction estimate of K[loc](r) for point 1807
## iso1806 Ripley isotropic correction estimate of K[loc](r) for point 1806
## iso1805 Ripley isotropic correction estimate of K[loc](r) for point 1805
## iso1804 Ripley isotropic correction estimate of K[loc](r) for point 1804
## iso1803 Ripley isotropic correction estimate of K[loc](r) for point 1803
## iso1802 Ripley isotropic correction estimate of K[loc](r) for point 1802
## iso1801 Ripley isotropic correction estimate of K[loc](r) for point 1801
## iso1800 Ripley isotropic correction estimate of K[loc](r) for point 1800
## iso1799 Ripley isotropic correction estimate of K[loc](r) for point 1799
## iso1798 Ripley isotropic correction estimate of K[loc](r) for point 1798
## iso1797 Ripley isotropic correction estimate of K[loc](r) for point 1797
## iso1796 Ripley isotropic correction estimate of K[loc](r) for point 1796
## iso1795 Ripley isotropic correction estimate of K[loc](r) for point 1795
## iso1794 Ripley isotropic correction estimate of K[loc](r) for point 1794
## iso1793 Ripley isotropic correction estimate of K[loc](r) for point 1793
## iso1792 Ripley isotropic correction estimate of K[loc](r) for point 1792
## iso1791 Ripley isotropic correction estimate of K[loc](r) for point 1791
## iso1790 Ripley isotropic correction estimate of K[loc](r) for point 1790
## iso1789 Ripley isotropic correction estimate of K[loc](r) for point 1789
## iso1788 Ripley isotropic correction estimate of K[loc](r) for point 1788
## iso1787 Ripley isotropic correction estimate of K[loc](r) for point 1787
## iso1786 Ripley isotropic correction estimate of K[loc](r) for point 1786
## iso1785 Ripley isotropic correction estimate of K[loc](r) for point 1785
## iso1784 Ripley isotropic correction estimate of K[loc](r) for point 1784
## iso1783 Ripley isotropic correction estimate of K[loc](r) for point 1783
## iso1782 Ripley isotropic correction estimate of K[loc](r) for point 1782
## iso1781 Ripley isotropic correction estimate of K[loc](r) for point 1781
## iso1780 Ripley isotropic correction estimate of K[loc](r) for point 1780
## iso1779 Ripley isotropic correction estimate of K[loc](r) for point 1779
## iso1778 Ripley isotropic correction estimate of K[loc](r) for point 1778
## iso1777 Ripley isotropic correction estimate of K[loc](r) for point 1777
## iso1776 Ripley isotropic correction estimate of K[loc](r) for point 1776
## iso1775 Ripley isotropic correction estimate of K[loc](r) for point 1775
## iso1774 Ripley isotropic correction estimate of K[loc](r) for point 1774
## iso1773 Ripley isotropic correction estimate of K[loc](r) for point 1773
## iso1772 Ripley isotropic correction estimate of K[loc](r) for point 1772
## iso1771 Ripley isotropic correction estimate of K[loc](r) for point 1771
## iso1770 Ripley isotropic correction estimate of K[loc](r) for point 1770
## iso1769 Ripley isotropic correction estimate of K[loc](r) for point 1769
## iso1768 Ripley isotropic correction estimate of K[loc](r) for point 1768
## iso1767 Ripley isotropic correction estimate of K[loc](r) for point 1767
## iso1766 Ripley isotropic correction estimate of K[loc](r) for point 1766
## iso1765 Ripley isotropic correction estimate of K[loc](r) for point 1765
## iso1764 Ripley isotropic correction estimate of K[loc](r) for point 1764
## iso1763 Ripley isotropic correction estimate of K[loc](r) for point 1763
## iso1762 Ripley isotropic correction estimate of K[loc](r) for point 1762
## iso1761 Ripley isotropic correction estimate of K[loc](r) for point 1761
## iso1760 Ripley isotropic correction estimate of K[loc](r) for point 1760
## iso1759 Ripley isotropic correction estimate of K[loc](r) for point 1759
## iso1758 Ripley isotropic correction estimate of K[loc](r) for point 1758
## iso1757 Ripley isotropic correction estimate of K[loc](r) for point 1757
## iso1756 Ripley isotropic correction estimate of K[loc](r) for point 1756
## iso1755 Ripley isotropic correction estimate of K[loc](r) for point 1755
## iso1754 Ripley isotropic correction estimate of K[loc](r) for point 1754
## iso1753 Ripley isotropic correction estimate of K[loc](r) for point 1753
## iso1752 Ripley isotropic correction estimate of K[loc](r) for point 1752
## iso1751 Ripley isotropic correction estimate of K[loc](r) for point 1751
## iso1750 Ripley isotropic correction estimate of K[loc](r) for point 1750
## iso1749 Ripley isotropic correction estimate of K[loc](r) for point 1749
## iso1748 Ripley isotropic correction estimate of K[loc](r) for point 1748
## iso1747 Ripley isotropic correction estimate of K[loc](r) for point 1747
## iso1746 Ripley isotropic correction estimate of K[loc](r) for point 1746
## iso1745 Ripley isotropic correction estimate of K[loc](r) for point 1745
## iso1744 Ripley isotropic correction estimate of K[loc](r) for point 1744
## iso1743 Ripley isotropic correction estimate of K[loc](r) for point 1743
## iso1742 Ripley isotropic correction estimate of K[loc](r) for point 1742
## iso1741 Ripley isotropic correction estimate of K[loc](r) for point 1741
## iso1740 Ripley isotropic correction estimate of K[loc](r) for point 1740
## iso1739 Ripley isotropic correction estimate of K[loc](r) for point 1739
## iso1738 Ripley isotropic correction estimate of K[loc](r) for point 1738
## iso1737 Ripley isotropic correction estimate of K[loc](r) for point 1737
## iso1736 Ripley isotropic correction estimate of K[loc](r) for point 1736
## iso1735 Ripley isotropic correction estimate of K[loc](r) for point 1735
## iso1734 Ripley isotropic correction estimate of K[loc](r) for point 1734
## iso1733 Ripley isotropic correction estimate of K[loc](r) for point 1733
## iso1732 Ripley isotropic correction estimate of K[loc](r) for point 1732
## iso1731 Ripley isotropic correction estimate of K[loc](r) for point 1731
## iso1730 Ripley isotropic correction estimate of K[loc](r) for point 1730
## iso1729 Ripley isotropic correction estimate of K[loc](r) for point 1729
## iso1728 Ripley isotropic correction estimate of K[loc](r) for point 1728
## iso1727 Ripley isotropic correction estimate of K[loc](r) for point 1727
## iso1726 Ripley isotropic correction estimate of K[loc](r) for point 1726
## iso1725 Ripley isotropic correction estimate of K[loc](r) for point 1725
## iso1724 Ripley isotropic correction estimate of K[loc](r) for point 1724
## iso1723 Ripley isotropic correction estimate of K[loc](r) for point 1723
## iso1722 Ripley isotropic correction estimate of K[loc](r) for point 1722
## iso1721 Ripley isotropic correction estimate of K[loc](r) for point 1721
## iso1720 Ripley isotropic correction estimate of K[loc](r) for point 1720
## iso1719 Ripley isotropic correction estimate of K[loc](r) for point 1719
## iso1718 Ripley isotropic correction estimate of K[loc](r) for point 1718
## iso1717 Ripley isotropic correction estimate of K[loc](r) for point 1717
## iso1716 Ripley isotropic correction estimate of K[loc](r) for point 1716
## iso1715 Ripley isotropic correction estimate of K[loc](r) for point 1715
## iso1714 Ripley isotropic correction estimate of K[loc](r) for point 1714
## iso1713 Ripley isotropic correction estimate of K[loc](r) for point 1713
## iso1712 Ripley isotropic correction estimate of K[loc](r) for point 1712
## iso1711 Ripley isotropic correction estimate of K[loc](r) for point 1711
## iso1710 Ripley isotropic correction estimate of K[loc](r) for point 1710
## iso1709 Ripley isotropic correction estimate of K[loc](r) for point 1709
## iso1708 Ripley isotropic correction estimate of K[loc](r) for point 1708
## iso1707 Ripley isotropic correction estimate of K[loc](r) for point 1707
## iso1706 Ripley isotropic correction estimate of K[loc](r) for point 1706
## iso1705 Ripley isotropic correction estimate of K[loc](r) for point 1705
## iso1704 Ripley isotropic correction estimate of K[loc](r) for point 1704
## iso1703 Ripley isotropic correction estimate of K[loc](r) for point 1703
## iso1702 Ripley isotropic correction estimate of K[loc](r) for point 1702
## iso1701 Ripley isotropic correction estimate of K[loc](r) for point 1701
## iso1700 Ripley isotropic correction estimate of K[loc](r) for point 1700
## iso1699 Ripley isotropic correction estimate of K[loc](r) for point 1699
## iso1698 Ripley isotropic correction estimate of K[loc](r) for point 1698
## iso1697 Ripley isotropic correction estimate of K[loc](r) for point 1697
## iso1696 Ripley isotropic correction estimate of K[loc](r) for point 1696
## iso1695 Ripley isotropic correction estimate of K[loc](r) for point 1695
## iso1694 Ripley isotropic correction estimate of K[loc](r) for point 1694
## iso1693 Ripley isotropic correction estimate of K[loc](r) for point 1693
## iso1692 Ripley isotropic correction estimate of K[loc](r) for point 1692
## iso1691 Ripley isotropic correction estimate of K[loc](r) for point 1691
## iso1690 Ripley isotropic correction estimate of K[loc](r) for point 1690
## iso1689 Ripley isotropic correction estimate of K[loc](r) for point 1689
## iso1688 Ripley isotropic correction estimate of K[loc](r) for point 1688
## iso1687 Ripley isotropic correction estimate of K[loc](r) for point 1687
## iso1686 Ripley isotropic correction estimate of K[loc](r) for point 1686
## iso1685 Ripley isotropic correction estimate of K[loc](r) for point 1685
## iso1684 Ripley isotropic correction estimate of K[loc](r) for point 1684
## iso1683 Ripley isotropic correction estimate of K[loc](r) for point 1683
## iso1682 Ripley isotropic correction estimate of K[loc](r) for point 1682
## iso1681 Ripley isotropic correction estimate of K[loc](r) for point 1681
## iso1680 Ripley isotropic correction estimate of K[loc](r) for point 1680
## iso1679 Ripley isotropic correction estimate of K[loc](r) for point 1679
## iso1678 Ripley isotropic correction estimate of K[loc](r) for point 1678
## iso1677 Ripley isotropic correction estimate of K[loc](r) for point 1677
## iso1676 Ripley isotropic correction estimate of K[loc](r) for point 1676
## iso1675 Ripley isotropic correction estimate of K[loc](r) for point 1675
## iso1674 Ripley isotropic correction estimate of K[loc](r) for point 1674
## iso1673 Ripley isotropic correction estimate of K[loc](r) for point 1673
## iso1672 Ripley isotropic correction estimate of K[loc](r) for point 1672
## iso1671 Ripley isotropic correction estimate of K[loc](r) for point 1671
## iso1670 Ripley isotropic correction estimate of K[loc](r) for point 1670
## iso1669 Ripley isotropic correction estimate of K[loc](r) for point 1669
## iso1668 Ripley isotropic correction estimate of K[loc](r) for point 1668
## iso1667 Ripley isotropic correction estimate of K[loc](r) for point 1667
## iso1666 Ripley isotropic correction estimate of K[loc](r) for point 1666
## iso1665 Ripley isotropic correction estimate of K[loc](r) for point 1665
## iso1664 Ripley isotropic correction estimate of K[loc](r) for point 1664
## iso1663 Ripley isotropic correction estimate of K[loc](r) for point 1663
## iso1662 Ripley isotropic correction estimate of K[loc](r) for point 1662
## iso1661 Ripley isotropic correction estimate of K[loc](r) for point 1661
## iso1660 Ripley isotropic correction estimate of K[loc](r) for point 1660
## iso1659 Ripley isotropic correction estimate of K[loc](r) for point 1659
## iso1658 Ripley isotropic correction estimate of K[loc](r) for point 1658
## iso1657 Ripley isotropic correction estimate of K[loc](r) for point 1657
## iso1656 Ripley isotropic correction estimate of K[loc](r) for point 1656
## iso1655 Ripley isotropic correction estimate of K[loc](r) for point 1655
## iso1654 Ripley isotropic correction estimate of K[loc](r) for point 1654
## iso1653 Ripley isotropic correction estimate of K[loc](r) for point 1653
## iso1652 Ripley isotropic correction estimate of K[loc](r) for point 1652
## iso1651 Ripley isotropic correction estimate of K[loc](r) for point 1651
## iso1650 Ripley isotropic correction estimate of K[loc](r) for point 1650
## iso1649 Ripley isotropic correction estimate of K[loc](r) for point 1649
## iso1648 Ripley isotropic correction estimate of K[loc](r) for point 1648
## iso1647 Ripley isotropic correction estimate of K[loc](r) for point 1647
## iso1646 Ripley isotropic correction estimate of K[loc](r) for point 1646
## iso1645 Ripley isotropic correction estimate of K[loc](r) for point 1645
## iso1644 Ripley isotropic correction estimate of K[loc](r) for point 1644
## iso1643 Ripley isotropic correction estimate of K[loc](r) for point 1643
## iso1642 Ripley isotropic correction estimate of K[loc](r) for point 1642
## iso1641 Ripley isotropic correction estimate of K[loc](r) for point 1641
## iso1640 Ripley isotropic correction estimate of K[loc](r) for point 1640
## iso1639 Ripley isotropic correction estimate of K[loc](r) for point 1639
## iso1638 Ripley isotropic correction estimate of K[loc](r) for point 1638
## iso1637 Ripley isotropic correction estimate of K[loc](r) for point 1637
## iso1636 Ripley isotropic correction estimate of K[loc](r) for point 1636
## iso1635 Ripley isotropic correction estimate of K[loc](r) for point 1635
## iso1634 Ripley isotropic correction estimate of K[loc](r) for point 1634
## iso1633 Ripley isotropic correction estimate of K[loc](r) for point 1633
## iso1632 Ripley isotropic correction estimate of K[loc](r) for point 1632
## iso1631 Ripley isotropic correction estimate of K[loc](r) for point 1631
## iso1630 Ripley isotropic correction estimate of K[loc](r) for point 1630
## iso1629 Ripley isotropic correction estimate of K[loc](r) for point 1629
## iso1628 Ripley isotropic correction estimate of K[loc](r) for point 1628
## iso1627 Ripley isotropic correction estimate of K[loc](r) for point 1627
## iso1626 Ripley isotropic correction estimate of K[loc](r) for point 1626
## iso1625 Ripley isotropic correction estimate of K[loc](r) for point 1625
## iso1624 Ripley isotropic correction estimate of K[loc](r) for point 1624
## iso1623 Ripley isotropic correction estimate of K[loc](r) for point 1623
## iso1622 Ripley isotropic correction estimate of K[loc](r) for point 1622
## iso1621 Ripley isotropic correction estimate of K[loc](r) for point 1621
## iso1620 Ripley isotropic correction estimate of K[loc](r) for point 1620
## iso1619 Ripley isotropic correction estimate of K[loc](r) for point 1619
## iso1618 Ripley isotropic correction estimate of K[loc](r) for point 1618
## iso1617 Ripley isotropic correction estimate of K[loc](r) for point 1617
## iso1616 Ripley isotropic correction estimate of K[loc](r) for point 1616
## iso1615 Ripley isotropic correction estimate of K[loc](r) for point 1615
## iso1614 Ripley isotropic correction estimate of K[loc](r) for point 1614
## iso1613 Ripley isotropic correction estimate of K[loc](r) for point 1613
## iso1612 Ripley isotropic correction estimate of K[loc](r) for point 1612
## iso1611 Ripley isotropic correction estimate of K[loc](r) for point 1611
## iso1610 Ripley isotropic correction estimate of K[loc](r) for point 1610
## iso1609 Ripley isotropic correction estimate of K[loc](r) for point 1609
## iso1608 Ripley isotropic correction estimate of K[loc](r) for point 1608
## iso1607 Ripley isotropic correction estimate of K[loc](r) for point 1607
## iso1606 Ripley isotropic correction estimate of K[loc](r) for point 1606
## iso1605 Ripley isotropic correction estimate of K[loc](r) for point 1605
## iso1604 Ripley isotropic correction estimate of K[loc](r) for point 1604
## iso1603 Ripley isotropic correction estimate of K[loc](r) for point 1603
## iso1602 Ripley isotropic correction estimate of K[loc](r) for point 1602
## iso1601 Ripley isotropic correction estimate of K[loc](r) for point 1601
## iso1600 Ripley isotropic correction estimate of K[loc](r) for point 1600
## iso1599 Ripley isotropic correction estimate of K[loc](r) for point 1599
## iso1598 Ripley isotropic correction estimate of K[loc](r) for point 1598
## iso1597 Ripley isotropic correction estimate of K[loc](r) for point 1597
## iso1596 Ripley isotropic correction estimate of K[loc](r) for point 1596
## iso1595 Ripley isotropic correction estimate of K[loc](r) for point 1595
## iso1594 Ripley isotropic correction estimate of K[loc](r) for point 1594
## iso1593 Ripley isotropic correction estimate of K[loc](r) for point 1593
## iso1592 Ripley isotropic correction estimate of K[loc](r) for point 1592
## iso1591 Ripley isotropic correction estimate of K[loc](r) for point 1591
## iso1590 Ripley isotropic correction estimate of K[loc](r) for point 1590
## iso1589 Ripley isotropic correction estimate of K[loc](r) for point 1589
## iso1588 Ripley isotropic correction estimate of K[loc](r) for point 1588
## iso1587 Ripley isotropic correction estimate of K[loc](r) for point 1587
## iso1586 Ripley isotropic correction estimate of K[loc](r) for point 1586
## iso1585 Ripley isotropic correction estimate of K[loc](r) for point 1585
## iso1584 Ripley isotropic correction estimate of K[loc](r) for point 1584
## iso1583 Ripley isotropic correction estimate of K[loc](r) for point 1583
## iso1582 Ripley isotropic correction estimate of K[loc](r) for point 1582
## iso1581 Ripley isotropic correction estimate of K[loc](r) for point 1581
## iso1580 Ripley isotropic correction estimate of K[loc](r) for point 1580
## iso1579 Ripley isotropic correction estimate of K[loc](r) for point 1579
## iso1578 Ripley isotropic correction estimate of K[loc](r) for point 1578
## iso1577 Ripley isotropic correction estimate of K[loc](r) for point 1577
## iso1576 Ripley isotropic correction estimate of K[loc](r) for point 1576
## iso1575 Ripley isotropic correction estimate of K[loc](r) for point 1575
## iso1574 Ripley isotropic correction estimate of K[loc](r) for point 1574
## iso1573 Ripley isotropic correction estimate of K[loc](r) for point 1573
## iso1572 Ripley isotropic correction estimate of K[loc](r) for point 1572
## iso1571 Ripley isotropic correction estimate of K[loc](r) for point 1571
## iso1570 Ripley isotropic correction estimate of K[loc](r) for point 1570
## iso1569 Ripley isotropic correction estimate of K[loc](r) for point 1569
## iso1568 Ripley isotropic correction estimate of K[loc](r) for point 1568
## iso1567 Ripley isotropic correction estimate of K[loc](r) for point 1567
## iso1566 Ripley isotropic correction estimate of K[loc](r) for point 1566
## iso1565 Ripley isotropic correction estimate of K[loc](r) for point 1565
## iso1564 Ripley isotropic correction estimate of K[loc](r) for point 1564
## iso1563 Ripley isotropic correction estimate of K[loc](r) for point 1563
## iso1562 Ripley isotropic correction estimate of K[loc](r) for point 1562
## iso1561 Ripley isotropic correction estimate of K[loc](r) for point 1561
## iso1560 Ripley isotropic correction estimate of K[loc](r) for point 1560
## iso1559 Ripley isotropic correction estimate of K[loc](r) for point 1559
## iso1558 Ripley isotropic correction estimate of K[loc](r) for point 1558
## iso1557 Ripley isotropic correction estimate of K[loc](r) for point 1557
## iso1556 Ripley isotropic correction estimate of K[loc](r) for point 1556
## iso1555 Ripley isotropic correction estimate of K[loc](r) for point 1555
## iso1554 Ripley isotropic correction estimate of K[loc](r) for point 1554
## iso1553 Ripley isotropic correction estimate of K[loc](r) for point 1553
## iso1552 Ripley isotropic correction estimate of K[loc](r) for point 1552
## iso1551 Ripley isotropic correction estimate of K[loc](r) for point 1551
## iso1550 Ripley isotropic correction estimate of K[loc](r) for point 1550
## iso1549 Ripley isotropic correction estimate of K[loc](r) for point 1549
## iso1548 Ripley isotropic correction estimate of K[loc](r) for point 1548
## iso1547 Ripley isotropic correction estimate of K[loc](r) for point 1547
## iso1546 Ripley isotropic correction estimate of K[loc](r) for point 1546
## iso1545 Ripley isotropic correction estimate of K[loc](r) for point 1545
## iso1544 Ripley isotropic correction estimate of K[loc](r) for point 1544
## iso1543 Ripley isotropic correction estimate of K[loc](r) for point 1543
## iso1542 Ripley isotropic correction estimate of K[loc](r) for point 1542
## iso1541 Ripley isotropic correction estimate of K[loc](r) for point 1541
## iso1540 Ripley isotropic correction estimate of K[loc](r) for point 1540
## iso1539 Ripley isotropic correction estimate of K[loc](r) for point 1539
## iso1538 Ripley isotropic correction estimate of K[loc](r) for point 1538
## iso1537 Ripley isotropic correction estimate of K[loc](r) for point 1537
## iso1536 Ripley isotropic correction estimate of K[loc](r) for point 1536
## iso1535 Ripley isotropic correction estimate of K[loc](r) for point 1535
## iso1534 Ripley isotropic correction estimate of K[loc](r) for point 1534
## iso1533 Ripley isotropic correction estimate of K[loc](r) for point 1533
## iso1532 Ripley isotropic correction estimate of K[loc](r) for point 1532
## iso1531 Ripley isotropic correction estimate of K[loc](r) for point 1531
## iso1530 Ripley isotropic correction estimate of K[loc](r) for point 1530
## iso1529 Ripley isotropic correction estimate of K[loc](r) for point 1529
## iso1528 Ripley isotropic correction estimate of K[loc](r) for point 1528
## iso1527 Ripley isotropic correction estimate of K[loc](r) for point 1527
## iso1526 Ripley isotropic correction estimate of K[loc](r) for point 1526
## iso1525 Ripley isotropic correction estimate of K[loc](r) for point 1525
## iso1524 Ripley isotropic correction estimate of K[loc](r) for point 1524
## iso1523 Ripley isotropic correction estimate of K[loc](r) for point 1523
## iso1522 Ripley isotropic correction estimate of K[loc](r) for point 1522
## iso1521 Ripley isotropic correction estimate of K[loc](r) for point 1521
## iso1520 Ripley isotropic correction estimate of K[loc](r) for point 1520
## iso1519 Ripley isotropic correction estimate of K[loc](r) for point 1519
## iso1518 Ripley isotropic correction estimate of K[loc](r) for point 1518
## iso1517 Ripley isotropic correction estimate of K[loc](r) for point 1517
## iso1516 Ripley isotropic correction estimate of K[loc](r) for point 1516
## iso1515 Ripley isotropic correction estimate of K[loc](r) for point 1515
## iso1514 Ripley isotropic correction estimate of K[loc](r) for point 1514
## iso1513 Ripley isotropic correction estimate of K[loc](r) for point 1513
## iso1512 Ripley isotropic correction estimate of K[loc](r) for point 1512
## iso1511 Ripley isotropic correction estimate of K[loc](r) for point 1511
## iso1510 Ripley isotropic correction estimate of K[loc](r) for point 1510
## iso1509 Ripley isotropic correction estimate of K[loc](r) for point 1509
## iso1508 Ripley isotropic correction estimate of K[loc](r) for point 1508
## iso1507 Ripley isotropic correction estimate of K[loc](r) for point 1507
## iso1506 Ripley isotropic correction estimate of K[loc](r) for point 1506
## iso1505 Ripley isotropic correction estimate of K[loc](r) for point 1505
## iso1504 Ripley isotropic correction estimate of K[loc](r) for point 1504
## iso1503 Ripley isotropic correction estimate of K[loc](r) for point 1503
## iso1502 Ripley isotropic correction estimate of K[loc](r) for point 1502
## iso1501 Ripley isotropic correction estimate of K[loc](r) for point 1501
## iso1500 Ripley isotropic correction estimate of K[loc](r) for point 1500
## iso1499 Ripley isotropic correction estimate of K[loc](r) for point 1499
## iso1498 Ripley isotropic correction estimate of K[loc](r) for point 1498
## iso1497 Ripley isotropic correction estimate of K[loc](r) for point 1497
## iso1496 Ripley isotropic correction estimate of K[loc](r) for point 1496
## iso1495 Ripley isotropic correction estimate of K[loc](r) for point 1495
## iso1494 Ripley isotropic correction estimate of K[loc](r) for point 1494
## iso1493 Ripley isotropic correction estimate of K[loc](r) for point 1493
## iso1492 Ripley isotropic correction estimate of K[loc](r) for point 1492
## iso1491 Ripley isotropic correction estimate of K[loc](r) for point 1491
## iso1490 Ripley isotropic correction estimate of K[loc](r) for point 1490
## iso1489 Ripley isotropic correction estimate of K[loc](r) for point 1489
## iso1488 Ripley isotropic correction estimate of K[loc](r) for point 1488
## iso1487 Ripley isotropic correction estimate of K[loc](r) for point 1487
## iso1486 Ripley isotropic correction estimate of K[loc](r) for point 1486
## iso1485 Ripley isotropic correction estimate of K[loc](r) for point 1485
## iso1484 Ripley isotropic correction estimate of K[loc](r) for point 1484
## iso1483 Ripley isotropic correction estimate of K[loc](r) for point 1483
## iso1482 Ripley isotropic correction estimate of K[loc](r) for point 1482
## iso1481 Ripley isotropic correction estimate of K[loc](r) for point 1481
## iso1480 Ripley isotropic correction estimate of K[loc](r) for point 1480
## iso1479 Ripley isotropic correction estimate of K[loc](r) for point 1479
## iso1478 Ripley isotropic correction estimate of K[loc](r) for point 1478
## iso1477 Ripley isotropic correction estimate of K[loc](r) for point 1477
## iso1476 Ripley isotropic correction estimate of K[loc](r) for point 1476
## iso1475 Ripley isotropic correction estimate of K[loc](r) for point 1475
## iso1474 Ripley isotropic correction estimate of K[loc](r) for point 1474
## iso1473 Ripley isotropic correction estimate of K[loc](r) for point 1473
## iso1472 Ripley isotropic correction estimate of K[loc](r) for point 1472
## iso1471 Ripley isotropic correction estimate of K[loc](r) for point 1471
## iso1470 Ripley isotropic correction estimate of K[loc](r) for point 1470
## iso1469 Ripley isotropic correction estimate of K[loc](r) for point 1469
## iso1468 Ripley isotropic correction estimate of K[loc](r) for point 1468
## iso1467 Ripley isotropic correction estimate of K[loc](r) for point 1467
## iso1466 Ripley isotropic correction estimate of K[loc](r) for point 1466
## iso1465 Ripley isotropic correction estimate of K[loc](r) for point 1465
## iso1464 Ripley isotropic correction estimate of K[loc](r) for point 1464
## iso1463 Ripley isotropic correction estimate of K[loc](r) for point 1463
## iso1462 Ripley isotropic correction estimate of K[loc](r) for point 1462
## iso1461 Ripley isotropic correction estimate of K[loc](r) for point 1461
## iso1460 Ripley isotropic correction estimate of K[loc](r) for point 1460
## iso1459 Ripley isotropic correction estimate of K[loc](r) for point 1459
## iso1458 Ripley isotropic correction estimate of K[loc](r) for point 1458
## iso1457 Ripley isotropic correction estimate of K[loc](r) for point 1457
## iso1456 Ripley isotropic correction estimate of K[loc](r) for point 1456
## iso1455 Ripley isotropic correction estimate of K[loc](r) for point 1455
## iso1454 Ripley isotropic correction estimate of K[loc](r) for point 1454
## iso1453 Ripley isotropic correction estimate of K[loc](r) for point 1453
## iso1452 Ripley isotropic correction estimate of K[loc](r) for point 1452
## iso1451 Ripley isotropic correction estimate of K[loc](r) for point 1451
## iso1450 Ripley isotropic correction estimate of K[loc](r) for point 1450
## iso1449 Ripley isotropic correction estimate of K[loc](r) for point 1449
## iso1448 Ripley isotropic correction estimate of K[loc](r) for point 1448
## iso1447 Ripley isotropic correction estimate of K[loc](r) for point 1447
## iso1446 Ripley isotropic correction estimate of K[loc](r) for point 1446
## iso1445 Ripley isotropic correction estimate of K[loc](r) for point 1445
## iso1444 Ripley isotropic correction estimate of K[loc](r) for point 1444
## iso1443 Ripley isotropic correction estimate of K[loc](r) for point 1443
## iso1442 Ripley isotropic correction estimate of K[loc](r) for point 1442
## iso1441 Ripley isotropic correction estimate of K[loc](r) for point 1441
## iso1440 Ripley isotropic correction estimate of K[loc](r) for point 1440
## iso1439 Ripley isotropic correction estimate of K[loc](r) for point 1439
## iso1438 Ripley isotropic correction estimate of K[loc](r) for point 1438
## iso1437 Ripley isotropic correction estimate of K[loc](r) for point 1437
## iso1436 Ripley isotropic correction estimate of K[loc](r) for point 1436
## iso1435 Ripley isotropic correction estimate of K[loc](r) for point 1435
## iso1434 Ripley isotropic correction estimate of K[loc](r) for point 1434
## iso1433 Ripley isotropic correction estimate of K[loc](r) for point 1433
## iso1432 Ripley isotropic correction estimate of K[loc](r) for point 1432
## iso1431 Ripley isotropic correction estimate of K[loc](r) for point 1431
## iso1430 Ripley isotropic correction estimate of K[loc](r) for point 1430
## iso1429 Ripley isotropic correction estimate of K[loc](r) for point 1429
## iso1428 Ripley isotropic correction estimate of K[loc](r) for point 1428
## iso1427 Ripley isotropic correction estimate of K[loc](r) for point 1427
## iso1426 Ripley isotropic correction estimate of K[loc](r) for point 1426
## iso1425 Ripley isotropic correction estimate of K[loc](r) for point 1425
## iso1424 Ripley isotropic correction estimate of K[loc](r) for point 1424
## iso1423 Ripley isotropic correction estimate of K[loc](r) for point 1423
## iso1422 Ripley isotropic correction estimate of K[loc](r) for point 1422
## iso1421 Ripley isotropic correction estimate of K[loc](r) for point 1421
## iso1420 Ripley isotropic correction estimate of K[loc](r) for point 1420
## iso1419 Ripley isotropic correction estimate of K[loc](r) for point 1419
## iso1418 Ripley isotropic correction estimate of K[loc](r) for point 1418
## iso1417 Ripley isotropic correction estimate of K[loc](r) for point 1417
## iso1416 Ripley isotropic correction estimate of K[loc](r) for point 1416
## iso1415 Ripley isotropic correction estimate of K[loc](r) for point 1415
## iso1414 Ripley isotropic correction estimate of K[loc](r) for point 1414
## iso1413 Ripley isotropic correction estimate of K[loc](r) for point 1413
## iso1412 Ripley isotropic correction estimate of K[loc](r) for point 1412
## iso1411 Ripley isotropic correction estimate of K[loc](r) for point 1411
## iso1410 Ripley isotropic correction estimate of K[loc](r) for point 1410
## iso1409 Ripley isotropic correction estimate of K[loc](r) for point 1409
## iso1408 Ripley isotropic correction estimate of K[loc](r) for point 1408
## iso1407 Ripley isotropic correction estimate of K[loc](r) for point 1407
## iso1406 Ripley isotropic correction estimate of K[loc](r) for point 1406
## iso1405 Ripley isotropic correction estimate of K[loc](r) for point 1405
## iso1404 Ripley isotropic correction estimate of K[loc](r) for point 1404
## iso1403 Ripley isotropic correction estimate of K[loc](r) for point 1403
## iso1402 Ripley isotropic correction estimate of K[loc](r) for point 1402
## iso1401 Ripley isotropic correction estimate of K[loc](r) for point 1401
## iso1400 Ripley isotropic correction estimate of K[loc](r) for point 1400
## iso1399 Ripley isotropic correction estimate of K[loc](r) for point 1399
## iso1398 Ripley isotropic correction estimate of K[loc](r) for point 1398
## iso1397 Ripley isotropic correction estimate of K[loc](r) for point 1397
## iso1396 Ripley isotropic correction estimate of K[loc](r) for point 1396
## iso1395 Ripley isotropic correction estimate of K[loc](r) for point 1395
## iso1394 Ripley isotropic correction estimate of K[loc](r) for point 1394
## iso1393 Ripley isotropic correction estimate of K[loc](r) for point 1393
## iso1392 Ripley isotropic correction estimate of K[loc](r) for point 1392
## iso1391 Ripley isotropic correction estimate of K[loc](r) for point 1391
## iso1390 Ripley isotropic correction estimate of K[loc](r) for point 1390
## iso1389 Ripley isotropic correction estimate of K[loc](r) for point 1389
## iso1388 Ripley isotropic correction estimate of K[loc](r) for point 1388
## iso1387 Ripley isotropic correction estimate of K[loc](r) for point 1387
## iso1386 Ripley isotropic correction estimate of K[loc](r) for point 1386
## iso1385 Ripley isotropic correction estimate of K[loc](r) for point 1385
## iso1384 Ripley isotropic correction estimate of K[loc](r) for point 1384
## iso1383 Ripley isotropic correction estimate of K[loc](r) for point 1383
## iso1382 Ripley isotropic correction estimate of K[loc](r) for point 1382
## iso1381 Ripley isotropic correction estimate of K[loc](r) for point 1381
## iso1380 Ripley isotropic correction estimate of K[loc](r) for point 1380
## iso1379 Ripley isotropic correction estimate of K[loc](r) for point 1379
## iso1378 Ripley isotropic correction estimate of K[loc](r) for point 1378
## iso1377 Ripley isotropic correction estimate of K[loc](r) for point 1377
## iso1376 Ripley isotropic correction estimate of K[loc](r) for point 1376
## iso1375 Ripley isotropic correction estimate of K[loc](r) for point 1375
## iso1374 Ripley isotropic correction estimate of K[loc](r) for point 1374
## iso1373 Ripley isotropic correction estimate of K[loc](r) for point 1373
## iso1372 Ripley isotropic correction estimate of K[loc](r) for point 1372
## iso1371 Ripley isotropic correction estimate of K[loc](r) for point 1371
## iso1370 Ripley isotropic correction estimate of K[loc](r) for point 1370
## iso1369 Ripley isotropic correction estimate of K[loc](r) for point 1369
## iso1368 Ripley isotropic correction estimate of K[loc](r) for point 1368
## iso1367 Ripley isotropic correction estimate of K[loc](r) for point 1367
## iso1366 Ripley isotropic correction estimate of K[loc](r) for point 1366
## iso1365 Ripley isotropic correction estimate of K[loc](r) for point 1365
## iso1364 Ripley isotropic correction estimate of K[loc](r) for point 1364
## iso1363 Ripley isotropic correction estimate of K[loc](r) for point 1363
## iso1362 Ripley isotropic correction estimate of K[loc](r) for point 1362
## iso1361 Ripley isotropic correction estimate of K[loc](r) for point 1361
## iso1360 Ripley isotropic correction estimate of K[loc](r) for point 1360
## iso1359 Ripley isotropic correction estimate of K[loc](r) for point 1359
## iso1358 Ripley isotropic correction estimate of K[loc](r) for point 1358
## iso1357 Ripley isotropic correction estimate of K[loc](r) for point 1357
## iso1356 Ripley isotropic correction estimate of K[loc](r) for point 1356
## iso1355 Ripley isotropic correction estimate of K[loc](r) for point 1355
## iso1354 Ripley isotropic correction estimate of K[loc](r) for point 1354
## iso1353 Ripley isotropic correction estimate of K[loc](r) for point 1353
## iso1352 Ripley isotropic correction estimate of K[loc](r) for point 1352
## iso1351 Ripley isotropic correction estimate of K[loc](r) for point 1351
## iso1350 Ripley isotropic correction estimate of K[loc](r) for point 1350
## iso1349 Ripley isotropic correction estimate of K[loc](r) for point 1349
## iso1348 Ripley isotropic correction estimate of K[loc](r) for point 1348
## iso1347 Ripley isotropic correction estimate of K[loc](r) for point 1347
## iso1346 Ripley isotropic correction estimate of K[loc](r) for point 1346
## iso1345 Ripley isotropic correction estimate of K[loc](r) for point 1345
## iso1344 Ripley isotropic correction estimate of K[loc](r) for point 1344
## iso1343 Ripley isotropic correction estimate of K[loc](r) for point 1343
## iso1342 Ripley isotropic correction estimate of K[loc](r) for point 1342
## iso1341 Ripley isotropic correction estimate of K[loc](r) for point 1341
## iso1340 Ripley isotropic correction estimate of K[loc](r) for point 1340
## iso1339 Ripley isotropic correction estimate of K[loc](r) for point 1339
## iso1338 Ripley isotropic correction estimate of K[loc](r) for point 1338
## iso1337 Ripley isotropic correction estimate of K[loc](r) for point 1337
## iso1336 Ripley isotropic correction estimate of K[loc](r) for point 1336
## iso1335 Ripley isotropic correction estimate of K[loc](r) for point 1335
## iso1334 Ripley isotropic correction estimate of K[loc](r) for point 1334
## iso1333 Ripley isotropic correction estimate of K[loc](r) for point 1333
## iso1332 Ripley isotropic correction estimate of K[loc](r) for point 1332
## iso1331 Ripley isotropic correction estimate of K[loc](r) for point 1331
## iso1330 Ripley isotropic correction estimate of K[loc](r) for point 1330
## iso1329 Ripley isotropic correction estimate of K[loc](r) for point 1329
## iso1328 Ripley isotropic correction estimate of K[loc](r) for point 1328
## iso1327 Ripley isotropic correction estimate of K[loc](r) for point 1327
## iso1326 Ripley isotropic correction estimate of K[loc](r) for point 1326
## iso1325 Ripley isotropic correction estimate of K[loc](r) for point 1325
## iso1324 Ripley isotropic correction estimate of K[loc](r) for point 1324
## iso1323 Ripley isotropic correction estimate of K[loc](r) for point 1323
## iso1322 Ripley isotropic correction estimate of K[loc](r) for point 1322
## iso1321 Ripley isotropic correction estimate of K[loc](r) for point 1321
## iso1320 Ripley isotropic correction estimate of K[loc](r) for point 1320
## iso1319 Ripley isotropic correction estimate of K[loc](r) for point 1319
## iso1318 Ripley isotropic correction estimate of K[loc](r) for point 1318
## iso1317 Ripley isotropic correction estimate of K[loc](r) for point 1317
## iso1316 Ripley isotropic correction estimate of K[loc](r) for point 1316
## iso1315 Ripley isotropic correction estimate of K[loc](r) for point 1315
## iso1314 Ripley isotropic correction estimate of K[loc](r) for point 1314
## iso1313 Ripley isotropic correction estimate of K[loc](r) for point 1313
## iso1312 Ripley isotropic correction estimate of K[loc](r) for point 1312
## iso1311 Ripley isotropic correction estimate of K[loc](r) for point 1311
## iso1310 Ripley isotropic correction estimate of K[loc](r) for point 1310
## iso1309 Ripley isotropic correction estimate of K[loc](r) for point 1309
## iso1308 Ripley isotropic correction estimate of K[loc](r) for point 1308
## iso1307 Ripley isotropic correction estimate of K[loc](r) for point 1307
## iso1306 Ripley isotropic correction estimate of K[loc](r) for point 1306
## iso1305 Ripley isotropic correction estimate of K[loc](r) for point 1305
## iso1304 Ripley isotropic correction estimate of K[loc](r) for point 1304
## iso1303 Ripley isotropic correction estimate of K[loc](r) for point 1303
## iso1302 Ripley isotropic correction estimate of K[loc](r) for point 1302
## iso1301 Ripley isotropic correction estimate of K[loc](r) for point 1301
## iso1300 Ripley isotropic correction estimate of K[loc](r) for point 1300
## iso1299 Ripley isotropic correction estimate of K[loc](r) for point 1299
## iso1298 Ripley isotropic correction estimate of K[loc](r) for point 1298
## iso1297 Ripley isotropic correction estimate of K[loc](r) for point 1297
## iso1296 Ripley isotropic correction estimate of K[loc](r) for point 1296
## iso1295 Ripley isotropic correction estimate of K[loc](r) for point 1295
## iso1294 Ripley isotropic correction estimate of K[loc](r) for point 1294
## iso1293 Ripley isotropic correction estimate of K[loc](r) for point 1293
## iso1292 Ripley isotropic correction estimate of K[loc](r) for point 1292
## iso1291 Ripley isotropic correction estimate of K[loc](r) for point 1291
## iso1290 Ripley isotropic correction estimate of K[loc](r) for point 1290
## iso1289 Ripley isotropic correction estimate of K[loc](r) for point 1289
## iso1288 Ripley isotropic correction estimate of K[loc](r) for point 1288
## iso1287 Ripley isotropic correction estimate of K[loc](r) for point 1287
## iso1286 Ripley isotropic correction estimate of K[loc](r) for point 1286
## iso1285 Ripley isotropic correction estimate of K[loc](r) for point 1285
## iso1284 Ripley isotropic correction estimate of K[loc](r) for point 1284
## iso1283 Ripley isotropic correction estimate of K[loc](r) for point 1283
## iso1282 Ripley isotropic correction estimate of K[loc](r) for point 1282
## iso1281 Ripley isotropic correction estimate of K[loc](r) for point 1281
## iso1280 Ripley isotropic correction estimate of K[loc](r) for point 1280
## iso1279 Ripley isotropic correction estimate of K[loc](r) for point 1279
## iso1278 Ripley isotropic correction estimate of K[loc](r) for point 1278
## iso1277 Ripley isotropic correction estimate of K[loc](r) for point 1277
## iso1276 Ripley isotropic correction estimate of K[loc](r) for point 1276
## iso1275 Ripley isotropic correction estimate of K[loc](r) for point 1275
## iso1274 Ripley isotropic correction estimate of K[loc](r) for point 1274
## iso1273 Ripley isotropic correction estimate of K[loc](r) for point 1273
## iso1272 Ripley isotropic correction estimate of K[loc](r) for point 1272
## iso1271 Ripley isotropic correction estimate of K[loc](r) for point 1271
## iso1270 Ripley isotropic correction estimate of K[loc](r) for point 1270
## iso1269 Ripley isotropic correction estimate of K[loc](r) for point 1269
## iso1268 Ripley isotropic correction estimate of K[loc](r) for point 1268
## iso1267 Ripley isotropic correction estimate of K[loc](r) for point 1267
## iso1266 Ripley isotropic correction estimate of K[loc](r) for point 1266
## iso1265 Ripley isotropic correction estimate of K[loc](r) for point 1265
## iso1264 Ripley isotropic correction estimate of K[loc](r) for point 1264
## iso1263 Ripley isotropic correction estimate of K[loc](r) for point 1263
## iso1262 Ripley isotropic correction estimate of K[loc](r) for point 1262
## iso1261 Ripley isotropic correction estimate of K[loc](r) for point 1261
## iso1260 Ripley isotropic correction estimate of K[loc](r) for point 1260
## iso1259 Ripley isotropic correction estimate of K[loc](r) for point 1259
## iso1258 Ripley isotropic correction estimate of K[loc](r) for point 1258
## iso1257 Ripley isotropic correction estimate of K[loc](r) for point 1257
## iso1256 Ripley isotropic correction estimate of K[loc](r) for point 1256
## iso1255 Ripley isotropic correction estimate of K[loc](r) for point 1255
## iso1254 Ripley isotropic correction estimate of K[loc](r) for point 1254
## iso1253 Ripley isotropic correction estimate of K[loc](r) for point 1253
## iso1252 Ripley isotropic correction estimate of K[loc](r) for point 1252
## iso1251 Ripley isotropic correction estimate of K[loc](r) for point 1251
## iso1250 Ripley isotropic correction estimate of K[loc](r) for point 1250
## iso1249 Ripley isotropic correction estimate of K[loc](r) for point 1249
## iso1248 Ripley isotropic correction estimate of K[loc](r) for point 1248
## iso1247 Ripley isotropic correction estimate of K[loc](r) for point 1247
## iso1246 Ripley isotropic correction estimate of K[loc](r) for point 1246
## iso1245 Ripley isotropic correction estimate of K[loc](r) for point 1245
## iso1244 Ripley isotropic correction estimate of K[loc](r) for point 1244
## iso1243 Ripley isotropic correction estimate of K[loc](r) for point 1243
## iso1242 Ripley isotropic correction estimate of K[loc](r) for point 1242
## iso1241 Ripley isotropic correction estimate of K[loc](r) for point 1241
## iso1240 Ripley isotropic correction estimate of K[loc](r) for point 1240
## iso1239 Ripley isotropic correction estimate of K[loc](r) for point 1239
## iso1238 Ripley isotropic correction estimate of K[loc](r) for point 1238
## iso1237 Ripley isotropic correction estimate of K[loc](r) for point 1237
## iso1236 Ripley isotropic correction estimate of K[loc](r) for point 1236
## iso1235 Ripley isotropic correction estimate of K[loc](r) for point 1235
## iso1234 Ripley isotropic correction estimate of K[loc](r) for point 1234
## iso1233 Ripley isotropic correction estimate of K[loc](r) for point 1233
## iso1232 Ripley isotropic correction estimate of K[loc](r) for point 1232
## iso1231 Ripley isotropic correction estimate of K[loc](r) for point 1231
## iso1230 Ripley isotropic correction estimate of K[loc](r) for point 1230
## iso1229 Ripley isotropic correction estimate of K[loc](r) for point 1229
## iso1228 Ripley isotropic correction estimate of K[loc](r) for point 1228
## iso1227 Ripley isotropic correction estimate of K[loc](r) for point 1227
## iso1226 Ripley isotropic correction estimate of K[loc](r) for point 1226
## iso1225 Ripley isotropic correction estimate of K[loc](r) for point 1225
## iso1224 Ripley isotropic correction estimate of K[loc](r) for point 1224
## iso1223 Ripley isotropic correction estimate of K[loc](r) for point 1223
## iso1222 Ripley isotropic correction estimate of K[loc](r) for point 1222
## iso1221 Ripley isotropic correction estimate of K[loc](r) for point 1221
## iso1220 Ripley isotropic correction estimate of K[loc](r) for point 1220
## iso1219 Ripley isotropic correction estimate of K[loc](r) for point 1219
## iso1218 Ripley isotropic correction estimate of K[loc](r) for point 1218
## iso1217 Ripley isotropic correction estimate of K[loc](r) for point 1217
## iso1216 Ripley isotropic correction estimate of K[loc](r) for point 1216
## iso1215 Ripley isotropic correction estimate of K[loc](r) for point 1215
## iso1214 Ripley isotropic correction estimate of K[loc](r) for point 1214
## iso1213 Ripley isotropic correction estimate of K[loc](r) for point 1213
## iso1212 Ripley isotropic correction estimate of K[loc](r) for point 1212
## iso1211 Ripley isotropic correction estimate of K[loc](r) for point 1211
## iso1210 Ripley isotropic correction estimate of K[loc](r) for point 1210
## iso1209 Ripley isotropic correction estimate of K[loc](r) for point 1209
## iso1208 Ripley isotropic correction estimate of K[loc](r) for point 1208
## iso1207 Ripley isotropic correction estimate of K[loc](r) for point 1207
## iso1206 Ripley isotropic correction estimate of K[loc](r) for point 1206
## iso1205 Ripley isotropic correction estimate of K[loc](r) for point 1205
## iso1204 Ripley isotropic correction estimate of K[loc](r) for point 1204
## iso1203 Ripley isotropic correction estimate of K[loc](r) for point 1203
## iso1202 Ripley isotropic correction estimate of K[loc](r) for point 1202
## iso1201 Ripley isotropic correction estimate of K[loc](r) for point 1201
## iso1200 Ripley isotropic correction estimate of K[loc](r) for point 1200
## iso1199 Ripley isotropic correction estimate of K[loc](r) for point 1199
## iso1198 Ripley isotropic correction estimate of K[loc](r) for point 1198
## iso1197 Ripley isotropic correction estimate of K[loc](r) for point 1197
## iso1196 Ripley isotropic correction estimate of K[loc](r) for point 1196
## iso1195 Ripley isotropic correction estimate of K[loc](r) for point 1195
## iso1194 Ripley isotropic correction estimate of K[loc](r) for point 1194
## iso1193 Ripley isotropic correction estimate of K[loc](r) for point 1193
## iso1192 Ripley isotropic correction estimate of K[loc](r) for point 1192
## iso1191 Ripley isotropic correction estimate of K[loc](r) for point 1191
## iso1190 Ripley isotropic correction estimate of K[loc](r) for point 1190
## iso1189 Ripley isotropic correction estimate of K[loc](r) for point 1189
## iso1188 Ripley isotropic correction estimate of K[loc](r) for point 1188
## iso1187 Ripley isotropic correction estimate of K[loc](r) for point 1187
## iso1186 Ripley isotropic correction estimate of K[loc](r) for point 1186
## iso1185 Ripley isotropic correction estimate of K[loc](r) for point 1185
## iso1184 Ripley isotropic correction estimate of K[loc](r) for point 1184
## iso1183 Ripley isotropic correction estimate of K[loc](r) for point 1183
## iso1182 Ripley isotropic correction estimate of K[loc](r) for point 1182
## iso1181 Ripley isotropic correction estimate of K[loc](r) for point 1181
## iso1180 Ripley isotropic correction estimate of K[loc](r) for point 1180
## iso1179 Ripley isotropic correction estimate of K[loc](r) for point 1179
## iso1178 Ripley isotropic correction estimate of K[loc](r) for point 1178
## iso1177 Ripley isotropic correction estimate of K[loc](r) for point 1177
## iso1176 Ripley isotropic correction estimate of K[loc](r) for point 1176
## iso1175 Ripley isotropic correction estimate of K[loc](r) for point 1175
## iso1174 Ripley isotropic correction estimate of K[loc](r) for point 1174
## iso1173 Ripley isotropic correction estimate of K[loc](r) for point 1173
## iso1172 Ripley isotropic correction estimate of K[loc](r) for point 1172
## iso1171 Ripley isotropic correction estimate of K[loc](r) for point 1171
## iso1170 Ripley isotropic correction estimate of K[loc](r) for point 1170
## iso1169 Ripley isotropic correction estimate of K[loc](r) for point 1169
## iso1168 Ripley isotropic correction estimate of K[loc](r) for point 1168
## iso1167 Ripley isotropic correction estimate of K[loc](r) for point 1167
## iso1166 Ripley isotropic correction estimate of K[loc](r) for point 1166
## iso1165 Ripley isotropic correction estimate of K[loc](r) for point 1165
## iso1164 Ripley isotropic correction estimate of K[loc](r) for point 1164
## iso1163 Ripley isotropic correction estimate of K[loc](r) for point 1163
## iso1162 Ripley isotropic correction estimate of K[loc](r) for point 1162
## iso1161 Ripley isotropic correction estimate of K[loc](r) for point 1161
## iso1160 Ripley isotropic correction estimate of K[loc](r) for point 1160
## iso1159 Ripley isotropic correction estimate of K[loc](r) for point 1159
## iso1158 Ripley isotropic correction estimate of K[loc](r) for point 1158
## iso1157 Ripley isotropic correction estimate of K[loc](r) for point 1157
## iso1156 Ripley isotropic correction estimate of K[loc](r) for point 1156
## iso1155 Ripley isotropic correction estimate of K[loc](r) for point 1155
## iso1154 Ripley isotropic correction estimate of K[loc](r) for point 1154
## iso1153 Ripley isotropic correction estimate of K[loc](r) for point 1153
## iso1152 Ripley isotropic correction estimate of K[loc](r) for point 1152
## iso1151 Ripley isotropic correction estimate of K[loc](r) for point 1151
## iso1150 Ripley isotropic correction estimate of K[loc](r) for point 1150
## iso1149 Ripley isotropic correction estimate of K[loc](r) for point 1149
## iso1148 Ripley isotropic correction estimate of K[loc](r) for point 1148
## iso1147 Ripley isotropic correction estimate of K[loc](r) for point 1147
## iso1146 Ripley isotropic correction estimate of K[loc](r) for point 1146
## iso1145 Ripley isotropic correction estimate of K[loc](r) for point 1145
## iso1144 Ripley isotropic correction estimate of K[loc](r) for point 1144
## iso1143 Ripley isotropic correction estimate of K[loc](r) for point 1143
## iso1142 Ripley isotropic correction estimate of K[loc](r) for point 1142
## iso1141 Ripley isotropic correction estimate of K[loc](r) for point 1141
## iso1140 Ripley isotropic correction estimate of K[loc](r) for point 1140
## iso1139 Ripley isotropic correction estimate of K[loc](r) for point 1139
## iso1138 Ripley isotropic correction estimate of K[loc](r) for point 1138
## iso1137 Ripley isotropic correction estimate of K[loc](r) for point 1137
## iso1136 Ripley isotropic correction estimate of K[loc](r) for point 1136
## iso1135 Ripley isotropic correction estimate of K[loc](r) for point 1135
## iso1134 Ripley isotropic correction estimate of K[loc](r) for point 1134
## iso1133 Ripley isotropic correction estimate of K[loc](r) for point 1133
## iso1132 Ripley isotropic correction estimate of K[loc](r) for point 1132
## iso1131 Ripley isotropic correction estimate of K[loc](r) for point 1131
## iso1130 Ripley isotropic correction estimate of K[loc](r) for point 1130
## iso1129 Ripley isotropic correction estimate of K[loc](r) for point 1129
## iso1128 Ripley isotropic correction estimate of K[loc](r) for point 1128
## iso1127 Ripley isotropic correction estimate of K[loc](r) for point 1127
## iso1126 Ripley isotropic correction estimate of K[loc](r) for point 1126
## iso1125 Ripley isotropic correction estimate of K[loc](r) for point 1125
## iso1124 Ripley isotropic correction estimate of K[loc](r) for point 1124
## iso1123 Ripley isotropic correction estimate of K[loc](r) for point 1123
## iso1122 Ripley isotropic correction estimate of K[loc](r) for point 1122
## iso1121 Ripley isotropic correction estimate of K[loc](r) for point 1121
## iso1120 Ripley isotropic correction estimate of K[loc](r) for point 1120
## iso1119 Ripley isotropic correction estimate of K[loc](r) for point 1119
## iso1118 Ripley isotropic correction estimate of K[loc](r) for point 1118
## iso1117 Ripley isotropic correction estimate of K[loc](r) for point 1117
## iso1116 Ripley isotropic correction estimate of K[loc](r) for point 1116
## iso1115 Ripley isotropic correction estimate of K[loc](r) for point 1115
## iso1114 Ripley isotropic correction estimate of K[loc](r) for point 1114
## iso1113 Ripley isotropic correction estimate of K[loc](r) for point 1113
## iso1112 Ripley isotropic correction estimate of K[loc](r) for point 1112
## iso1111 Ripley isotropic correction estimate of K[loc](r) for point 1111
## iso1110 Ripley isotropic correction estimate of K[loc](r) for point 1110
## iso1109 Ripley isotropic correction estimate of K[loc](r) for point 1109
## iso1108 Ripley isotropic correction estimate of K[loc](r) for point 1108
## iso1107 Ripley isotropic correction estimate of K[loc](r) for point 1107
## iso1106 Ripley isotropic correction estimate of K[loc](r) for point 1106
## iso1105 Ripley isotropic correction estimate of K[loc](r) for point 1105
## iso1104 Ripley isotropic correction estimate of K[loc](r) for point 1104
## iso1103 Ripley isotropic correction estimate of K[loc](r) for point 1103
## iso1102 Ripley isotropic correction estimate of K[loc](r) for point 1102
## iso1101 Ripley isotropic correction estimate of K[loc](r) for point 1101
## iso1100 Ripley isotropic correction estimate of K[loc](r) for point 1100
## iso1099 Ripley isotropic correction estimate of K[loc](r) for point 1099
## iso1098 Ripley isotropic correction estimate of K[loc](r) for point 1098
## iso1097 Ripley isotropic correction estimate of K[loc](r) for point 1097
## iso1096 Ripley isotropic correction estimate of K[loc](r) for point 1096
## iso1095 Ripley isotropic correction estimate of K[loc](r) for point 1095
## iso1094 Ripley isotropic correction estimate of K[loc](r) for point 1094
## iso1093 Ripley isotropic correction estimate of K[loc](r) for point 1093
## iso1092 Ripley isotropic correction estimate of K[loc](r) for point 1092
## iso1091 Ripley isotropic correction estimate of K[loc](r) for point 1091
## iso1090 Ripley isotropic correction estimate of K[loc](r) for point 1090
## iso1089 Ripley isotropic correction estimate of K[loc](r) for point 1089
## iso1088 Ripley isotropic correction estimate of K[loc](r) for point 1088
## iso1087 Ripley isotropic correction estimate of K[loc](r) for point 1087
## iso1086 Ripley isotropic correction estimate of K[loc](r) for point 1086
## iso1085 Ripley isotropic correction estimate of K[loc](r) for point 1085
## iso1084 Ripley isotropic correction estimate of K[loc](r) for point 1084
## iso1083 Ripley isotropic correction estimate of K[loc](r) for point 1083
## iso1082 Ripley isotropic correction estimate of K[loc](r) for point 1082
## iso1081 Ripley isotropic correction estimate of K[loc](r) for point 1081
## iso1080 Ripley isotropic correction estimate of K[loc](r) for point 1080
## iso1079 Ripley isotropic correction estimate of K[loc](r) for point 1079
## iso1078 Ripley isotropic correction estimate of K[loc](r) for point 1078
## iso1077 Ripley isotropic correction estimate of K[loc](r) for point 1077
## iso1076 Ripley isotropic correction estimate of K[loc](r) for point 1076
## iso1075 Ripley isotropic correction estimate of K[loc](r) for point 1075
## iso1074 Ripley isotropic correction estimate of K[loc](r) for point 1074
## iso1073 Ripley isotropic correction estimate of K[loc](r) for point 1073
## iso1072 Ripley isotropic correction estimate of K[loc](r) for point 1072
## iso1071 Ripley isotropic correction estimate of K[loc](r) for point 1071
## iso1070 Ripley isotropic correction estimate of K[loc](r) for point 1070
## iso1069 Ripley isotropic correction estimate of K[loc](r) for point 1069
## iso1068 Ripley isotropic correction estimate of K[loc](r) for point 1068
## iso1067 Ripley isotropic correction estimate of K[loc](r) for point 1067
## iso1066 Ripley isotropic correction estimate of K[loc](r) for point 1066
## iso1065 Ripley isotropic correction estimate of K[loc](r) for point 1065
## iso1064 Ripley isotropic correction estimate of K[loc](r) for point 1064
## iso1063 Ripley isotropic correction estimate of K[loc](r) for point 1063
## iso1062 Ripley isotropic correction estimate of K[loc](r) for point 1062
## iso1061 Ripley isotropic correction estimate of K[loc](r) for point 1061
## iso1060 Ripley isotropic correction estimate of K[loc](r) for point 1060
## iso1059 Ripley isotropic correction estimate of K[loc](r) for point 1059
## iso1058 Ripley isotropic correction estimate of K[loc](r) for point 1058
## iso1057 Ripley isotropic correction estimate of K[loc](r) for point 1057
## iso1056 Ripley isotropic correction estimate of K[loc](r) for point 1056
## iso1055 Ripley isotropic correction estimate of K[loc](r) for point 1055
## iso1054 Ripley isotropic correction estimate of K[loc](r) for point 1054
## iso1053 Ripley isotropic correction estimate of K[loc](r) for point 1053
## iso1052 Ripley isotropic correction estimate of K[loc](r) for point 1052
## iso1051 Ripley isotropic correction estimate of K[loc](r) for point 1051
## iso1050 Ripley isotropic correction estimate of K[loc](r) for point 1050
## iso1049 Ripley isotropic correction estimate of K[loc](r) for point 1049
## iso1048 Ripley isotropic correction estimate of K[loc](r) for point 1048
## iso1047 Ripley isotropic correction estimate of K[loc](r) for point 1047
## iso1046 Ripley isotropic correction estimate of K[loc](r) for point 1046
## iso1045 Ripley isotropic correction estimate of K[loc](r) for point 1045
## iso1044 Ripley isotropic correction estimate of K[loc](r) for point 1044
## iso1043 Ripley isotropic correction estimate of K[loc](r) for point 1043
## iso1042 Ripley isotropic correction estimate of K[loc](r) for point 1042
## iso1041 Ripley isotropic correction estimate of K[loc](r) for point 1041
## iso1040 Ripley isotropic correction estimate of K[loc](r) for point 1040
## iso1039 Ripley isotropic correction estimate of K[loc](r) for point 1039
## iso1038 Ripley isotropic correction estimate of K[loc](r) for point 1038
## iso1037 Ripley isotropic correction estimate of K[loc](r) for point 1037
## iso1036 Ripley isotropic correction estimate of K[loc](r) for point 1036
## iso1035 Ripley isotropic correction estimate of K[loc](r) for point 1035
## iso1034 Ripley isotropic correction estimate of K[loc](r) for point 1034
## iso1033 Ripley isotropic correction estimate of K[loc](r) for point 1033
## iso1032 Ripley isotropic correction estimate of K[loc](r) for point 1032
## iso1031 Ripley isotropic correction estimate of K[loc](r) for point 1031
## iso1030 Ripley isotropic correction estimate of K[loc](r) for point 1030
## iso1029 Ripley isotropic correction estimate of K[loc](r) for point 1029
## iso1028 Ripley isotropic correction estimate of K[loc](r) for point 1028
## iso1027 Ripley isotropic correction estimate of K[loc](r) for point 1027
## iso1026 Ripley isotropic correction estimate of K[loc](r) for point 1026
## iso1025 Ripley isotropic correction estimate of K[loc](r) for point 1025
## iso1024 Ripley isotropic correction estimate of K[loc](r) for point 1024
## iso1023 Ripley isotropic correction estimate of K[loc](r) for point 1023
## iso1022 Ripley isotropic correction estimate of K[loc](r) for point 1022
## iso1021 Ripley isotropic correction estimate of K[loc](r) for point 1021
## iso1020 Ripley isotropic correction estimate of K[loc](r) for point 1020
## iso1019 Ripley isotropic correction estimate of K[loc](r) for point 1019
## iso1018 Ripley isotropic correction estimate of K[loc](r) for point 1018
## iso1017 Ripley isotropic correction estimate of K[loc](r) for point 1017
## iso1016 Ripley isotropic correction estimate of K[loc](r) for point 1016
## iso1015 Ripley isotropic correction estimate of K[loc](r) for point 1015
## iso1014 Ripley isotropic correction estimate of K[loc](r) for point 1014
## iso1013 Ripley isotropic correction estimate of K[loc](r) for point 1013
## iso1012 Ripley isotropic correction estimate of K[loc](r) for point 1012
## iso1011 Ripley isotropic correction estimate of K[loc](r) for point 1011
## iso1010 Ripley isotropic correction estimate of K[loc](r) for point 1010
## iso1009 Ripley isotropic correction estimate of K[loc](r) for point 1009
## iso1008 Ripley isotropic correction estimate of K[loc](r) for point 1008
## iso1007 Ripley isotropic correction estimate of K[loc](r) for point 1007
## iso1006 Ripley isotropic correction estimate of K[loc](r) for point 1006
## iso1005 Ripley isotropic correction estimate of K[loc](r) for point 1005
## iso1004 Ripley isotropic correction estimate of K[loc](r) for point 1004
## iso1003 Ripley isotropic correction estimate of K[loc](r) for point 1003
## iso1002 Ripley isotropic correction estimate of K[loc](r) for point 1002
## iso1001 Ripley isotropic correction estimate of K[loc](r) for point 1001
## iso1000 Ripley isotropic correction estimate of K[loc](r) for point 1000
## iso0999 Ripley isotropic correction estimate of K[loc](r) for point 0999
## iso0998 Ripley isotropic correction estimate of K[loc](r) for point 0998
## iso0997 Ripley isotropic correction estimate of K[loc](r) for point 0997
## iso0996 Ripley isotropic correction estimate of K[loc](r) for point 0996
## iso0995 Ripley isotropic correction estimate of K[loc](r) for point 0995
## iso0994 Ripley isotropic correction estimate of K[loc](r) for point 0994
## iso0993 Ripley isotropic correction estimate of K[loc](r) for point 0993
## iso0992 Ripley isotropic correction estimate of K[loc](r) for point 0992
## iso0991 Ripley isotropic correction estimate of K[loc](r) for point 0991
## iso0990 Ripley isotropic correction estimate of K[loc](r) for point 0990
## iso0989 Ripley isotropic correction estimate of K[loc](r) for point 0989
## iso0988 Ripley isotropic correction estimate of K[loc](r) for point 0988
## iso0987 Ripley isotropic correction estimate of K[loc](r) for point 0987
## iso0986 Ripley isotropic correction estimate of K[loc](r) for point 0986
## iso0985 Ripley isotropic correction estimate of K[loc](r) for point 0985
## iso0984 Ripley isotropic correction estimate of K[loc](r) for point 0984
## iso0983 Ripley isotropic correction estimate of K[loc](r) for point 0983
## iso0982 Ripley isotropic correction estimate of K[loc](r) for point 0982
## iso0981 Ripley isotropic correction estimate of K[loc](r) for point 0981
## iso0980 Ripley isotropic correction estimate of K[loc](r) for point 0980
## iso0979 Ripley isotropic correction estimate of K[loc](r) for point 0979
## iso0978 Ripley isotropic correction estimate of K[loc](r) for point 0978
## iso0977 Ripley isotropic correction estimate of K[loc](r) for point 0977
## iso0976 Ripley isotropic correction estimate of K[loc](r) for point 0976
## iso0975 Ripley isotropic correction estimate of K[loc](r) for point 0975
## iso0974 Ripley isotropic correction estimate of K[loc](r) for point 0974
## iso0973 Ripley isotropic correction estimate of K[loc](r) for point 0973
## iso0972 Ripley isotropic correction estimate of K[loc](r) for point 0972
## iso0971 Ripley isotropic correction estimate of K[loc](r) for point 0971
## iso0970 Ripley isotropic correction estimate of K[loc](r) for point 0970
## iso0969 Ripley isotropic correction estimate of K[loc](r) for point 0969
## iso0968 Ripley isotropic correction estimate of K[loc](r) for point 0968
## iso0967 Ripley isotropic correction estimate of K[loc](r) for point 0967
## iso0966 Ripley isotropic correction estimate of K[loc](r) for point 0966
## iso0965 Ripley isotropic correction estimate of K[loc](r) for point 0965
## iso0964 Ripley isotropic correction estimate of K[loc](r) for point 0964
## iso0963 Ripley isotropic correction estimate of K[loc](r) for point 0963
## iso0962 Ripley isotropic correction estimate of K[loc](r) for point 0962
## iso0961 Ripley isotropic correction estimate of K[loc](r) for point 0961
## iso0960 Ripley isotropic correction estimate of K[loc](r) for point 0960
## iso0959 Ripley isotropic correction estimate of K[loc](r) for point 0959
## iso0958 Ripley isotropic correction estimate of K[loc](r) for point 0958
## iso0957 Ripley isotropic correction estimate of K[loc](r) for point 0957
## iso0956 Ripley isotropic correction estimate of K[loc](r) for point 0956
## iso0955 Ripley isotropic correction estimate of K[loc](r) for point 0955
## iso0954 Ripley isotropic correction estimate of K[loc](r) for point 0954
## iso0953 Ripley isotropic correction estimate of K[loc](r) for point 0953
## iso0952 Ripley isotropic correction estimate of K[loc](r) for point 0952
## iso0951 Ripley isotropic correction estimate of K[loc](r) for point 0951
## iso0950 Ripley isotropic correction estimate of K[loc](r) for point 0950
## iso0949 Ripley isotropic correction estimate of K[loc](r) for point 0949
## iso0948 Ripley isotropic correction estimate of K[loc](r) for point 0948
## iso0947 Ripley isotropic correction estimate of K[loc](r) for point 0947
## iso0946 Ripley isotropic correction estimate of K[loc](r) for point 0946
## iso0945 Ripley isotropic correction estimate of K[loc](r) for point 0945
## iso0944 Ripley isotropic correction estimate of K[loc](r) for point 0944
## iso0943 Ripley isotropic correction estimate of K[loc](r) for point 0943
## iso0942 Ripley isotropic correction estimate of K[loc](r) for point 0942
## iso0941 Ripley isotropic correction estimate of K[loc](r) for point 0941
## iso0940 Ripley isotropic correction estimate of K[loc](r) for point 0940
## iso0939 Ripley isotropic correction estimate of K[loc](r) for point 0939
## iso0938 Ripley isotropic correction estimate of K[loc](r) for point 0938
## iso0937 Ripley isotropic correction estimate of K[loc](r) for point 0937
## iso0936 Ripley isotropic correction estimate of K[loc](r) for point 0936
## iso0935 Ripley isotropic correction estimate of K[loc](r) for point 0935
## iso0934 Ripley isotropic correction estimate of K[loc](r) for point 0934
## iso0933 Ripley isotropic correction estimate of K[loc](r) for point 0933
## iso0932 Ripley isotropic correction estimate of K[loc](r) for point 0932
## iso0931 Ripley isotropic correction estimate of K[loc](r) for point 0931
## iso0930 Ripley isotropic correction estimate of K[loc](r) for point 0930
## iso0929 Ripley isotropic correction estimate of K[loc](r) for point 0929
## iso0928 Ripley isotropic correction estimate of K[loc](r) for point 0928
## iso0927 Ripley isotropic correction estimate of K[loc](r) for point 0927
## iso0926 Ripley isotropic correction estimate of K[loc](r) for point 0926
## iso0925 Ripley isotropic correction estimate of K[loc](r) for point 0925
## iso0924 Ripley isotropic correction estimate of K[loc](r) for point 0924
## iso0923 Ripley isotropic correction estimate of K[loc](r) for point 0923
## iso0922 Ripley isotropic correction estimate of K[loc](r) for point 0922
## iso0921 Ripley isotropic correction estimate of K[loc](r) for point 0921
## iso0920 Ripley isotropic correction estimate of K[loc](r) for point 0920
## iso0919 Ripley isotropic correction estimate of K[loc](r) for point 0919
## iso0918 Ripley isotropic correction estimate of K[loc](r) for point 0918
## iso0917 Ripley isotropic correction estimate of K[loc](r) for point 0917
## iso0916 Ripley isotropic correction estimate of K[loc](r) for point 0916
## iso0915 Ripley isotropic correction estimate of K[loc](r) for point 0915
## iso0914 Ripley isotropic correction estimate of K[loc](r) for point 0914
## iso0913 Ripley isotropic correction estimate of K[loc](r) for point 0913
## iso0912 Ripley isotropic correction estimate of K[loc](r) for point 0912
## iso0911 Ripley isotropic correction estimate of K[loc](r) for point 0911
## iso0910 Ripley isotropic correction estimate of K[loc](r) for point 0910
## iso0909 Ripley isotropic correction estimate of K[loc](r) for point 0909
## iso0908 Ripley isotropic correction estimate of K[loc](r) for point 0908
## iso0907 Ripley isotropic correction estimate of K[loc](r) for point 0907
## iso0906 Ripley isotropic correction estimate of K[loc](r) for point 0906
## iso0905 Ripley isotropic correction estimate of K[loc](r) for point 0905
## iso0904 Ripley isotropic correction estimate of K[loc](r) for point 0904
## iso0903 Ripley isotropic correction estimate of K[loc](r) for point 0903
## iso0902 Ripley isotropic correction estimate of K[loc](r) for point 0902
## iso0901 Ripley isotropic correction estimate of K[loc](r) for point 0901
## iso0900 Ripley isotropic correction estimate of K[loc](r) for point 0900
## iso0899 Ripley isotropic correction estimate of K[loc](r) for point 0899
## iso0898 Ripley isotropic correction estimate of K[loc](r) for point 0898
## iso0897 Ripley isotropic correction estimate of K[loc](r) for point 0897
## iso0896 Ripley isotropic correction estimate of K[loc](r) for point 0896
## iso0895 Ripley isotropic correction estimate of K[loc](r) for point 0895
## iso0894 Ripley isotropic correction estimate of K[loc](r) for point 0894
## iso0893 Ripley isotropic correction estimate of K[loc](r) for point 0893
## iso0892 Ripley isotropic correction estimate of K[loc](r) for point 0892
## iso0891 Ripley isotropic correction estimate of K[loc](r) for point 0891
## iso0890 Ripley isotropic correction estimate of K[loc](r) for point 0890
## iso0889 Ripley isotropic correction estimate of K[loc](r) for point 0889
## iso0888 Ripley isotropic correction estimate of K[loc](r) for point 0888
## iso0887 Ripley isotropic correction estimate of K[loc](r) for point 0887
## iso0886 Ripley isotropic correction estimate of K[loc](r) for point 0886
## iso0885 Ripley isotropic correction estimate of K[loc](r) for point 0885
## iso0884 Ripley isotropic correction estimate of K[loc](r) for point 0884
## iso0883 Ripley isotropic correction estimate of K[loc](r) for point 0883
## iso0882 Ripley isotropic correction estimate of K[loc](r) for point 0882
## iso0881 Ripley isotropic correction estimate of K[loc](r) for point 0881
## iso0880 Ripley isotropic correction estimate of K[loc](r) for point 0880
## iso0879 Ripley isotropic correction estimate of K[loc](r) for point 0879
## iso0878 Ripley isotropic correction estimate of K[loc](r) for point 0878
## iso0877 Ripley isotropic correction estimate of K[loc](r) for point 0877
## iso0876 Ripley isotropic correction estimate of K[loc](r) for point 0876
## iso0875 Ripley isotropic correction estimate of K[loc](r) for point 0875
## iso0874 Ripley isotropic correction estimate of K[loc](r) for point 0874
## iso0873 Ripley isotropic correction estimate of K[loc](r) for point 0873
## iso0872 Ripley isotropic correction estimate of K[loc](r) for point 0872
## iso0871 Ripley isotropic correction estimate of K[loc](r) for point 0871
## iso0870 Ripley isotropic correction estimate of K[loc](r) for point 0870
## iso0869 Ripley isotropic correction estimate of K[loc](r) for point 0869
## iso0868 Ripley isotropic correction estimate of K[loc](r) for point 0868
## iso0867 Ripley isotropic correction estimate of K[loc](r) for point 0867
## iso0866 Ripley isotropic correction estimate of K[loc](r) for point 0866
## iso0865 Ripley isotropic correction estimate of K[loc](r) for point 0865
## iso0864 Ripley isotropic correction estimate of K[loc](r) for point 0864
## iso0863 Ripley isotropic correction estimate of K[loc](r) for point 0863
## iso0862 Ripley isotropic correction estimate of K[loc](r) for point 0862
## iso0861 Ripley isotropic correction estimate of K[loc](r) for point 0861
## iso0860 Ripley isotropic correction estimate of K[loc](r) for point 0860
## iso0859 Ripley isotropic correction estimate of K[loc](r) for point 0859
## iso0858 Ripley isotropic correction estimate of K[loc](r) for point 0858
## iso0857 Ripley isotropic correction estimate of K[loc](r) for point 0857
## iso0856 Ripley isotropic correction estimate of K[loc](r) for point 0856
## iso0855 Ripley isotropic correction estimate of K[loc](r) for point 0855
## iso0854 Ripley isotropic correction estimate of K[loc](r) for point 0854
## iso0853 Ripley isotropic correction estimate of K[loc](r) for point 0853
## iso0852 Ripley isotropic correction estimate of K[loc](r) for point 0852
## iso0851 Ripley isotropic correction estimate of K[loc](r) for point 0851
## iso0850 Ripley isotropic correction estimate of K[loc](r) for point 0850
## iso0849 Ripley isotropic correction estimate of K[loc](r) for point 0849
## iso0848 Ripley isotropic correction estimate of K[loc](r) for point 0848
## iso0847 Ripley isotropic correction estimate of K[loc](r) for point 0847
## iso0846 Ripley isotropic correction estimate of K[loc](r) for point 0846
## iso0845 Ripley isotropic correction estimate of K[loc](r) for point 0845
## iso0844 Ripley isotropic correction estimate of K[loc](r) for point 0844
## iso0843 Ripley isotropic correction estimate of K[loc](r) for point 0843
## iso0842 Ripley isotropic correction estimate of K[loc](r) for point 0842
## iso0841 Ripley isotropic correction estimate of K[loc](r) for point 0841
## iso0840 Ripley isotropic correction estimate of K[loc](r) for point 0840
## iso0839 Ripley isotropic correction estimate of K[loc](r) for point 0839
## iso0838 Ripley isotropic correction estimate of K[loc](r) for point 0838
## iso0837 Ripley isotropic correction estimate of K[loc](r) for point 0837
## iso0836 Ripley isotropic correction estimate of K[loc](r) for point 0836
## iso0835 Ripley isotropic correction estimate of K[loc](r) for point 0835
## iso0834 Ripley isotropic correction estimate of K[loc](r) for point 0834
## iso0833 Ripley isotropic correction estimate of K[loc](r) for point 0833
## iso0832 Ripley isotropic correction estimate of K[loc](r) for point 0832
## iso0831 Ripley isotropic correction estimate of K[loc](r) for point 0831
## iso0830 Ripley isotropic correction estimate of K[loc](r) for point 0830
## iso0829 Ripley isotropic correction estimate of K[loc](r) for point 0829
## iso0828 Ripley isotropic correction estimate of K[loc](r) for point 0828
## iso0827 Ripley isotropic correction estimate of K[loc](r) for point 0827
## iso0826 Ripley isotropic correction estimate of K[loc](r) for point 0826
## iso0825 Ripley isotropic correction estimate of K[loc](r) for point 0825
## iso0824 Ripley isotropic correction estimate of K[loc](r) for point 0824
## iso0823 Ripley isotropic correction estimate of K[loc](r) for point 0823
## iso0822 Ripley isotropic correction estimate of K[loc](r) for point 0822
## iso0821 Ripley isotropic correction estimate of K[loc](r) for point 0821
## iso0820 Ripley isotropic correction estimate of K[loc](r) for point 0820
## iso0819 Ripley isotropic correction estimate of K[loc](r) for point 0819
## iso0818 Ripley isotropic correction estimate of K[loc](r) for point 0818
## iso0817 Ripley isotropic correction estimate of K[loc](r) for point 0817
## iso0816 Ripley isotropic correction estimate of K[loc](r) for point 0816
## iso0815 Ripley isotropic correction estimate of K[loc](r) for point 0815
## iso0814 Ripley isotropic correction estimate of K[loc](r) for point 0814
## iso0813 Ripley isotropic correction estimate of K[loc](r) for point 0813
## iso0812 Ripley isotropic correction estimate of K[loc](r) for point 0812
## iso0811 Ripley isotropic correction estimate of K[loc](r) for point 0811
## iso0810 Ripley isotropic correction estimate of K[loc](r) for point 0810
## iso0809 Ripley isotropic correction estimate of K[loc](r) for point 0809
## iso0808 Ripley isotropic correction estimate of K[loc](r) for point 0808
## iso0807 Ripley isotropic correction estimate of K[loc](r) for point 0807
## iso0806 Ripley isotropic correction estimate of K[loc](r) for point 0806
## iso0805 Ripley isotropic correction estimate of K[loc](r) for point 0805
## iso0804 Ripley isotropic correction estimate of K[loc](r) for point 0804
## iso0803 Ripley isotropic correction estimate of K[loc](r) for point 0803
## iso0802 Ripley isotropic correction estimate of K[loc](r) for point 0802
## iso0801 Ripley isotropic correction estimate of K[loc](r) for point 0801
## iso0800 Ripley isotropic correction estimate of K[loc](r) for point 0800
## iso0799 Ripley isotropic correction estimate of K[loc](r) for point 0799
## iso0798 Ripley isotropic correction estimate of K[loc](r) for point 0798
## iso0797 Ripley isotropic correction estimate of K[loc](r) for point 0797
## iso0796 Ripley isotropic correction estimate of K[loc](r) for point 0796
## iso0795 Ripley isotropic correction estimate of K[loc](r) for point 0795
## iso0794 Ripley isotropic correction estimate of K[loc](r) for point 0794
## iso0793 Ripley isotropic correction estimate of K[loc](r) for point 0793
## iso0792 Ripley isotropic correction estimate of K[loc](r) for point 0792
## iso0791 Ripley isotropic correction estimate of K[loc](r) for point 0791
## iso0790 Ripley isotropic correction estimate of K[loc](r) for point 0790
## iso0789 Ripley isotropic correction estimate of K[loc](r) for point 0789
## iso0788 Ripley isotropic correction estimate of K[loc](r) for point 0788
## iso0787 Ripley isotropic correction estimate of K[loc](r) for point 0787
## iso0786 Ripley isotropic correction estimate of K[loc](r) for point 0786
## iso0785 Ripley isotropic correction estimate of K[loc](r) for point 0785
## iso0784 Ripley isotropic correction estimate of K[loc](r) for point 0784
## iso0783 Ripley isotropic correction estimate of K[loc](r) for point 0783
## iso0782 Ripley isotropic correction estimate of K[loc](r) for point 0782
## iso0781 Ripley isotropic correction estimate of K[loc](r) for point 0781
## iso0780 Ripley isotropic correction estimate of K[loc](r) for point 0780
## iso0779 Ripley isotropic correction estimate of K[loc](r) for point 0779
## iso0778 Ripley isotropic correction estimate of K[loc](r) for point 0778
## iso0777 Ripley isotropic correction estimate of K[loc](r) for point 0777
## iso0776 Ripley isotropic correction estimate of K[loc](r) for point 0776
## iso0775 Ripley isotropic correction estimate of K[loc](r) for point 0775
## iso0774 Ripley isotropic correction estimate of K[loc](r) for point 0774
## iso0773 Ripley isotropic correction estimate of K[loc](r) for point 0773
## iso0772 Ripley isotropic correction estimate of K[loc](r) for point 0772
## iso0771 Ripley isotropic correction estimate of K[loc](r) for point 0771
## iso0770 Ripley isotropic correction estimate of K[loc](r) for point 0770
## iso0769 Ripley isotropic correction estimate of K[loc](r) for point 0769
## iso0768 Ripley isotropic correction estimate of K[loc](r) for point 0768
## iso0767 Ripley isotropic correction estimate of K[loc](r) for point 0767
## iso0766 Ripley isotropic correction estimate of K[loc](r) for point 0766
## iso0765 Ripley isotropic correction estimate of K[loc](r) for point 0765
## iso0764 Ripley isotropic correction estimate of K[loc](r) for point 0764
## iso0763 Ripley isotropic correction estimate of K[loc](r) for point 0763
## iso0762 Ripley isotropic correction estimate of K[loc](r) for point 0762
## iso0761 Ripley isotropic correction estimate of K[loc](r) for point 0761
## iso0760 Ripley isotropic correction estimate of K[loc](r) for point 0760
## iso0759 Ripley isotropic correction estimate of K[loc](r) for point 0759
## iso0758 Ripley isotropic correction estimate of K[loc](r) for point 0758
## iso0757 Ripley isotropic correction estimate of K[loc](r) for point 0757
## iso0756 Ripley isotropic correction estimate of K[loc](r) for point 0756
## iso0755 Ripley isotropic correction estimate of K[loc](r) for point 0755
## iso0754 Ripley isotropic correction estimate of K[loc](r) for point 0754
## iso0753 Ripley isotropic correction estimate of K[loc](r) for point 0753
## iso0752 Ripley isotropic correction estimate of K[loc](r) for point 0752
## iso0751 Ripley isotropic correction estimate of K[loc](r) for point 0751
## iso0750 Ripley isotropic correction estimate of K[loc](r) for point 0750
## iso0749 Ripley isotropic correction estimate of K[loc](r) for point 0749
## iso0748 Ripley isotropic correction estimate of K[loc](r) for point 0748
## iso0747 Ripley isotropic correction estimate of K[loc](r) for point 0747
## iso0746 Ripley isotropic correction estimate of K[loc](r) for point 0746
## iso0745 Ripley isotropic correction estimate of K[loc](r) for point 0745
## iso0744 Ripley isotropic correction estimate of K[loc](r) for point 0744
## iso0743 Ripley isotropic correction estimate of K[loc](r) for point 0743
## iso0742 Ripley isotropic correction estimate of K[loc](r) for point 0742
## iso0741 Ripley isotropic correction estimate of K[loc](r) for point 0741
## iso0740 Ripley isotropic correction estimate of K[loc](r) for point 0740
## iso0739 Ripley isotropic correction estimate of K[loc](r) for point 0739
## iso0738 Ripley isotropic correction estimate of K[loc](r) for point 0738
## iso0737 Ripley isotropic correction estimate of K[loc](r) for point 0737
## iso0736 Ripley isotropic correction estimate of K[loc](r) for point 0736
## iso0735 Ripley isotropic correction estimate of K[loc](r) for point 0735
## iso0734 Ripley isotropic correction estimate of K[loc](r) for point 0734
## iso0733 Ripley isotropic correction estimate of K[loc](r) for point 0733
## iso0732 Ripley isotropic correction estimate of K[loc](r) for point 0732
## iso0731 Ripley isotropic correction estimate of K[loc](r) for point 0731
## iso0730 Ripley isotropic correction estimate of K[loc](r) for point 0730
## iso0729 Ripley isotropic correction estimate of K[loc](r) for point 0729
## iso0728 Ripley isotropic correction estimate of K[loc](r) for point 0728
## iso0727 Ripley isotropic correction estimate of K[loc](r) for point 0727
## iso0726 Ripley isotropic correction estimate of K[loc](r) for point 0726
## iso0725 Ripley isotropic correction estimate of K[loc](r) for point 0725
## iso0724 Ripley isotropic correction estimate of K[loc](r) for point 0724
## iso0723 Ripley isotropic correction estimate of K[loc](r) for point 0723
## iso0722 Ripley isotropic correction estimate of K[loc](r) for point 0722
## iso0721 Ripley isotropic correction estimate of K[loc](r) for point 0721
## iso0720 Ripley isotropic correction estimate of K[loc](r) for point 0720
## iso0719 Ripley isotropic correction estimate of K[loc](r) for point 0719
## iso0718 Ripley isotropic correction estimate of K[loc](r) for point 0718
## iso0717 Ripley isotropic correction estimate of K[loc](r) for point 0717
## iso0716 Ripley isotropic correction estimate of K[loc](r) for point 0716
## iso0715 Ripley isotropic correction estimate of K[loc](r) for point 0715
## iso0714 Ripley isotropic correction estimate of K[loc](r) for point 0714
## iso0713 Ripley isotropic correction estimate of K[loc](r) for point 0713
## iso0712 Ripley isotropic correction estimate of K[loc](r) for point 0712
## iso0711 Ripley isotropic correction estimate of K[loc](r) for point 0711
## iso0710 Ripley isotropic correction estimate of K[loc](r) for point 0710
## iso0709 Ripley isotropic correction estimate of K[loc](r) for point 0709
## iso0708 Ripley isotropic correction estimate of K[loc](r) for point 0708
## iso0707 Ripley isotropic correction estimate of K[loc](r) for point 0707
## iso0706 Ripley isotropic correction estimate of K[loc](r) for point 0706
## iso0705 Ripley isotropic correction estimate of K[loc](r) for point 0705
## iso0704 Ripley isotropic correction estimate of K[loc](r) for point 0704
## iso0703 Ripley isotropic correction estimate of K[loc](r) for point 0703
## iso0702 Ripley isotropic correction estimate of K[loc](r) for point 0702
## iso0701 Ripley isotropic correction estimate of K[loc](r) for point 0701
## iso0700 Ripley isotropic correction estimate of K[loc](r) for point 0700
## iso0699 Ripley isotropic correction estimate of K[loc](r) for point 0699
## iso0698 Ripley isotropic correction estimate of K[loc](r) for point 0698
## iso0697 Ripley isotropic correction estimate of K[loc](r) for point 0697
## iso0696 Ripley isotropic correction estimate of K[loc](r) for point 0696
## iso0695 Ripley isotropic correction estimate of K[loc](r) for point 0695
## iso0694 Ripley isotropic correction estimate of K[loc](r) for point 0694
## iso0693 Ripley isotropic correction estimate of K[loc](r) for point 0693
## iso0692 Ripley isotropic correction estimate of K[loc](r) for point 0692
## iso0691 Ripley isotropic correction estimate of K[loc](r) for point 0691
## iso0690 Ripley isotropic correction estimate of K[loc](r) for point 0690
## iso0689 Ripley isotropic correction estimate of K[loc](r) for point 0689
## iso0688 Ripley isotropic correction estimate of K[loc](r) for point 0688
## iso0687 Ripley isotropic correction estimate of K[loc](r) for point 0687
## iso0686 Ripley isotropic correction estimate of K[loc](r) for point 0686
## iso0685 Ripley isotropic correction estimate of K[loc](r) for point 0685
## iso0684 Ripley isotropic correction estimate of K[loc](r) for point 0684
## iso0683 Ripley isotropic correction estimate of K[loc](r) for point 0683
## iso0682 Ripley isotropic correction estimate of K[loc](r) for point 0682
## iso0681 Ripley isotropic correction estimate of K[loc](r) for point 0681
## iso0680 Ripley isotropic correction estimate of K[loc](r) for point 0680
## iso0679 Ripley isotropic correction estimate of K[loc](r) for point 0679
## iso0678 Ripley isotropic correction estimate of K[loc](r) for point 0678
## iso0677 Ripley isotropic correction estimate of K[loc](r) for point 0677
## iso0676 Ripley isotropic correction estimate of K[loc](r) for point 0676
## iso0675 Ripley isotropic correction estimate of K[loc](r) for point 0675
## iso0674 Ripley isotropic correction estimate of K[loc](r) for point 0674
## iso0673 Ripley isotropic correction estimate of K[loc](r) for point 0673
## iso0672 Ripley isotropic correction estimate of K[loc](r) for point 0672
## iso0671 Ripley isotropic correction estimate of K[loc](r) for point 0671
## iso0670 Ripley isotropic correction estimate of K[loc](r) for point 0670
## iso0669 Ripley isotropic correction estimate of K[loc](r) for point 0669
## iso0668 Ripley isotropic correction estimate of K[loc](r) for point 0668
## iso0667 Ripley isotropic correction estimate of K[loc](r) for point 0667
## iso0666 Ripley isotropic correction estimate of K[loc](r) for point 0666
## iso0665 Ripley isotropic correction estimate of K[loc](r) for point 0665
## iso0664 Ripley isotropic correction estimate of K[loc](r) for point 0664
## iso0663 Ripley isotropic correction estimate of K[loc](r) for point 0663
## iso0662 Ripley isotropic correction estimate of K[loc](r) for point 0662
## iso0661 Ripley isotropic correction estimate of K[loc](r) for point 0661
## iso0660 Ripley isotropic correction estimate of K[loc](r) for point 0660
## iso0659 Ripley isotropic correction estimate of K[loc](r) for point 0659
## iso0658 Ripley isotropic correction estimate of K[loc](r) for point 0658
## iso0657 Ripley isotropic correction estimate of K[loc](r) for point 0657
## iso0656 Ripley isotropic correction estimate of K[loc](r) for point 0656
## iso0655 Ripley isotropic correction estimate of K[loc](r) for point 0655
## iso0654 Ripley isotropic correction estimate of K[loc](r) for point 0654
## iso0653 Ripley isotropic correction estimate of K[loc](r) for point 0653
## iso0652 Ripley isotropic correction estimate of K[loc](r) for point 0652
## iso0651 Ripley isotropic correction estimate of K[loc](r) for point 0651
## iso0650 Ripley isotropic correction estimate of K[loc](r) for point 0650
## iso0649 Ripley isotropic correction estimate of K[loc](r) for point 0649
## iso0648 Ripley isotropic correction estimate of K[loc](r) for point 0648
## iso0647 Ripley isotropic correction estimate of K[loc](r) for point 0647
## iso0646 Ripley isotropic correction estimate of K[loc](r) for point 0646
## iso0645 Ripley isotropic correction estimate of K[loc](r) for point 0645
## iso0644 Ripley isotropic correction estimate of K[loc](r) for point 0644
## iso0643 Ripley isotropic correction estimate of K[loc](r) for point 0643
## iso0642 Ripley isotropic correction estimate of K[loc](r) for point 0642
## iso0641 Ripley isotropic correction estimate of K[loc](r) for point 0641
## iso0640 Ripley isotropic correction estimate of K[loc](r) for point 0640
## iso0639 Ripley isotropic correction estimate of K[loc](r) for point 0639
## iso0638 Ripley isotropic correction estimate of K[loc](r) for point 0638
## iso0637 Ripley isotropic correction estimate of K[loc](r) for point 0637
## iso0636 Ripley isotropic correction estimate of K[loc](r) for point 0636
## iso0635 Ripley isotropic correction estimate of K[loc](r) for point 0635
## iso0634 Ripley isotropic correction estimate of K[loc](r) for point 0634
## iso0633 Ripley isotropic correction estimate of K[loc](r) for point 0633
## iso0632 Ripley isotropic correction estimate of K[loc](r) for point 0632
## iso0631 Ripley isotropic correction estimate of K[loc](r) for point 0631
## iso0630 Ripley isotropic correction estimate of K[loc](r) for point 0630
## iso0629 Ripley isotropic correction estimate of K[loc](r) for point 0629
## iso0628 Ripley isotropic correction estimate of K[loc](r) for point 0628
## iso0627 Ripley isotropic correction estimate of K[loc](r) for point 0627
## iso0626 Ripley isotropic correction estimate of K[loc](r) for point 0626
## iso0625 Ripley isotropic correction estimate of K[loc](r) for point 0625
## iso0624 Ripley isotropic correction estimate of K[loc](r) for point 0624
## iso0623 Ripley isotropic correction estimate of K[loc](r) for point 0623
## iso0622 Ripley isotropic correction estimate of K[loc](r) for point 0622
## iso0621 Ripley isotropic correction estimate of K[loc](r) for point 0621
## iso0620 Ripley isotropic correction estimate of K[loc](r) for point 0620
## iso0619 Ripley isotropic correction estimate of K[loc](r) for point 0619
## iso0618 Ripley isotropic correction estimate of K[loc](r) for point 0618
## iso0617 Ripley isotropic correction estimate of K[loc](r) for point 0617
## iso0616 Ripley isotropic correction estimate of K[loc](r) for point 0616
## iso0615 Ripley isotropic correction estimate of K[loc](r) for point 0615
## iso0614 Ripley isotropic correction estimate of K[loc](r) for point 0614
## iso0613 Ripley isotropic correction estimate of K[loc](r) for point 0613
## iso0612 Ripley isotropic correction estimate of K[loc](r) for point 0612
## iso0611 Ripley isotropic correction estimate of K[loc](r) for point 0611
## iso0610 Ripley isotropic correction estimate of K[loc](r) for point 0610
## iso0609 Ripley isotropic correction estimate of K[loc](r) for point 0609
## iso0608 Ripley isotropic correction estimate of K[loc](r) for point 0608
## iso0607 Ripley isotropic correction estimate of K[loc](r) for point 0607
## iso0606 Ripley isotropic correction estimate of K[loc](r) for point 0606
## iso0605 Ripley isotropic correction estimate of K[loc](r) for point 0605
## iso0604 Ripley isotropic correction estimate of K[loc](r) for point 0604
## iso0603 Ripley isotropic correction estimate of K[loc](r) for point 0603
## iso0602 Ripley isotropic correction estimate of K[loc](r) for point 0602
## iso0601 Ripley isotropic correction estimate of K[loc](r) for point 0601
## iso0600 Ripley isotropic correction estimate of K[loc](r) for point 0600
## iso0599 Ripley isotropic correction estimate of K[loc](r) for point 0599
## iso0598 Ripley isotropic correction estimate of K[loc](r) for point 0598
## iso0597 Ripley isotropic correction estimate of K[loc](r) for point 0597
## iso0596 Ripley isotropic correction estimate of K[loc](r) for point 0596
## iso0595 Ripley isotropic correction estimate of K[loc](r) for point 0595
## iso0594 Ripley isotropic correction estimate of K[loc](r) for point 0594
## iso0593 Ripley isotropic correction estimate of K[loc](r) for point 0593
## iso0592 Ripley isotropic correction estimate of K[loc](r) for point 0592
## iso0591 Ripley isotropic correction estimate of K[loc](r) for point 0591
## iso0590 Ripley isotropic correction estimate of K[loc](r) for point 0590
## iso0589 Ripley isotropic correction estimate of K[loc](r) for point 0589
## iso0588 Ripley isotropic correction estimate of K[loc](r) for point 0588
## iso0587 Ripley isotropic correction estimate of K[loc](r) for point 0587
## iso0586 Ripley isotropic correction estimate of K[loc](r) for point 0586
## iso0585 Ripley isotropic correction estimate of K[loc](r) for point 0585
## iso0584 Ripley isotropic correction estimate of K[loc](r) for point 0584
## iso0583 Ripley isotropic correction estimate of K[loc](r) for point 0583
## iso0582 Ripley isotropic correction estimate of K[loc](r) for point 0582
## iso0581 Ripley isotropic correction estimate of K[loc](r) for point 0581
## iso0580 Ripley isotropic correction estimate of K[loc](r) for point 0580
## iso0579 Ripley isotropic correction estimate of K[loc](r) for point 0579
## iso0578 Ripley isotropic correction estimate of K[loc](r) for point 0578
## iso0577 Ripley isotropic correction estimate of K[loc](r) for point 0577
## iso0576 Ripley isotropic correction estimate of K[loc](r) for point 0576
## iso0575 Ripley isotropic correction estimate of K[loc](r) for point 0575
## iso0574 Ripley isotropic correction estimate of K[loc](r) for point 0574
## iso0573 Ripley isotropic correction estimate of K[loc](r) for point 0573
## iso0572 Ripley isotropic correction estimate of K[loc](r) for point 0572
## iso0571 Ripley isotropic correction estimate of K[loc](r) for point 0571
## iso0570 Ripley isotropic correction estimate of K[loc](r) for point 0570
## iso0569 Ripley isotropic correction estimate of K[loc](r) for point 0569
## iso0568 Ripley isotropic correction estimate of K[loc](r) for point 0568
## iso0567 Ripley isotropic correction estimate of K[loc](r) for point 0567
## iso0566 Ripley isotropic correction estimate of K[loc](r) for point 0566
## iso0565 Ripley isotropic correction estimate of K[loc](r) for point 0565
## iso0564 Ripley isotropic correction estimate of K[loc](r) for point 0564
## iso0563 Ripley isotropic correction estimate of K[loc](r) for point 0563
## iso0562 Ripley isotropic correction estimate of K[loc](r) for point 0562
## iso0561 Ripley isotropic correction estimate of K[loc](r) for point 0561
## iso0560 Ripley isotropic correction estimate of K[loc](r) for point 0560
## iso0559 Ripley isotropic correction estimate of K[loc](r) for point 0559
## iso0558 Ripley isotropic correction estimate of K[loc](r) for point 0558
## iso0557 Ripley isotropic correction estimate of K[loc](r) for point 0557
## iso0556 Ripley isotropic correction estimate of K[loc](r) for point 0556
## iso0555 Ripley isotropic correction estimate of K[loc](r) for point 0555
## iso0554 Ripley isotropic correction estimate of K[loc](r) for point 0554
## iso0553 Ripley isotropic correction estimate of K[loc](r) for point 0553
## iso0552 Ripley isotropic correction estimate of K[loc](r) for point 0552
## iso0551 Ripley isotropic correction estimate of K[loc](r) for point 0551
## iso0550 Ripley isotropic correction estimate of K[loc](r) for point 0550
## iso0549 Ripley isotropic correction estimate of K[loc](r) for point 0549
## iso0548 Ripley isotropic correction estimate of K[loc](r) for point 0548
## iso0547 Ripley isotropic correction estimate of K[loc](r) for point 0547
## iso0546 Ripley isotropic correction estimate of K[loc](r) for point 0546
## iso0545 Ripley isotropic correction estimate of K[loc](r) for point 0545
## iso0544 Ripley isotropic correction estimate of K[loc](r) for point 0544
## iso0543 Ripley isotropic correction estimate of K[loc](r) for point 0543
## iso0542 Ripley isotropic correction estimate of K[loc](r) for point 0542
## iso0541 Ripley isotropic correction estimate of K[loc](r) for point 0541
## iso0540 Ripley isotropic correction estimate of K[loc](r) for point 0540
## iso0539 Ripley isotropic correction estimate of K[loc](r) for point 0539
## iso0538 Ripley isotropic correction estimate of K[loc](r) for point 0538
## iso0537 Ripley isotropic correction estimate of K[loc](r) for point 0537
## iso0536 Ripley isotropic correction estimate of K[loc](r) for point 0536
## iso0535 Ripley isotropic correction estimate of K[loc](r) for point 0535
## iso0534 Ripley isotropic correction estimate of K[loc](r) for point 0534
## iso0533 Ripley isotropic correction estimate of K[loc](r) for point 0533
## iso0532 Ripley isotropic correction estimate of K[loc](r) for point 0532
## iso0531 Ripley isotropic correction estimate of K[loc](r) for point 0531
## iso0530 Ripley isotropic correction estimate of K[loc](r) for point 0530
## iso0529 Ripley isotropic correction estimate of K[loc](r) for point 0529
## iso0528 Ripley isotropic correction estimate of K[loc](r) for point 0528
## iso0527 Ripley isotropic correction estimate of K[loc](r) for point 0527
## iso0526 Ripley isotropic correction estimate of K[loc](r) for point 0526
## iso0525 Ripley isotropic correction estimate of K[loc](r) for point 0525
## iso0524 Ripley isotropic correction estimate of K[loc](r) for point 0524
## iso0523 Ripley isotropic correction estimate of K[loc](r) for point 0523
## iso0522 Ripley isotropic correction estimate of K[loc](r) for point 0522
## iso0521 Ripley isotropic correction estimate of K[loc](r) for point 0521
## iso0520 Ripley isotropic correction estimate of K[loc](r) for point 0520
## iso0519 Ripley isotropic correction estimate of K[loc](r) for point 0519
## iso0518 Ripley isotropic correction estimate of K[loc](r) for point 0518
## iso0517 Ripley isotropic correction estimate of K[loc](r) for point 0517
## iso0516 Ripley isotropic correction estimate of K[loc](r) for point 0516
## iso0515 Ripley isotropic correction estimate of K[loc](r) for point 0515
## iso0514 Ripley isotropic correction estimate of K[loc](r) for point 0514
## iso0513 Ripley isotropic correction estimate of K[loc](r) for point 0513
## iso0512 Ripley isotropic correction estimate of K[loc](r) for point 0512
## iso0511 Ripley isotropic correction estimate of K[loc](r) for point 0511
## iso0510 Ripley isotropic correction estimate of K[loc](r) for point 0510
## iso0509 Ripley isotropic correction estimate of K[loc](r) for point 0509
## iso0508 Ripley isotropic correction estimate of K[loc](r) for point 0508
## iso0507 Ripley isotropic correction estimate of K[loc](r) for point 0507
## iso0506 Ripley isotropic correction estimate of K[loc](r) for point 0506
## iso0505 Ripley isotropic correction estimate of K[loc](r) for point 0505
## iso0504 Ripley isotropic correction estimate of K[loc](r) for point 0504
## iso0503 Ripley isotropic correction estimate of K[loc](r) for point 0503
## iso0502 Ripley isotropic correction estimate of K[loc](r) for point 0502
## iso0501 Ripley isotropic correction estimate of K[loc](r) for point 0501
## iso0500 Ripley isotropic correction estimate of K[loc](r) for point 0500
## iso0499 Ripley isotropic correction estimate of K[loc](r) for point 0499
## iso0498 Ripley isotropic correction estimate of K[loc](r) for point 0498
## iso0497 Ripley isotropic correction estimate of K[loc](r) for point 0497
## iso0496 Ripley isotropic correction estimate of K[loc](r) for point 0496
## iso0495 Ripley isotropic correction estimate of K[loc](r) for point 0495
## iso0494 Ripley isotropic correction estimate of K[loc](r) for point 0494
## iso0493 Ripley isotropic correction estimate of K[loc](r) for point 0493
## iso0492 Ripley isotropic correction estimate of K[loc](r) for point 0492
## iso0491 Ripley isotropic correction estimate of K[loc](r) for point 0491
## iso0490 Ripley isotropic correction estimate of K[loc](r) for point 0490
## iso0489 Ripley isotropic correction estimate of K[loc](r) for point 0489
## iso0488 Ripley isotropic correction estimate of K[loc](r) for point 0488
## iso0487 Ripley isotropic correction estimate of K[loc](r) for point 0487
## iso0486 Ripley isotropic correction estimate of K[loc](r) for point 0486
## iso0485 Ripley isotropic correction estimate of K[loc](r) for point 0485
## iso0484 Ripley isotropic correction estimate of K[loc](r) for point 0484
## iso0483 Ripley isotropic correction estimate of K[loc](r) for point 0483
## iso0482 Ripley isotropic correction estimate of K[loc](r) for point 0482
## iso0481 Ripley isotropic correction estimate of K[loc](r) for point 0481
## iso0480 Ripley isotropic correction estimate of K[loc](r) for point 0480
## iso0479 Ripley isotropic correction estimate of K[loc](r) for point 0479
## iso0478 Ripley isotropic correction estimate of K[loc](r) for point 0478
## iso0477 Ripley isotropic correction estimate of K[loc](r) for point 0477
## iso0476 Ripley isotropic correction estimate of K[loc](r) for point 0476
## iso0475 Ripley isotropic correction estimate of K[loc](r) for point 0475
## iso0474 Ripley isotropic correction estimate of K[loc](r) for point 0474
## iso0473 Ripley isotropic correction estimate of K[loc](r) for point 0473
## iso0472 Ripley isotropic correction estimate of K[loc](r) for point 0472
## iso0471 Ripley isotropic correction estimate of K[loc](r) for point 0471
## iso0470 Ripley isotropic correction estimate of K[loc](r) for point 0470
## iso0469 Ripley isotropic correction estimate of K[loc](r) for point 0469
## iso0468 Ripley isotropic correction estimate of K[loc](r) for point 0468
## iso0467 Ripley isotropic correction estimate of K[loc](r) for point 0467
## iso0466 Ripley isotropic correction estimate of K[loc](r) for point 0466
## iso0465 Ripley isotropic correction estimate of K[loc](r) for point 0465
## iso0464 Ripley isotropic correction estimate of K[loc](r) for point 0464
## iso0463 Ripley isotropic correction estimate of K[loc](r) for point 0463
## iso0462 Ripley isotropic correction estimate of K[loc](r) for point 0462
## iso0461 Ripley isotropic correction estimate of K[loc](r) for point 0461
## iso0460 Ripley isotropic correction estimate of K[loc](r) for point 0460
## iso0459 Ripley isotropic correction estimate of K[loc](r) for point 0459
## iso0458 Ripley isotropic correction estimate of K[loc](r) for point 0458
## iso0457 Ripley isotropic correction estimate of K[loc](r) for point 0457
## iso0456 Ripley isotropic correction estimate of K[loc](r) for point 0456
## iso0455 Ripley isotropic correction estimate of K[loc](r) for point 0455
## iso0454 Ripley isotropic correction estimate of K[loc](r) for point 0454
## iso0453 Ripley isotropic correction estimate of K[loc](r) for point 0453
## iso0452 Ripley isotropic correction estimate of K[loc](r) for point 0452
## iso0451 Ripley isotropic correction estimate of K[loc](r) for point 0451
## iso0450 Ripley isotropic correction estimate of K[loc](r) for point 0450
## iso0449 Ripley isotropic correction estimate of K[loc](r) for point 0449
## iso0448 Ripley isotropic correction estimate of K[loc](r) for point 0448
## iso0447 Ripley isotropic correction estimate of K[loc](r) for point 0447
## iso0446 Ripley isotropic correction estimate of K[loc](r) for point 0446
## iso0445 Ripley isotropic correction estimate of K[loc](r) for point 0445
## iso0444 Ripley isotropic correction estimate of K[loc](r) for point 0444
## iso0443 Ripley isotropic correction estimate of K[loc](r) for point 0443
## iso0442 Ripley isotropic correction estimate of K[loc](r) for point 0442
## iso0441 Ripley isotropic correction estimate of K[loc](r) for point 0441
## iso0440 Ripley isotropic correction estimate of K[loc](r) for point 0440
## iso0439 Ripley isotropic correction estimate of K[loc](r) for point 0439
## iso0438 Ripley isotropic correction estimate of K[loc](r) for point 0438
## iso0437 Ripley isotropic correction estimate of K[loc](r) for point 0437
## iso0436 Ripley isotropic correction estimate of K[loc](r) for point 0436
## iso0435 Ripley isotropic correction estimate of K[loc](r) for point 0435
## iso0434 Ripley isotropic correction estimate of K[loc](r) for point 0434
## iso0433 Ripley isotropic correction estimate of K[loc](r) for point 0433
## iso0432 Ripley isotropic correction estimate of K[loc](r) for point 0432
## iso0431 Ripley isotropic correction estimate of K[loc](r) for point 0431
## iso0430 Ripley isotropic correction estimate of K[loc](r) for point 0430
## iso0429 Ripley isotropic correction estimate of K[loc](r) for point 0429
## iso0428 Ripley isotropic correction estimate of K[loc](r) for point 0428
## iso0427 Ripley isotropic correction estimate of K[loc](r) for point 0427
## iso0426 Ripley isotropic correction estimate of K[loc](r) for point 0426
## iso0425 Ripley isotropic correction estimate of K[loc](r) for point 0425
## iso0424 Ripley isotropic correction estimate of K[loc](r) for point 0424
## iso0423 Ripley isotropic correction estimate of K[loc](r) for point 0423
## iso0422 Ripley isotropic correction estimate of K[loc](r) for point 0422
## iso0421 Ripley isotropic correction estimate of K[loc](r) for point 0421
## iso0420 Ripley isotropic correction estimate of K[loc](r) for point 0420
## iso0419 Ripley isotropic correction estimate of K[loc](r) for point 0419
## iso0418 Ripley isotropic correction estimate of K[loc](r) for point 0418
## iso0417 Ripley isotropic correction estimate of K[loc](r) for point 0417
## iso0416 Ripley isotropic correction estimate of K[loc](r) for point 0416
## iso0415 Ripley isotropic correction estimate of K[loc](r) for point 0415
## iso0414 Ripley isotropic correction estimate of K[loc](r) for point 0414
## iso0413 Ripley isotropic correction estimate of K[loc](r) for point 0413
## iso0412 Ripley isotropic correction estimate of K[loc](r) for point 0412
## iso0411 Ripley isotropic correction estimate of K[loc](r) for point 0411
## iso0410 Ripley isotropic correction estimate of K[loc](r) for point 0410
## iso0409 Ripley isotropic correction estimate of K[loc](r) for point 0409
## iso0408 Ripley isotropic correction estimate of K[loc](r) for point 0408
## iso0407 Ripley isotropic correction estimate of K[loc](r) for point 0407
## iso0406 Ripley isotropic correction estimate of K[loc](r) for point 0406
## iso0405 Ripley isotropic correction estimate of K[loc](r) for point 0405
## iso0404 Ripley isotropic correction estimate of K[loc](r) for point 0404
## iso0403 Ripley isotropic correction estimate of K[loc](r) for point 0403
## iso0402 Ripley isotropic correction estimate of K[loc](r) for point 0402
## iso0401 Ripley isotropic correction estimate of K[loc](r) for point 0401
## iso0400 Ripley isotropic correction estimate of K[loc](r) for point 0400
## iso0399 Ripley isotropic correction estimate of K[loc](r) for point 0399
## iso0398 Ripley isotropic correction estimate of K[loc](r) for point 0398
## iso0397 Ripley isotropic correction estimate of K[loc](r) for point 0397
## iso0396 Ripley isotropic correction estimate of K[loc](r) for point 0396
## iso0395 Ripley isotropic correction estimate of K[loc](r) for point 0395
## iso0394 Ripley isotropic correction estimate of K[loc](r) for point 0394
## iso0393 Ripley isotropic correction estimate of K[loc](r) for point 0393
## iso0392 Ripley isotropic correction estimate of K[loc](r) for point 0392
## iso0391 Ripley isotropic correction estimate of K[loc](r) for point 0391
## iso0390 Ripley isotropic correction estimate of K[loc](r) for point 0390
## iso0389 Ripley isotropic correction estimate of K[loc](r) for point 0389
## iso0388 Ripley isotropic correction estimate of K[loc](r) for point 0388
## iso0387 Ripley isotropic correction estimate of K[loc](r) for point 0387
## iso0386 Ripley isotropic correction estimate of K[loc](r) for point 0386
## iso0385 Ripley isotropic correction estimate of K[loc](r) for point 0385
## iso0384 Ripley isotropic correction estimate of K[loc](r) for point 0384
## iso0383 Ripley isotropic correction estimate of K[loc](r) for point 0383
## iso0382 Ripley isotropic correction estimate of K[loc](r) for point 0382
## iso0381 Ripley isotropic correction estimate of K[loc](r) for point 0381
## iso0380 Ripley isotropic correction estimate of K[loc](r) for point 0380
## iso0379 Ripley isotropic correction estimate of K[loc](r) for point 0379
## iso0378 Ripley isotropic correction estimate of K[loc](r) for point 0378
## iso0377 Ripley isotropic correction estimate of K[loc](r) for point 0377
## iso0376 Ripley isotropic correction estimate of K[loc](r) for point 0376
## iso0375 Ripley isotropic correction estimate of K[loc](r) for point 0375
## iso0374 Ripley isotropic correction estimate of K[loc](r) for point 0374
## iso0373 Ripley isotropic correction estimate of K[loc](r) for point 0373
## iso0372 Ripley isotropic correction estimate of K[loc](r) for point 0372
## iso0371 Ripley isotropic correction estimate of K[loc](r) for point 0371
## iso0370 Ripley isotropic correction estimate of K[loc](r) for point 0370
## iso0369 Ripley isotropic correction estimate of K[loc](r) for point 0369
## iso0368 Ripley isotropic correction estimate of K[loc](r) for point 0368
## iso0367 Ripley isotropic correction estimate of K[loc](r) for point 0367
## iso0366 Ripley isotropic correction estimate of K[loc](r) for point 0366
## iso0365 Ripley isotropic correction estimate of K[loc](r) for point 0365
## iso0364 Ripley isotropic correction estimate of K[loc](r) for point 0364
## iso0363 Ripley isotropic correction estimate of K[loc](r) for point 0363
## iso0362 Ripley isotropic correction estimate of K[loc](r) for point 0362
## iso0361 Ripley isotropic correction estimate of K[loc](r) for point 0361
## iso0360 Ripley isotropic correction estimate of K[loc](r) for point 0360
## iso0359 Ripley isotropic correction estimate of K[loc](r) for point 0359
## iso0358 Ripley isotropic correction estimate of K[loc](r) for point 0358
## iso0357 Ripley isotropic correction estimate of K[loc](r) for point 0357
## iso0356 Ripley isotropic correction estimate of K[loc](r) for point 0356
## iso0355 Ripley isotropic correction estimate of K[loc](r) for point 0355
## iso0354 Ripley isotropic correction estimate of K[loc](r) for point 0354
## iso0353 Ripley isotropic correction estimate of K[loc](r) for point 0353
## iso0352 Ripley isotropic correction estimate of K[loc](r) for point 0352
## iso0351 Ripley isotropic correction estimate of K[loc](r) for point 0351
## iso0350 Ripley isotropic correction estimate of K[loc](r) for point 0350
## iso0349 Ripley isotropic correction estimate of K[loc](r) for point 0349
## iso0348 Ripley isotropic correction estimate of K[loc](r) for point 0348
## iso0347 Ripley isotropic correction estimate of K[loc](r) for point 0347
## iso0346 Ripley isotropic correction estimate of K[loc](r) for point 0346
## iso0345 Ripley isotropic correction estimate of K[loc](r) for point 0345
## iso0344 Ripley isotropic correction estimate of K[loc](r) for point 0344
## iso0343 Ripley isotropic correction estimate of K[loc](r) for point 0343
## iso0342 Ripley isotropic correction estimate of K[loc](r) for point 0342
## iso0341 Ripley isotropic correction estimate of K[loc](r) for point 0341
## iso0340 Ripley isotropic correction estimate of K[loc](r) for point 0340
## iso0339 Ripley isotropic correction estimate of K[loc](r) for point 0339
## iso0338 Ripley isotropic correction estimate of K[loc](r) for point 0338
## iso0337 Ripley isotropic correction estimate of K[loc](r) for point 0337
## iso0336 Ripley isotropic correction estimate of K[loc](r) for point 0336
## iso0335 Ripley isotropic correction estimate of K[loc](r) for point 0335
## iso0334 Ripley isotropic correction estimate of K[loc](r) for point 0334
## iso0333 Ripley isotropic correction estimate of K[loc](r) for point 0333
## iso0332 Ripley isotropic correction estimate of K[loc](r) for point 0332
## iso0331 Ripley isotropic correction estimate of K[loc](r) for point 0331
## iso0330 Ripley isotropic correction estimate of K[loc](r) for point 0330
## iso0329 Ripley isotropic correction estimate of K[loc](r) for point 0329
## iso0328 Ripley isotropic correction estimate of K[loc](r) for point 0328
## iso0327 Ripley isotropic correction estimate of K[loc](r) for point 0327
## iso0326 Ripley isotropic correction estimate of K[loc](r) for point 0326
## iso0325 Ripley isotropic correction estimate of K[loc](r) for point 0325
## iso0324 Ripley isotropic correction estimate of K[loc](r) for point 0324
## iso0323 Ripley isotropic correction estimate of K[loc](r) for point 0323
## iso0322 Ripley isotropic correction estimate of K[loc](r) for point 0322
## iso0321 Ripley isotropic correction estimate of K[loc](r) for point 0321
## iso0320 Ripley isotropic correction estimate of K[loc](r) for point 0320
## iso0319 Ripley isotropic correction estimate of K[loc](r) for point 0319
## iso0318 Ripley isotropic correction estimate of K[loc](r) for point 0318
## iso0317 Ripley isotropic correction estimate of K[loc](r) for point 0317
## iso0316 Ripley isotropic correction estimate of K[loc](r) for point 0316
## iso0315 Ripley isotropic correction estimate of K[loc](r) for point 0315
## iso0314 Ripley isotropic correction estimate of K[loc](r) for point 0314
## iso0313 Ripley isotropic correction estimate of K[loc](r) for point 0313
## iso0312 Ripley isotropic correction estimate of K[loc](r) for point 0312
## iso0311 Ripley isotropic correction estimate of K[loc](r) for point 0311
## iso0310 Ripley isotropic correction estimate of K[loc](r) for point 0310
## iso0309 Ripley isotropic correction estimate of K[loc](r) for point 0309
## iso0308 Ripley isotropic correction estimate of K[loc](r) for point 0308
## iso0307 Ripley isotropic correction estimate of K[loc](r) for point 0307
## iso0306 Ripley isotropic correction estimate of K[loc](r) for point 0306
## iso0305 Ripley isotropic correction estimate of K[loc](r) for point 0305
## iso0304 Ripley isotropic correction estimate of K[loc](r) for point 0304
## iso0303 Ripley isotropic correction estimate of K[loc](r) for point 0303
## iso0302 Ripley isotropic correction estimate of K[loc](r) for point 0302
## iso0301 Ripley isotropic correction estimate of K[loc](r) for point 0301
## iso0300 Ripley isotropic correction estimate of K[loc](r) for point 0300
## iso0299 Ripley isotropic correction estimate of K[loc](r) for point 0299
## iso0298 Ripley isotropic correction estimate of K[loc](r) for point 0298
## iso0297 Ripley isotropic correction estimate of K[loc](r) for point 0297
## iso0296 Ripley isotropic correction estimate of K[loc](r) for point 0296
## iso0295 Ripley isotropic correction estimate of K[loc](r) for point 0295
## iso0294 Ripley isotropic correction estimate of K[loc](r) for point 0294
## iso0293 Ripley isotropic correction estimate of K[loc](r) for point 0293
## iso0292 Ripley isotropic correction estimate of K[loc](r) for point 0292
## iso0291 Ripley isotropic correction estimate of K[loc](r) for point 0291
## iso0290 Ripley isotropic correction estimate of K[loc](r) for point 0290
## iso0289 Ripley isotropic correction estimate of K[loc](r) for point 0289
## iso0288 Ripley isotropic correction estimate of K[loc](r) for point 0288
## iso0287 Ripley isotropic correction estimate of K[loc](r) for point 0287
## iso0286 Ripley isotropic correction estimate of K[loc](r) for point 0286
## iso0285 Ripley isotropic correction estimate of K[loc](r) for point 0285
## iso0284 Ripley isotropic correction estimate of K[loc](r) for point 0284
## iso0283 Ripley isotropic correction estimate of K[loc](r) for point 0283
## iso0282 Ripley isotropic correction estimate of K[loc](r) for point 0282
## iso0281 Ripley isotropic correction estimate of K[loc](r) for point 0281
## iso0280 Ripley isotropic correction estimate of K[loc](r) for point 0280
## iso0279 Ripley isotropic correction estimate of K[loc](r) for point 0279
## iso0278 Ripley isotropic correction estimate of K[loc](r) for point 0278
## iso0277 Ripley isotropic correction estimate of K[loc](r) for point 0277
## iso0276 Ripley isotropic correction estimate of K[loc](r) for point 0276
## iso0275 Ripley isotropic correction estimate of K[loc](r) for point 0275
## iso0274 Ripley isotropic correction estimate of K[loc](r) for point 0274
## iso0273 Ripley isotropic correction estimate of K[loc](r) for point 0273
## iso0272 Ripley isotropic correction estimate of K[loc](r) for point 0272
## iso0271 Ripley isotropic correction estimate of K[loc](r) for point 0271
## iso0270 Ripley isotropic correction estimate of K[loc](r) for point 0270
## iso0269 Ripley isotropic correction estimate of K[loc](r) for point 0269
## iso0268 Ripley isotropic correction estimate of K[loc](r) for point 0268
## iso0267 Ripley isotropic correction estimate of K[loc](r) for point 0267
## iso0266 Ripley isotropic correction estimate of K[loc](r) for point 0266
## iso0265 Ripley isotropic correction estimate of K[loc](r) for point 0265
## iso0264 Ripley isotropic correction estimate of K[loc](r) for point 0264
## iso0263 Ripley isotropic correction estimate of K[loc](r) for point 0263
## iso0262 Ripley isotropic correction estimate of K[loc](r) for point 0262
## iso0261 Ripley isotropic correction estimate of K[loc](r) for point 0261
## iso0260 Ripley isotropic correction estimate of K[loc](r) for point 0260
## iso0259 Ripley isotropic correction estimate of K[loc](r) for point 0259
## iso0258 Ripley isotropic correction estimate of K[loc](r) for point 0258
## iso0257 Ripley isotropic correction estimate of K[loc](r) for point 0257
## iso0256 Ripley isotropic correction estimate of K[loc](r) for point 0256
## iso0255 Ripley isotropic correction estimate of K[loc](r) for point 0255
## iso0254 Ripley isotropic correction estimate of K[loc](r) for point 0254
## iso0253 Ripley isotropic correction estimate of K[loc](r) for point 0253
## iso0252 Ripley isotropic correction estimate of K[loc](r) for point 0252
## iso0251 Ripley isotropic correction estimate of K[loc](r) for point 0251
## iso0250 Ripley isotropic correction estimate of K[loc](r) for point 0250
## iso0249 Ripley isotropic correction estimate of K[loc](r) for point 0249
## iso0248 Ripley isotropic correction estimate of K[loc](r) for point 0248
## iso0247 Ripley isotropic correction estimate of K[loc](r) for point 0247
## iso0246 Ripley isotropic correction estimate of K[loc](r) for point 0246
## iso0245 Ripley isotropic correction estimate of K[loc](r) for point 0245
## iso0244 Ripley isotropic correction estimate of K[loc](r) for point 0244
## iso0243 Ripley isotropic correction estimate of K[loc](r) for point 0243
## iso0242 Ripley isotropic correction estimate of K[loc](r) for point 0242
## iso0241 Ripley isotropic correction estimate of K[loc](r) for point 0241
## iso0240 Ripley isotropic correction estimate of K[loc](r) for point 0240
## iso0239 Ripley isotropic correction estimate of K[loc](r) for point 0239
## iso0238 Ripley isotropic correction estimate of K[loc](r) for point 0238
## iso0237 Ripley isotropic correction estimate of K[loc](r) for point 0237
## iso0236 Ripley isotropic correction estimate of K[loc](r) for point 0236
## iso0235 Ripley isotropic correction estimate of K[loc](r) for point 0235
## iso0234 Ripley isotropic correction estimate of K[loc](r) for point 0234
## iso0233 Ripley isotropic correction estimate of K[loc](r) for point 0233
## iso0232 Ripley isotropic correction estimate of K[loc](r) for point 0232
## iso0231 Ripley isotropic correction estimate of K[loc](r) for point 0231
## iso0230 Ripley isotropic correction estimate of K[loc](r) for point 0230
## iso0229 Ripley isotropic correction estimate of K[loc](r) for point 0229
## iso0228 Ripley isotropic correction estimate of K[loc](r) for point 0228
## iso0227 Ripley isotropic correction estimate of K[loc](r) for point 0227
## iso0226 Ripley isotropic correction estimate of K[loc](r) for point 0226
## iso0225 Ripley isotropic correction estimate of K[loc](r) for point 0225
## iso0224 Ripley isotropic correction estimate of K[loc](r) for point 0224
## iso0223 Ripley isotropic correction estimate of K[loc](r) for point 0223
## iso0222 Ripley isotropic correction estimate of K[loc](r) for point 0222
## iso0221 Ripley isotropic correction estimate of K[loc](r) for point 0221
## iso0220 Ripley isotropic correction estimate of K[loc](r) for point 0220
## iso0219 Ripley isotropic correction estimate of K[loc](r) for point 0219
## iso0218 Ripley isotropic correction estimate of K[loc](r) for point 0218
## iso0217 Ripley isotropic correction estimate of K[loc](r) for point 0217
## iso0216 Ripley isotropic correction estimate of K[loc](r) for point 0216
## iso0215 Ripley isotropic correction estimate of K[loc](r) for point 0215
## iso0214 Ripley isotropic correction estimate of K[loc](r) for point 0214
## iso0213 Ripley isotropic correction estimate of K[loc](r) for point 0213
## iso0212 Ripley isotropic correction estimate of K[loc](r) for point 0212
## iso0211 Ripley isotropic correction estimate of K[loc](r) for point 0211
## iso0210 Ripley isotropic correction estimate of K[loc](r) for point 0210
## iso0209 Ripley isotropic correction estimate of K[loc](r) for point 0209
## iso0208 Ripley isotropic correction estimate of K[loc](r) for point 0208
## iso0207 Ripley isotropic correction estimate of K[loc](r) for point 0207
## iso0206 Ripley isotropic correction estimate of K[loc](r) for point 0206
## iso0205 Ripley isotropic correction estimate of K[loc](r) for point 0205
## iso0204 Ripley isotropic correction estimate of K[loc](r) for point 0204
## iso0203 Ripley isotropic correction estimate of K[loc](r) for point 0203
## iso0202 Ripley isotropic correction estimate of K[loc](r) for point 0202
## iso0201 Ripley isotropic correction estimate of K[loc](r) for point 0201
## iso0200 Ripley isotropic correction estimate of K[loc](r) for point 0200
## iso0199 Ripley isotropic correction estimate of K[loc](r) for point 0199
## iso0198 Ripley isotropic correction estimate of K[loc](r) for point 0198
## iso0197 Ripley isotropic correction estimate of K[loc](r) for point 0197
## iso0196 Ripley isotropic correction estimate of K[loc](r) for point 0196
## iso0195 Ripley isotropic correction estimate of K[loc](r) for point 0195
## iso0194 Ripley isotropic correction estimate of K[loc](r) for point 0194
## iso0193 Ripley isotropic correction estimate of K[loc](r) for point 0193
## iso0192 Ripley isotropic correction estimate of K[loc](r) for point 0192
## iso0191 Ripley isotropic correction estimate of K[loc](r) for point 0191
## iso0190 Ripley isotropic correction estimate of K[loc](r) for point 0190
## iso0189 Ripley isotropic correction estimate of K[loc](r) for point 0189
## iso0188 Ripley isotropic correction estimate of K[loc](r) for point 0188
## iso0187 Ripley isotropic correction estimate of K[loc](r) for point 0187
## iso0186 Ripley isotropic correction estimate of K[loc](r) for point 0186
## iso0185 Ripley isotropic correction estimate of K[loc](r) for point 0185
## iso0184 Ripley isotropic correction estimate of K[loc](r) for point 0184
## iso0183 Ripley isotropic correction estimate of K[loc](r) for point 0183
## iso0182 Ripley isotropic correction estimate of K[loc](r) for point 0182
## iso0181 Ripley isotropic correction estimate of K[loc](r) for point 0181
## iso0180 Ripley isotropic correction estimate of K[loc](r) for point 0180
## iso0179 Ripley isotropic correction estimate of K[loc](r) for point 0179
## iso0178 Ripley isotropic correction estimate of K[loc](r) for point 0178
## iso0177 Ripley isotropic correction estimate of K[loc](r) for point 0177
## iso0176 Ripley isotropic correction estimate of K[loc](r) for point 0176
## iso0175 Ripley isotropic correction estimate of K[loc](r) for point 0175
## iso0174 Ripley isotropic correction estimate of K[loc](r) for point 0174
## iso0173 Ripley isotropic correction estimate of K[loc](r) for point 0173
## iso0172 Ripley isotropic correction estimate of K[loc](r) for point 0172
## iso0171 Ripley isotropic correction estimate of K[loc](r) for point 0171
## iso0170 Ripley isotropic correction estimate of K[loc](r) for point 0170
## iso0169 Ripley isotropic correction estimate of K[loc](r) for point 0169
## iso0168 Ripley isotropic correction estimate of K[loc](r) for point 0168
## iso0167 Ripley isotropic correction estimate of K[loc](r) for point 0167
## iso0166 Ripley isotropic correction estimate of K[loc](r) for point 0166
## iso0165 Ripley isotropic correction estimate of K[loc](r) for point 0165
## iso0164 Ripley isotropic correction estimate of K[loc](r) for point 0164
## iso0163 Ripley isotropic correction estimate of K[loc](r) for point 0163
## iso0162 Ripley isotropic correction estimate of K[loc](r) for point 0162
## iso0161 Ripley isotropic correction estimate of K[loc](r) for point 0161
## iso0160 Ripley isotropic correction estimate of K[loc](r) for point 0160
## iso0159 Ripley isotropic correction estimate of K[loc](r) for point 0159
## iso0158 Ripley isotropic correction estimate of K[loc](r) for point 0158
## iso0157 Ripley isotropic correction estimate of K[loc](r) for point 0157
## iso0156 Ripley isotropic correction estimate of K[loc](r) for point 0156
## iso0155 Ripley isotropic correction estimate of K[loc](r) for point 0155
## iso0154 Ripley isotropic correction estimate of K[loc](r) for point 0154
## iso0153 Ripley isotropic correction estimate of K[loc](r) for point 0153
## iso0152 Ripley isotropic correction estimate of K[loc](r) for point 0152
## iso0151 Ripley isotropic correction estimate of K[loc](r) for point 0151
## iso0150 Ripley isotropic correction estimate of K[loc](r) for point 0150
## iso0149 Ripley isotropic correction estimate of K[loc](r) for point 0149
## iso0148 Ripley isotropic correction estimate of K[loc](r) for point 0148
## iso0147 Ripley isotropic correction estimate of K[loc](r) for point 0147
## iso0146 Ripley isotropic correction estimate of K[loc](r) for point 0146
## iso0145 Ripley isotropic correction estimate of K[loc](r) for point 0145
## iso0144 Ripley isotropic correction estimate of K[loc](r) for point 0144
## iso0143 Ripley isotropic correction estimate of K[loc](r) for point 0143
## iso0142 Ripley isotropic correction estimate of K[loc](r) for point 0142
## iso0141 Ripley isotropic correction estimate of K[loc](r) for point 0141
## iso0140 Ripley isotropic correction estimate of K[loc](r) for point 0140
## iso0139 Ripley isotropic correction estimate of K[loc](r) for point 0139
## iso0138 Ripley isotropic correction estimate of K[loc](r) for point 0138
## iso0137 Ripley isotropic correction estimate of K[loc](r) for point 0137
## iso0136 Ripley isotropic correction estimate of K[loc](r) for point 0136
## iso0135 Ripley isotropic correction estimate of K[loc](r) for point 0135
## iso0134 Ripley isotropic correction estimate of K[loc](r) for point 0134
## iso0133 Ripley isotropic correction estimate of K[loc](r) for point 0133
## iso0132 Ripley isotropic correction estimate of K[loc](r) for point 0132
## iso0131 Ripley isotropic correction estimate of K[loc](r) for point 0131
## iso0130 Ripley isotropic correction estimate of K[loc](r) for point 0130
## iso0129 Ripley isotropic correction estimate of K[loc](r) for point 0129
## iso0128 Ripley isotropic correction estimate of K[loc](r) for point 0128
## iso0127 Ripley isotropic correction estimate of K[loc](r) for point 0127
## iso0126 Ripley isotropic correction estimate of K[loc](r) for point 0126
## iso0125 Ripley isotropic correction estimate of K[loc](r) for point 0125
## iso0124 Ripley isotropic correction estimate of K[loc](r) for point 0124
## iso0123 Ripley isotropic correction estimate of K[loc](r) for point 0123
## iso0122 Ripley isotropic correction estimate of K[loc](r) for point 0122
## iso0121 Ripley isotropic correction estimate of K[loc](r) for point 0121
## iso0120 Ripley isotropic correction estimate of K[loc](r) for point 0120
## iso0119 Ripley isotropic correction estimate of K[loc](r) for point 0119
## iso0118 Ripley isotropic correction estimate of K[loc](r) for point 0118
## iso0117 Ripley isotropic correction estimate of K[loc](r) for point 0117
## iso0116 Ripley isotropic correction estimate of K[loc](r) for point 0116
## iso0115 Ripley isotropic correction estimate of K[loc](r) for point 0115
## iso0114 Ripley isotropic correction estimate of K[loc](r) for point 0114
## iso0113 Ripley isotropic correction estimate of K[loc](r) for point 0113
## iso0112 Ripley isotropic correction estimate of K[loc](r) for point 0112
## iso0111 Ripley isotropic correction estimate of K[loc](r) for point 0111
## iso0110 Ripley isotropic correction estimate of K[loc](r) for point 0110
## iso0109 Ripley isotropic correction estimate of K[loc](r) for point 0109
## iso0108 Ripley isotropic correction estimate of K[loc](r) for point 0108
## iso0107 Ripley isotropic correction estimate of K[loc](r) for point 0107
## iso0106 Ripley isotropic correction estimate of K[loc](r) for point 0106
## iso0105 Ripley isotropic correction estimate of K[loc](r) for point 0105
## iso0104 Ripley isotropic correction estimate of K[loc](r) for point 0104
## iso0103 Ripley isotropic correction estimate of K[loc](r) for point 0103
## iso0102 Ripley isotropic correction estimate of K[loc](r) for point 0102
## iso0101 Ripley isotropic correction estimate of K[loc](r) for point 0101
## iso0100 Ripley isotropic correction estimate of K[loc](r) for point 0100
## iso0099 Ripley isotropic correction estimate of K[loc](r) for point 0099
## iso0098 Ripley isotropic correction estimate of K[loc](r) for point 0098
## iso0097 Ripley isotropic correction estimate of K[loc](r) for point 0097
## iso0096 Ripley isotropic correction estimate of K[loc](r) for point 0096
## iso0095 Ripley isotropic correction estimate of K[loc](r) for point 0095
## iso0094 Ripley isotropic correction estimate of K[loc](r) for point 0094
## iso0093 Ripley isotropic correction estimate of K[loc](r) for point 0093
## iso0092 Ripley isotropic correction estimate of K[loc](r) for point 0092
## iso0091 Ripley isotropic correction estimate of K[loc](r) for point 0091
## iso0090 Ripley isotropic correction estimate of K[loc](r) for point 0090
## iso0089 Ripley isotropic correction estimate of K[loc](r) for point 0089
## iso0088 Ripley isotropic correction estimate of K[loc](r) for point 0088
## iso0087 Ripley isotropic correction estimate of K[loc](r) for point 0087
## iso0086 Ripley isotropic correction estimate of K[loc](r) for point 0086
## iso0085 Ripley isotropic correction estimate of K[loc](r) for point 0085
## iso0084 Ripley isotropic correction estimate of K[loc](r) for point 0084
## iso0083 Ripley isotropic correction estimate of K[loc](r) for point 0083
## iso0082 Ripley isotropic correction estimate of K[loc](r) for point 0082
## iso0081 Ripley isotropic correction estimate of K[loc](r) for point 0081
## iso0080 Ripley isotropic correction estimate of K[loc](r) for point 0080
## iso0079 Ripley isotropic correction estimate of K[loc](r) for point 0079
## iso0078 Ripley isotropic correction estimate of K[loc](r) for point 0078
## iso0077 Ripley isotropic correction estimate of K[loc](r) for point 0077
## iso0076 Ripley isotropic correction estimate of K[loc](r) for point 0076
## iso0075 Ripley isotropic correction estimate of K[loc](r) for point 0075
## iso0074 Ripley isotropic correction estimate of K[loc](r) for point 0074
## iso0073 Ripley isotropic correction estimate of K[loc](r) for point 0073
## iso0072 Ripley isotropic correction estimate of K[loc](r) for point 0072
## iso0071 Ripley isotropic correction estimate of K[loc](r) for point 0071
## iso0070 Ripley isotropic correction estimate of K[loc](r) for point 0070
## iso0069 Ripley isotropic correction estimate of K[loc](r) for point 0069
## iso0068 Ripley isotropic correction estimate of K[loc](r) for point 0068
## iso0067 Ripley isotropic correction estimate of K[loc](r) for point 0067
## iso0066 Ripley isotropic correction estimate of K[loc](r) for point 0066
## iso0065 Ripley isotropic correction estimate of K[loc](r) for point 0065
## iso0064 Ripley isotropic correction estimate of K[loc](r) for point 0064
## iso0063 Ripley isotropic correction estimate of K[loc](r) for point 0063
## iso0062 Ripley isotropic correction estimate of K[loc](r) for point 0062
## iso0061 Ripley isotropic correction estimate of K[loc](r) for point 0061
## iso0060 Ripley isotropic correction estimate of K[loc](r) for point 0060
## iso0059 Ripley isotropic correction estimate of K[loc](r) for point 0059
## iso0058 Ripley isotropic correction estimate of K[loc](r) for point 0058
## iso0057 Ripley isotropic correction estimate of K[loc](r) for point 0057
## iso0056 Ripley isotropic correction estimate of K[loc](r) for point 0056
## iso0055 Ripley isotropic correction estimate of K[loc](r) for point 0055
## iso0054 Ripley isotropic correction estimate of K[loc](r) for point 0054
## iso0053 Ripley isotropic correction estimate of K[loc](r) for point 0053
## iso0052 Ripley isotropic correction estimate of K[loc](r) for point 0052
## iso0051 Ripley isotropic correction estimate of K[loc](r) for point 0051
## iso0050 Ripley isotropic correction estimate of K[loc](r) for point 0050
## iso0049 Ripley isotropic correction estimate of K[loc](r) for point 0049
## iso0048 Ripley isotropic correction estimate of K[loc](r) for point 0048
## iso0047 Ripley isotropic correction estimate of K[loc](r) for point 0047
## iso0046 Ripley isotropic correction estimate of K[loc](r) for point 0046
## iso0045 Ripley isotropic correction estimate of K[loc](r) for point 0045
## iso0044 Ripley isotropic correction estimate of K[loc](r) for point 0044
## iso0043 Ripley isotropic correction estimate of K[loc](r) for point 0043
## iso0042 Ripley isotropic correction estimate of K[loc](r) for point 0042
## iso0041 Ripley isotropic correction estimate of K[loc](r) for point 0041
## iso0040 Ripley isotropic correction estimate of K[loc](r) for point 0040
## iso0039 Ripley isotropic correction estimate of K[loc](r) for point 0039
## iso0038 Ripley isotropic correction estimate of K[loc](r) for point 0038
## iso0037 Ripley isotropic correction estimate of K[loc](r) for point 0037
## iso0036 Ripley isotropic correction estimate of K[loc](r) for point 0036
## iso0035 Ripley isotropic correction estimate of K[loc](r) for point 0035
## iso0034 Ripley isotropic correction estimate of K[loc](r) for point 0034
## iso0033 Ripley isotropic correction estimate of K[loc](r) for point 0033
## iso0032 Ripley isotropic correction estimate of K[loc](r) for point 0032
## iso0031 Ripley isotropic correction estimate of K[loc](r) for point 0031
## iso0030 Ripley isotropic correction estimate of K[loc](r) for point 0030
## iso0029 Ripley isotropic correction estimate of K[loc](r) for point 0029
## iso0028 Ripley isotropic correction estimate of K[loc](r) for point 0028
## iso0027 Ripley isotropic correction estimate of K[loc](r) for point 0027
## iso0026 Ripley isotropic correction estimate of K[loc](r) for point 0026
## iso0025 Ripley isotropic correction estimate of K[loc](r) for point 0025
## iso0024 Ripley isotropic correction estimate of K[loc](r) for point 0024
## iso0023 Ripley isotropic correction estimate of K[loc](r) for point 0023
## iso0022 Ripley isotropic correction estimate of K[loc](r) for point 0022
## iso0021 Ripley isotropic correction estimate of K[loc](r) for point 0021
## iso0020 Ripley isotropic correction estimate of K[loc](r) for point 0020
## iso0019 Ripley isotropic correction estimate of K[loc](r) for point 0019
## iso0018 Ripley isotropic correction estimate of K[loc](r) for point 0018
## iso0017 Ripley isotropic correction estimate of K[loc](r) for point 0017
## iso0016 Ripley isotropic correction estimate of K[loc](r) for point 0016
## iso0015 Ripley isotropic correction estimate of K[loc](r) for point 0015
## iso0014 Ripley isotropic correction estimate of K[loc](r) for point 0014
## iso0013 Ripley isotropic correction estimate of K[loc](r) for point 0013
## iso0012 Ripley isotropic correction estimate of K[loc](r) for point 0012
## iso0011 Ripley isotropic correction estimate of K[loc](r) for point 0011
## iso0010 Ripley isotropic correction estimate of K[loc](r) for point 0010
## iso0009 Ripley isotropic correction estimate of K[loc](r) for point 0009
## iso0008 Ripley isotropic correction estimate of K[loc](r) for point 0008
## iso0007 Ripley isotropic correction estimate of K[loc](r) for point 0007
## iso0006 Ripley isotropic correction estimate of K[loc](r) for point 0006
## iso0005 Ripley isotropic correction estimate of K[loc](r) for point 0005
## iso0004 Ripley isotropic correction estimate of K[loc](r) for point 0004
## iso0003 Ripley isotropic correction estimate of K[loc](r) for point 0003
## iso0002 Ripley isotropic correction estimate of K[loc](r) for point 0002
## iso0001 Ripley isotropic correction estimate of K[loc](r) for point 0001
These local K functions are hard to interpret when viewed as a group. We can plot the k-function for a single tree:
plot(lK, iso1606 ~ r)
We could also map out the values of the local k-Function for all trees for a particular distance:
lK.60 <- localK(bei, rvalue = 60, verbose = F) #takes a long time!!!! Set verbose=T to track progress
bei.lk.60 <- unmark(bei) %mark% lK.60
lk.bei.smooth <- smooth.ppp(bei.lk.60, sigma = 50)
plot(lk.bei.smooth, col = topo.colors(128), main = "smoothed neighbourhood density")
contour(lk.bei.smooth, add = TRUE)
## NULL
This map shows the variation in the local K-function when distance (h) is 60 meters. Not sure how useful this is, the pattern is clear but the units are hard to interpret. The resulting plot is not very different from plot(density(bei, sigma=50)). Getis and franklin argue that maps such as this show the scale specific second order intensity.