In this practical you will learn how to begin to analyse patterns in spatial data. Using data you are already familiar with, in the first part of the practical, you will explore some techniques for analysing patterns of point data in R. Then, in the second part of the practial, you will explore spatial autocorrelation using ArcGIS.
In this analysis we will analyse the patterns of Blue Plaques you downloaded from http://openplaques.org/ in the Week 5 practial. Normally we could download the XML directly from the Web using a package like xml, but the XML feeds from OpenPlaques are a little flaky, so we’ll read in the shapefile for Blue Plaques for London we created in week 5.
The question we want to answer is: “For any given London Borough, are the Blue Plaques within that borough distributed randomly or do they exhibit some kind of dispersed or clustered pattern?”
To answer this question, we will make use of some of the Point Pattern Analysis functions found in the spatstat package.
#first library a few packages that we will use during the practical
library(spatstat)
library(sp)
library(rgeos)
library(maptools)
library(GISTools)
#and set your working directory
setwd("Z:/GIS/wk6")
Now, assuming that you’ve got a copy of your London Boroughs shapefile (from week 1) in your new week 6 folder, along with a shapefile of your Blue Plaques; read in the data…
#first set up an EPSG string to help set the projection
BNG = "+init=epsg:27700"
#now read the data in
BoroughMap <- readShapePoly("england_lad_2011Polygon.shp", proj4string = CRS(BNG))
#and check it's worked
plot(BoroughMap)
#and the Blue Plaques
BluePlaques <- readShapePoints("BluePlaques.shp", proj4string = CRS(BNG))
#and plot on top of the Boroughs, just to check everything looks OK
plot(BluePlaques, col="blue", pch=20, add=T)
Now, you might have noticed that there are at least two Blue Plaques that fall outside of the Borough boundaries. These errant plaques will cause problems with our analysis, so we need to clip the plaques to the boundaries…
##first we'll remove any Plaques with the same grid reference as this will cause problems later on in the analysis...
BluePlaques <- remove.duplicates(BluePlaques)
#now just select the points inside London - thanks to Robin Lovelace for posting how to do this one, very useful!
BluePlaquesSub <- BluePlaques[BoroughMap,]
#check to see that they've been removed
plot(BoroughMap)
plot(BluePlaquesSub, col="blue", pch=20, add=T)
From this point, we could try and carry out our analysis on the whole of London, but you might be waiting until next week for Ripley’s K to be calculated for this many points. Therefore to speed things up and to enable us to compare areas within London, we will select some individual boroughs. First we need to subset our SpatialPolygonsDataFrame to pull out a borough we are interested in. I’m going to choose Harrow as I know there are few enough points for the analysis to definitely work. If you wish, feel free to choose another borough in London and run the same analysis, but beware that if it happens that there are a lot of blue plaques in your borough, the analysis could fall over!!:
#OK, so just select the borough you are interested in. I'm going to try Harrow, you can choose any borough you like...
Borough <- BoroughMap[BoroughMap@data$name=="Harrow",]
#Check to see that the correct borough has been pulled out
plot(Borough)
Next we need to clip our Blue Plaques so that we have a subset of just those that fall within the borough or interest
#clip the data to our single borough
BluePlaquesSub <- BluePlaques[Borough,]
#check that it's worked
plot(Borough)
plot(BluePlaquesSub, col="blue", pch=20, add=T)
We now have all of our data set up so that we can start the analysis using spatstat. The first thing we need to do is create an observation window for spatstat to carry out its analysis within - we’ll set this to the extent of the Harrow boundary
##now set a window as the borough boundary
window <- as.owin(Borough)
plot(window)
spatstat has its own set of spatial objects that it works with (one of the delights of R is that different packages are written by different people and many have developed their own data types) - it does not work directly with the SpatialPolygonsDataFrames and SpatialPointsDataFrames that we are used to. For point pattern analysis, we need to create a point pattern (ppp) object.
#create a ppp object
BluePlaquesSub.ppp <- ppp(x=BluePlaquesSub@coords[,1],y=BluePlaquesSub@coords[,2],window=window)
Try to understand what the different elements in command above is doing. If you are unsure, you can run elements of the code, for example:
BluePlaquesSub@coords[,1]
## 456 621 908 911 1847 1983 1995 1996
## 514971.1 512466.7 514966.2 517339.2 512215.1 515694.1 514757.7 512264.3
## 1997 1998 1999 2000 2001 2002 2003 2004
## 511792.6 515339.6 518598.4 515370.3 512335.4 511539.4 513371.5 516746.3
## 2005 2006 2007 2009 2010 2011 2012 2013
## 515210.7 515093.1 515561.8 514805.6 513080.8 515166.0 513750.4 512508.2
## 2014 2015 2016 2017 2018 2019 2071 2131
## 516451.0 514022.4 518187.3 516725.5 513392.3 513008.3 514177.1 514183.4
## 2161
## 518569.8
Have a look at the new ppp object
plot(BluePlaquesSub.ppp,pch=16,cex=0.5, main="Blue Plaques Harrow")
We will explore what Kernel Density Estimation (KDE) is in next week’s lecture, but here we are going to jump the gun a little bit. One way to summarise your point data is to plot the density of your points under a window called a ‘Kernel’. The size and shape of the Kernel affects the density pattern produced (more of this next week), but it is very easy to produce a KDE map from a ppp object using the density function.
plot(density(BluePlaquesSub.ppp, sigma = 500))
The sigma value sets the diameter of the Kernel (in the units your map is in - in this case, as we are in British National Grid the units are in metres). Try experimenting with different values of sigma to see how that affects the density estimate.
plot(density(BluePlaquesSub.ppp, sigma = 1000))
So as you saw in the lecture, we are interesting in knowing whether the distribution of points in our study area differs from ‘complete spatial randomness’ - CSR.
The most basic test of CSR is a quadrat analysis. We can carry out a simple quadrat analysis on our data using the quadrat count function in spatstat
#First plot the points
plot(BluePlaquesSub.ppp,pch=16,cex=0.5, main="Blue Plaques in Harrow")
#now count the points in that fall in a 6 x 6 grid overlaid across the window
plot(quadratcount(BluePlaquesSub.ppp, nx = 6, ny = 6),add=T,col="red")
In our case here, want to know whether or not there is any kind of spatial patterning associated with the Blue Plaques in areas of London. If you recall from the lecture, this means comparing our observed distribution of points with a statistically likely (Complete Spatial Random) distibution, based on the Poisson distribution.
Using the same quadratcount function again (for the same sized grid) we can save the results into a table:
#run the quadrat count
Qcount<-data.frame(quadratcount(BluePlaquesSub.ppp, nx = 6, ny = 6))
#put the results into a data frame
QCountTable <- data.frame(table(Qcount$Freq, exclude=NULL))
#view the data frame
QCountTable
## Var1 Freq
## 1 0 14
## 2 1 6
## 3 2 4
## 4 3 1
## 5 4 4
## 6 <NA> 0
#we don't need the last row, so remove it
QCountTable <- QCountTable[-nrow(QCountTable),]
#check the data type in the first column - if it is factor, we will need to convert it to numeric
class(QCountTable[,1])
## [1] "factor"
#oops, looks like it's a factor, so we need to convert it to numeric
QCountTable[,1]<- as.numeric(levels(QCountTable[,1]))
OK, so we now have a frequency table - next we need to calculate our expected values. Remember, the formula for calculating expected probabilities based on the Poisson distribution is:
\[ Pr\left(X=k\right)=\frac{\lambda^{k}e^{-\lambda}}{k!} \]
#calculate the total blue plaques (Var * Freq)
QCountTable$total <- QCountTable[,1]*QCountTable[,2]
#calculate mean
sums <- colSums(QCountTable[,-1])
sums
## Freq total
## 29 33
#and now calculate our mean Poisson parameter (lambda)
lambda <- sums[2]/sums[1]
#calculate expected using the Poisson formula from above - k is the number of blue plaques counted in a square and is found in the first column of our table...
QCountTable$Pr <- ((lambda^QCountTable[,1])*exp(-lambda))/factorial(QCountTable[,1])
#now calculate the expected counts and save them to the table
QCountTable$Expected <- round(QCountTable$Pr * sums[1],0)
QCountTable
## Var1 Freq total Pr Expected
## 1 0 14 0 0.32048140 9
## 2 1 6 6 0.36468573 11
## 3 2 4 8 0.20749361 6
## 4 3 1 3 0.07870447 2
## 5 4 4 16 0.02239007 1
#Compare the frequency distributions of the observed and expected point patterns
plot(c(1,5),c(0,14), type="n", xlab="Number of Blue Plaques (Red=Observed, Blue=Expected)", ylab="Frequency of Occurances")
points(QCountTable$Freq, col="Red", type="o", lwd=3)
points(QCountTable$Expected, col="Blue", type="o", lwd=3)
Comparing the observed and expected frequencies for our quadrat counts, we can observe that they both have higher frequency counts at the lower end - something reminiscent of a Poisson distribution. This could indicate that for this particular set of quadrats, our pattern is close to Complete Spatial Randomness (i.e. no clustering or dispersal of points). But how do we confirm this?
To check for sure, we can use the quadrat.test function, built into spatstat. This uses a Chi Squared test to compare the observed and expected frequencies for each quadrat (rather than for quadrat bins, as we have just computed above). If the p-value of our Chi-Squared test is > 0.05, then we can reject a null hyphothesis that says “there is no complete spatial randomness in our data” (we will learn more about what a null-hypothesis is in a couple of weeks, but for the time being, just think about it as the opposite of a hypothesis that says our data exhibit complete spatial randomness). What we need to look for is a value for p > 0.05. If our p-value is > 0.05 then this indicates that we have CSR and there is no pattern in our points. If it is < 0.05, this indicates that we do have clustering in our points.
teststats <- quadrat.test(BluePlaquesSub.ppp, nx = 6, ny = 6)
## Warning: Some expected counts are small; chi^2 approximation may be
## inaccurate
teststats
##
## Chi-squared test of CSR using quadrat counts
## Pearson X2 statistic
##
## data: BluePlaquesSub.ppp
## X2 = 25.569, df = 28, p-value = 0.8065
## alternative hypothesis: two.sided
##
## Quadrats: 29 tiles (irregular windows)
plot(BluePlaquesSub.ppp,pch=16,cex=0.5, main="Blue Plaques in Harrow")
plot(teststats, add=T, col = "red")
So we can see that the indications are there is no spatial patterning for Blue Plaques in Harrow - at least for this particular grid. Note the warning message - some of the observed counts are very small (0) and this may affect the accuracy of the quadrat test. Recall that the Poisson distribution only describes observed occurrances that are counted in integers - where our occurances = 0 (i.e. not observed), this can be an issue. We also know that there are various other problems that might affect our quadrat analysis, such as the modifiable areal unit problem.
In the new plot, we can see three figures for each quadrat. The top-left figure is the observed count of points; the top-right is the Poisson expected number of points; the bottom value is the Pearson residual value, or (Observed - Expected) / Sqrt(Expected).
Try running a quadrat analysis for different grid arrangements (2 x 2, 3 x 3, 10 x 10 etc.) - how does this affect your results?
One way of getting around the limitations of quadrat analysis is to compare the observed distribution of points with the Poisson random model for a whole range of different distance radii. This is what Ripley’s K function computes.
We can conduct a Ripley’s K test on our data very simply with the spatstat package using the kest function.
K <- Kest(BluePlaquesSub.ppp, correction="border")
plot(K)
The plot for K has a number of elements that are worth explaining. First, the Kpois(r) line in Red is the theoretical value of K for each distance window (r) under a Poisson assumption of Complete Spatial Randomness. The Black line is the estimated values of K accounting for the effects of the edge of the study area.
Where the value of K falls above the line, the data appear to be clustered at that distance. Where the value of K is below the line, the data are dispersed. From the graph, we can see that up until distances of around 1300 metres, Blue Plaques appear to be clustered in Harrow, however, at around 1500 m, the distribution appears random and then dispersed between about 1600 and 2100 metres.
There are a number of alternative measures of spatial clustering which can be computed in spatstat such as the G and the L functions - I won’t go into them now, but if you are interested, you should delve into the following references:
Bivand, R. S., Pebesma, E. J., & Gómez-Rubio, V. (2008). “Applied spatial data analysis with R.” New York: Springer.
Brundson, C., Comber, L., (2015) “An Introduction to R for Spatial Analysis & Mapping”. Sage.
Quadrat and Ripley’s K analysis are useful exploratory techniques for telling us if we have spatial clusters present in our point data, but they are not able to tell us WHERE in our area of interest the clusters are occurring. To discover this we need to use alternative techniques. One popular technique for discovering clusters in space (be this physical space or variable space) is DBSCAN. For the complete overview of the DBSCAN algorithm, read the original paper by Ester et al. (1996) - http://www.aaai.org/Papers/KDD/1996/KDD96-037.pdf or consult the wikipedia page - https://en.wikipedia.org/wiki/DBSCAN
library(raster)
library(fpc)
library(plyr)
library(OpenStreetMap)
We will now carry out a DBSCAN analysis of blue plaques in my borough to see if there are any clusters present.
#first check the coordinate reference system of the Harrow spatial polygon:
crs(Borough)
## CRS arguments:
## +init=epsg:27700 +proj=tmerc +lat_0=49 +lon_0=-2 +k=0.9996012717
## +x_0=400000 +y_0=-100000 +datum=OSGB36 +units=m +no_defs
## +ellps=airy
## +towgs84=446.448,-125.157,542.060,0.1502,0.2470,0.8421,-20.4894
DBSCAN requires you to input two parameters: 1. Epsilon - this is the radius within which the algorithm with search for clusters 2. MinPts - this is the minimum number of points that should be considered a cluster
Based on the results of the Ripley’s K analysis earlier, we can see that we are getting clustering up to a radius of around 1200m, with the largest bulge in the graph at around 700m. Therefore, 700m is probably a good place to start and we will begin by searching for clusters of at least 4 points…
#first extract the points from the spatial points data frame
BluePlaquesSubPoints <- data.frame(BluePlaquesSub@coords[,1:2])
#now run the dbscan analysis
db <- fpc::dbscan(BluePlaquesSubPoints, eps = 700, MinPts = 4)
#now plot the results
plot(db, BluePlaquesSubPoints, main = "DBSCAN Output", frame = F)
plot(Borough, add=T)
#dbscan::kNNdistplot(BluePlaquesSubPoints, k = 4)
So the DBSCAN analysis shows that for these values of eps and MinPts there are three clusters in the area I am analysing. Try varying eps and MinPts to see what difference it makes to the output.
No of course the plot above is a little basic and doesn’t look very aesthetically pleasing. As this is R and R is brilliant, we can always produce a much nicer plot by extracting the useful information from the DBSCAN output and use ggplot2 to produce a much cooler map…
library(ggplot2)
## Warning: package 'ggplot2' was built under R version 3.3.2
#our new db object contains lots of info including the cluster each set of point coordinates belongs to, whether the point is a seed point or a border point etc. We can get a summary by just calling the object
db
## dbscan Pts=33 MinPts=4 eps=700
## 0 1 2 3
## border 17 0 1 4
## seed 0 5 5 1
## total 17 5 6 5
#if you open up the object in the environment window in RStudio, you will also see the various slots in the object, including cluster
db$cluster
## [1] 2 1 2 0 1 0 0 1 0 2 0 2 1 0 3 0 2 0 0 0 3 2 3 1 0 3 0 0 3 0 0 0 0
#we can now add this cluster membership info back into our dataframe
BluePlaquesSubPoints$cluster <- db$cluster
#next we are going to create some convex hull polygons to wrap around the points in our clusters
#use the ddply function in the plyr package to get the convex hull coordinates from the cluster groups in our dataframe
chulls <- ddply(BluePlaquesSubPoints, .(cluster), function(df) df[chull(df$coords.x1, df$coords.x2), ])
# as 0 isn't actually a cluster (it's all points that aren't in a cluster) drop it from the dataframe
chulls <- subset(chulls, cluster>=1)
#now create a ggplot2 object from our data
dbplot <- ggplot(data=BluePlaquesSubPoints, aes(coords.x1,coords.x2, colour=cluster, fill=cluster))
#add the points in
dbplot <- dbplot + geom_point()
#now the convex hulls
dbplot <- dbplot + geom_polygon(data = chulls, aes(coords.x1,coords.x2, group=cluster), alpha = 0.5)
#now plot, setting the coordinates to scale correctly and as a black and white plot (just for the hell of it)...
dbplot + theme_bw() + coord_equal()
Now we are getting there, but wouldn’t it be better to add a basemap?!
###add a basemap
##First get the bbox in lat long for Harrow
latlong <- "+init=epsg:4326"
BoroughWGS <-spTransform(Borough, CRS(latlong))
BoroughWGS@bbox
## min max
## x -0.4040719 -0.2671556
## y 51.5530613 51.6405318
Now convert the basemap to British National Grid
basemap<-openmap(c(51.5530613,-0.4040719),c(51.6405318,-0.2671556), zoom=NULL,"stamen-toner")
#convert the basemap to British National Grid - remember we created the BNG object right at the beginning of the practical - it's an epsg string...
basemap_bng<-openproj(basemap, projection=BNG)
Now we can plot our fancy map with the clusters on…
autoplot(basemap_bng) + geom_point(data=BluePlaquesSubPoints, aes(coords.x1,coords.x2, colour=cluster, fill=cluster)) + geom_polygon(data = chulls, aes(coords.x1,coords.x2, group=cluster, fill=cluster), alpha = 0.5)
This is end end of the point pattern analysis section of the practical. You have been introduced to the basics of Point Pattern Analysis examining the distribution of Blue Plaques in a London Borough. At this point, you may wish to try running similar analyses on different boroughs (or indeed the whole city) and playing with some of the outputs - although you will find that Ripley’s K will fall over very quickly if you try to run the analysis on that many points)
This how you might make use of these techniques in another context or with different point data…
Have the Arc lot gone? OK great, here’s some more lovely R…
In this section we are going to explore patterns of spatially referenced continuous observations using various measures of spatial autocorrelation. Check out the various references in the reading list for more information about these methods. There are also useful links in the helpfile of the spdep package which we will be using here.
Before we get any further, let’s get some ward boundaries read in to R - download LondonWardData from Moodle, unzip it and then read it in.
#read the ward data in
LondonWards <- readShapePoly("LondonWards.shp")
#it's probably projected correctly, but in case it isn't give it a projection using the CRS() function in the raster package
proj4string(LondonWards) <- CRS("+init=epsg:27700")
#have a look to check that everything looks OK..
plot(LondonWards)
plot(BluePlaques, col="blue", pch=20, add=T)
#ah yes, we might need to lose the blue plaques that fall outside of London
BluePlaquesSub <- BluePlaques[LondonWards,]
plot(LondonWards)
plot(BluePlaquesSub, col="blue", pch=20, add=T)
The measures of spatial autocorrelation that we will be using require continuous observations (counts of blue plaques, average GCSE scores, average incomes etc.) to be spatially referenced (i.e. attached to a spatial unit like a ward or a borough). The file you have already has the various obervations associated with the London Ward data file already attached to it, but let’s continue with our blue plaques example for now.
To create a continuous observation from the blue plaques data we need to count all of the blue plaques that fall within each Ward in the City. Luckily, we can do this using the poly.counts function in Chris Brunsdon’s excellent gistools package… (we could also use the over() function in the sp package if we wanted)
res <- poly.counts(BluePlaquesSub, LondonWards)
#and add this as a column in our spatialPolygonsDataframe
LondonWards@data$BluePlaqueCount<-res
#as the wards are of different sizes, perhaps best that we calculate a density
LondonWards@data$BlueDensity <- LondonWards$BluePlaqueCount/poly.areas(LondonWards)
#let's just check the data to see if the calculations have worked
LondonWards@data
How about a quick choropleth map to see how we are getting on…
#use the classInt package to calculate some natural breaks
library(classInt)
colours<- brewer.pal(5, "PuOr")
breaks<-classIntervals(LondonWards$BlueDensity, n=5, style="jenks")
breaks <- breaks$brks
plot(breaks, col=colours)
plot(LondonWards, col=colours[findInterval(LondonWards@data$BlueDensity, breaks, all.inside = TRUE)], axes=F, asp=T)
So, from the map, it looks as though we might have some clustering of blue plaques in the centre of London so let’s check this with Moran’s I and some other statistics.
Before being able to calculate Moran’s I and any similar statistics, we need to first define a \(W_{ij}\) spatial weights matrix
library(spdep)
#####
#First calculate the centroids of all Wards in London
coordsW <- coordinates(LondonWards)
plot(coordsW)
#Now we need to generate a spatial weights matrix (remember from the lecture). We'll start with a simple binary matrix of queen's case neighbours
#create a neighbours list
LWard_nb <- poly2nb(LondonWards, queen=T)
#plot them
plot(LWard_nb, coordinates(coordsW), col="red")
#add a map underneath
plot(LondonWards, add=T)
#create a spatial weights object from these weights
Lward.lw <- nb2listw(LWard_nb, style="C")
head(Lward.lw$neighbours)
## [[1]]
## [1] 6 7 10 462 468 482
##
## [[2]]
## [1] 5 8 9 11 12 13 16
##
## [[3]]
## [1] 10 11 12 15 480 483
##
## [[4]]
## [1] 17 281 291 470 473 481
##
## [[5]]
## [1] 2 9 16 281 283 290
##
## [[6]]
## [1] 1 7 8 10 11 14
Now we have defined our \(W_{ij}\) matrix, we can calculate the Moran’s I and other associated statistics
#moran's I test - this tells us whether we have clustered values (close to 1) or dispersed values (close to -1)
#we will calculate for the densities rather than raw values
I_LWard_Global_Density <- moran.test(LondonWards@data$BlueDensity, Lward.lw)
I_LWard_Global_Density
##
## Moran I test under randomisation
##
## data: LondonWards@data$BlueDensity
## weights: Lward.lw
##
## Moran I statistic standard deviate = 29.426, p-value < 2.2e-16
## alternative hypothesis: greater
## sample estimates:
## Moran I statistic Expectation Variance
## 0.6574747092 -0.0016025641 0.0005016582
#Geary's C as well..? This tells us whether similar values or dissimilar values are clusering
C_LWard_Global_Density <- geary.test(LondonWards@data$BlueDensity, Lward.lw)
C_LWard_Global_Density
##
## Geary C test under randomisation
##
## data: LondonWards@data$BlueDensity
## weights: Lward.lw
##
## Geary C statistic standard deviate = 8.4667, p-value < 2.2e-16
## alternative hypothesis: Expectation greater than statistic
## sample estimates:
## Geary C statistic Expectation Variance
## 0.419479576 1.000000000 0.004701215
##Getis Ord General G...? This tells us whether high or low values are clustering. If G > Expected = High values clustering; if G < expected = low values clustering
G_LWard_Global_Density <- globalG.test(LondonWards@data$BlueDensity, Lward.lw)
G_LWard_Global_Density
##
## Getis-Ord global G statistic
##
## data: LondonWards@data$BlueDensity
## weights: Lward.lw
##
## standard deviate = 28.697, p-value < 2.2e-16
## alternative hypothesis: greater
## sample estimates:
## Global G statistic Expectation Variance
## 1.046763e-02 1.602564e-03 9.543344e-08
So the global statistics are indicating that we have spatial autocorrelation of Blue Plaques in London:
The Moran’s I statistic = 0.51 (remember 1 = clustered, 0 = no pattern, -1 = dispersed) which shows that we have some distinctive clustering
The Geary’s C statistic = 0.41 (remember Geary’s C falls between 0 and 2; 1 means no spatial autocorrelation, <1 - positive spatial autocorrelation or similar values clustering, >1 - negative spatial autocorreation or dissimilar values clustering) which shows that similar values are clustering
The General G statistic = G > expected, so high values are tending to cluster.
We can now also calculate local versions of the Moran’s I statistic (for each Ward) and a Getis Ord \(G_{i}^{*}\) statistic to see where we have hot-spots…
#use the localmoran function to generate I for each ward in the city
I_LWard_Local <- localmoran(LondonWards@data$BluePlaqueCount, Lward.lw)
I_LWard_Local_Density <- localmoran(LondonWards@data$BlueDensity, Lward.lw)
#what does the output (the localMoran object) look like?
head(I_LWard_Local_Density)
## Ii E.Ii Var.Ii Z.Ii Pr(z > 0)
## 0 0.1251611 -0.001632161 0.1597351 0.3172458 0.3755285
## 1 0.1396254 -0.001904187 0.1865870 0.3276472 0.3715892
## 2 0.1126116 -0.001632161 0.1597351 0.2858462 0.3874979
## 3 0.1251611 -0.001632161 0.1597351 0.3172458 0.3755285
## 4 0.1251611 -0.001632161 0.1597351 0.3172458 0.3755285
## 5 0.1251611 -0.001632161 0.1597351 0.3172458 0.3755285
#There are 5 columns of data. We want to copy some of the columns (the I score (column 1) and the z-score standard deviation (column 4)) back into the LondonWards spatialPolygonsDataframe
LondonWards@data$BLocI <- I_LWard_Local[,1]
LondonWards@data$BLocIz <- I_LWard_Local[,4]
LondonWards@data$BLocIR <- I_LWard_Local_Density[,1]
LondonWards@data$BLocIRz <- I_LWard_Local_Density[,4]
No we can plot a map of the local Moran’s I outputs…
#create a new diverging colour brewer palette and reverse the order using rev so higher values correspond to red
MoranColours<- rev(brewer.pal(7, "RdGy"))
#set the breaks manually based on the rule that data points >2.58 or <-2.58 standard deviations away from the mean are significant at the 99% level (<1% chance that autocorrelation not present); >1.96 - <2.58 or <-1.96 to >-2.58 standard deviations are significant at the 95% level (<5% change that autocorrelation not present). >1.65 = 90% etc.
breaks<-c(-1000,-2.58,-1.96,-1.65,1.65,1.96,2.58)
plot(breaks, col=MoranColours)
plot(LondonWards, col=MoranColours[findInterval(LondonWards@data$BLocIRz, breaks, all.inside = TRUE)], axes=F, asp=T)
This map shows some areas in the centre of London that have relatively high scores, indicating areas with lots of blue plaques neighbouring other areas with lots of blue plaques.
What about the Getis Ord \(G_{i}^{*}\) statisic for hot and cold spots?
Gi_LWard_Local_Density <- localG(LondonWards@data$BlueDensity, Lward.lw)
#Check the help file (?localG) to see what a localG object looks like - it is a bit different from a localMoran object as it only contains just a single value - the z-score (standardised value relating to whether high values or low values are clustering together)
head(Gi_LWard_Local_Density)
## [1] -0.8629324 -0.8920351 -0.7765479 -0.8629324 -0.8629324 -0.8629324
LondonWards@data$BLocGiRz <- Gi_LWard_Local_Density
And map the outputs…
GIColours<- rev(brewer.pal(7, "RdBu"))
plot(LondonWards, col=GIColours[findInterval(LondonWards@data$BLocGiRz, breaks, all.inside = TRUE)], axes=F, asp=T)
The local Moran’s I and \(G_{i}^{*}\) statistics for wards clearly show that the density of blue plaques in the centre of the city exhibits strong (and postitive) spatial autocorrelation, but neither of these maps are very interesting. The ArcGIS crew will have been calculating Local Moran’s I and \(G_{i}^{*}\) statistics for some of the other variables in the LondonWards dataset. Why not try some alternative variables and see what patterns emerge… here I’m going to have a look at Average GSCE scores…
#use head to see what other variables are in the data file
head(LondonWards@data)
#ok I am going to have a look at Average GSCE Scores. First local Moran's I...
I_LWard_Local_GCSE <- localmoran(LondonWards@data$AvgGCSE201, Lward.lw)
LondonWards@data$GCSE_LocIz <- I_LWard_Local_GCSE[,4]
plot(LondonWards, col=MoranColours[findInterval(LondonWards@data$GCSE_LocIz, breaks, all.inside = TRUE)], axes=F, asp=T)
#Now the Gi* statistic to look at clusters of high and low scores...
Gi_LWard_Local_GCSE <- localG(LondonWards@data$AvgGCSE201, Lward.lw)
LondonWards@data$GCSE_LocGiz <- Gi_LWard_Local_GCSE
plot(LondonWards, col=GIColours[findInterval(LondonWards@data$GCSE_LocGiz, breaks, all.inside = TRUE)], axes=F, asp=T)
So this is the end of the practical. Hopefully you have learned a lot about the different methods we can employ to analyse patterns in spatial data.
This practical was deliberately designed as a walk through, but this may have given you ideas about where you could perhaps take these techniques in your coursework if this is something you wanted to explore further with different data or in different contexts.
Things to perhaps try as an extension…