Introdução
As funções serão organizadas da seguinte forma:
- Uma função principal de visualização e análise
- Funções de visualização no
ggplot2
com prefixogg
- Funções de visualização no
leaflet
com prefixolf
Padrão de Pontos
Função principal
ppp_test = function(shapefile, data, x, y, crs = 29193, fun = c("G", "F"), nsim = 10, pointsize = 1,
pointcolor = "black", palette = "RdYlGn", alpha = 0.5, as.list = FALSE){
# Checking the inputs
if(length(fun) > 2){stop("Only two summary functions are supported each time.")}
if(fun[1] %in% c("G", "F", "K", "J") == FALSE){stop("The first summary function chosen is invalid.")}
if(fun[2] %in% c("G", "F", "K", "J") == FALSE){stop("The second summary function chosen is invalid.")}
if(fun[1] == fun[2]){stop("Both summary functions are the same.")}
if(class(shapefile)[1] != "sf"){
cat("Transforming the shapefile into a sf object using Coordinate Reference System = ",crs,". \n", sep = "")
shapefile = as(shapefile, 'sf')
}
shapefile = suppressMessages(st_set_crs(shapefile, crs))
shapefile = st_transform(shapefile, crs)
# Transforming the coordinates into UTM
data = st_as_sf(data, coords = c(x, y), crs = crs)
data_utm = st_transform(data, crs = crs)
coordinates_utm = st_coordinates(data_utm)
# Creating the ppp object
data_ppp = suppressMessages(ppp(x = coordinates_utm[,1], y = coordinates_utm[,2], window = as.owin(shapefile)))
data_ppp = as.ppp(data_ppp)
data_ppp = unique.ppp(data_ppp)
# Visualizing the data
g1 = ggplot() +
geom_sf(data = shapefile, fill = "#e5e5e5", col = "black") +
geom_point(aes(x = coordinates_utm[,1], y = coordinates_utm[,2]), size = pointsize, color = pointcolor) +
coord_sf() + theme_light() + ggtitle('Point Pattern') + ylab("Y") + xlab("X")
# Density map
g2 = ggplot() +
geom_sf(data = shapefile, fill = "#e5e5e5", col = "black") +
stat_density2d(aes(x = coordinates_utm[,1], y = coordinates_utm[,2], fill = ..level..), geom = "polygon", alpha = alpha) +
scale_fill_distiller(palette = palette) +
theme_light() + ggtitle('Intensity') + ylab("Y") + xlab("X")
# Summary functions
# First summary function
if(fun[1] == "G"){ggt1 = "G function"; yl1 = "G(r)"
env1 = suppressMessages(envelope(data_ppp, Gest, nsim = nsim, verbose = FALSE))
}
if(fun[1] == "F"){ggt1 = "F function"; yl1 = "F(r)"
env1 = suppressMessages(envelope(data_ppp, Fest, nsim = nsim, verbose = FALSE))
}
if(fun[1] == "K"){ggt1 = "K function"; yl1 = "K(r)"
env1 = suppressMessages(envelope(data_ppp, Kest, nsim = nsim, verbose = FALSE))
}
if(fun[1] == "J"){ggt1 = "J function"; yl1 = "J(r)"
env1 = suppressMessages(envelope(data_ppp, Jest, nsim = nsim, verbose = FALSE))
}
# Second summary function
if(fun[2] == "G"){ggt2 = "G function"; yl2 = "G(r)"
env2 = suppressMessages(envelope(data_ppp, Gest, nsim = nsim, verbose = FALSE))
}
if(fun[2] == "F"){ggt2 = "F function"; yl2 = "F(r)"
env2 = suppressMessages(envelope(data_ppp, Fest, nsim = nsim, verbose = FALSE))
}
if(fun[2] == "K"){ggt2 = "K function"; yl2 = "K(r)"
env2 = suppressMessages(envelope(data_ppp, Kest, nsim = nsim, verbose = FALSE))
}
if(fun[2] == "J"){ggt2 = "J function"; yl2 = "J(r)"
env2 = suppressMessages(envelope(data_ppp, Jest, nsim = nsim, verbose = FALSE))
}
g3 = ggplot(data.frame(env1), aes(x = r))+
ggtitle(ggt1) +
geom_line(aes(y = lo), col='grey') +
geom_line(aes(y = hi), col='grey') +
geom_ribbon(aes(ymin = lo - 0.01, ymax = hi + 0.01), alpha = 0.75, fill = 'grey') +
geom_line(aes(y = theo), col = 'red') +
geom_line(aes(y = obs)) +
ylab(yl1) + xlab("r") + theme_light()
g4 = ggplot(data.frame(env2), aes(x = r))+
ggtitle(ggt2) +
geom_line(aes(y = lo), col='grey') +
geom_line(aes(y = hi), col='grey') +
geom_ribbon(aes(ymin = lo - 0.01, ymax = hi + 0.01), alpha = 0.75, fill = 'grey') +
geom_line(aes(y = theo), col = 'red') +
geom_line(aes(y = obs)) +
ylab(yl2) + xlab("r") + theme_light()
# Making a list with the individual plots
if(as.list == TRUE){return(list(g1, g2, g3, g4))}
# Plotting the grid
plot_grid(g1, g2, g3, g4, align = "v", axis = "tblr", rel_heights = c(2, 2, 0.8,0.8))
}
## Transforming the shapefile into a sf object using Coordinate Reference System = 29193.
## Warning: st_crs<- : replacing crs does not reproject data; use st_transform for
## that
## Warning: 2 points were rejected as lying outside the specified window
## Warning: data contain duplicated points
## Warning: st_crs<- : replacing crs does not reproject data; use st_transform for
## that
## Warning: data contain duplicated points
Funções com o ggplot2
gg_pattern = function(shapefile, data, x, y, crs = 29193, pointsize = 1,
pointcolor = "black", title = 'Point Pattern', ylab = 'Y', xlab = 'X'){
if(class(shapefile)[1] != "sf"){
cat("Transforming the shapefile into a sf object using Coordinate Reference System = ",crs,". \n", sep = "")
shapefile = as(shapefile, 'sf')
}
shapefile = suppressMessages(st_set_crs(shapefile, crs))
shapefile = st_transform(shapefile, crs)
# Transforming the coordinates into UTM
data = st_as_sf(data, coords = c(x, y), crs = crs)
data_utm = st_transform(data, crs = crs)
coordinates_utm = st_coordinates(data_utm)
ggplot() +
geom_sf(data = shapefile, fill = "#e5e5e5", col = "black") +
geom_point(aes(x = coordinates_utm[,1], y = coordinates_utm[,2]), size = pointsize, color = pointcolor) +
coord_sf()+ ggtitle(title) + ylab(ylab) + xlab(xlab) + theme_light()
}
## Warning: st_crs<- : replacing crs does not reproject data; use st_transform for
## that
## Transforming the shapefile into a sf object using Coordinate Reference System = 29193.
## Warning: st_crs<- : replacing crs does not reproject data; use st_transform for
## that
gg_density = function(shapefile, data, x, y, crs = 29193, pointsize = 1, alpha = 0.5,
pointcolor = "black", title = 'Intensity', ylab = 'Y', xlab = 'X', palette = "RdYlGn"){
if(class(shapefile)[1] != "sf"){
cat("Transforming the shapefile into a sf object using Coordinate Reference System = ",crs,". \n", sep = "")
shapefile = as(shapefile, 'sf')
}
shapefile = suppressMessages(st_set_crs(shapefile, crs))
shapefile = st_transform(shapefile, crs)
# Transforming the coordinates into UTM
data = st_as_sf(data, coords = c(x, y), crs = crs)
data_utm = st_transform(data, crs = crs)
coordinates_utm = st_coordinates(data_utm)
ggplot() +
geom_sf(data = shapefile, fill = "#e5e5e5", col = "black") +
stat_density2d(aes(x = coordinates_utm[,1], y = coordinates_utm[,2], fill = ..level..), geom = "polygon", alpha = alpha) +
scale_fill_distiller(palette = palette) +
theme_light() + ggtitle(title) + ylab(ylab) + xlab(xlab)
}
## Warning: st_crs<- : replacing crs does not reproject data; use st_transform for
## that
## Transforming the shapefile into a sf object using Coordinate Reference System = 29193.
## Warning: st_crs<- : replacing crs does not reproject data; use st_transform for
## that
Funções com o leaflet
lf_pattern = function(data, x, y, crs = 29193, pointsize = 1,
pointcolor = "black", title = 'Point Pattern', ylab = 'Y', xlab = 'X'){
# Transforming the coordinates into UTM
data = st_as_sf(data, coords = c(x, y), crs = crs)
data_utm = st_transform(data, crs = crs)
coordinates_utm = st_coordinates(data_utm)
data = data.frame(long = coordinates_utm[,1], lat = coordinates_utm[,2])
leaflet(data) %>%
addTiles() %>%
addCircleMarkers(fillOpacity = 0.5, stroke = FALSE, color = 'red', radius = 5)
}