library(barrks)
library(tidyverse)
library(terra)
# function to unify the appearance of raster plots
my_rst_plot <- function(rst, ...) {
plot(rst, mar = c(0.2, 0.1, 2, 5),
axes = FALSE, box = TRUE, nr = 1,
cex.main = 1.9, plg = list(cex = 1.8), ...)
}
Calculate phenology
In this vignette, the sample data delivered with barrks
is used to calculate the phenology with all models available in the
package. Note that the daylength threshold for diapause initiation of
the Jönsson model is adapted to Central Europe according to Baier, Pennerstorfer, and Schopf (2007).
data <- barrks_data()
# calculate phenology
phenos <- list('phenips-clim' = phenology('phenips-clim', data),
'phenips' = phenology('phenips', data),
'rity' = phenology('rity', data),
'lange' = phenology('lange', data),
# customize the Jönsson model for Central Europe
'joensson' = phenology(model('joensson', daylength_dia = 14.5), data),
'bso' = bso_phenology(.data = data) %>% bso_translate_phenology(),
'chapy' = phenology('chapy', data))
Spatial outputs
barrks
provides different functions to examine the
results of the phenology calculations. This section describes the
application of the basic functions that return spatial outputs.
Day-of-year-rasters
The onset of infestation, initiation of diapause and the
frost-induced mortality are described as the corresponding day of year.
That data can be attained via get_onset_rst()
,
get_diapause_rst()
or get_mortality_rst()
. As
some models have not all submodels implemented and
terra::panel()
does not allow adding empty rasters, a
workaround-function is defined to plot the the respective submodel
outputs. Additionally, it draws the borders of the area of interest.
plot_doy_panel <- function(x) {
aoi <- as.polygons(data[[1]][[1]] * 0)
draw_aoi_borders <- function(i) {
if(empty[i]) polys(aoi, lwd = 2, col = 'white')
else polys(aoi, lwd = 2)
}
# replace NULL by a raster with values in the overall range to not affect the legend
# the raster will be overplotted by `draw_aoi_borders()`
rst_tmp <- data[[1]][[1]] * 0 + min(minmax(rast(discard(x, is.null)))[1,])
empty <- map_lgl(x, \(y) is.null(y))
walk(which(empty), \(i) x[[i]] <<- rst_tmp)
panel(rast(x),
names(x),
col = viridisLite::viridis(100, direction = -1),
axes = FALSE,
box = TRUE,
loc.main = 'topright',
fun = draw_aoi_borders,
cex.main = 1.9,
plg = list(cex = 1.8))
}
plot_doy_panel(map(phenos, \(p) get_onset_rst(p)))
plot_doy_panel(map(phenos, \(p) get_diapause_rst(p)))
plot_doy_panel(map(phenos, \(p) get_mortality_rst(p)[[1]]))
data:image/s3,"s3://crabby-images/e1562/e15621c96b9836d8bb262d4c53c357832b5e36ef" alt="Day of year when the infestation begins"
Day of year when the infestation begins
data:image/s3,"s3://crabby-images/a5b56/a5b568b15ed93d2f57471460ae6053995ed8cbdc" alt="Day of year when the diapause begins (in white cells no diapause was induced)"
Day of year when the diapause begins (in white cells no diapause was induced)
data:image/s3,"s3://crabby-images/137b8/137b8ec6a89860ab3461824a8ac9a4368a1778d9" alt="Day of year of the first frost-induced mortality event in autumn/winter (in white cells no mortality occured)"
Day of year of the first frost-induced mortality event in autumn/winter (in white cells no mortality occured)
Generations
To get an overview of the establishment of generations, it is
possible to plot the prevailing generations on different dates using
get_generations_rst()
and my_rst_plot()
.
# dates to plot
dates <- c('2015-04-15', '2015-06-15', '2015-08-15', '2015-10-15')
# walk through all phenology models
walk(names(phenos), \(key) {
p <- phenos[[key]]
# plot generations of current model
get_generations_rst(p, dates) %>% my_rst_plot(main = paste0(key, '-', dates))
})
data:image/s3,"s3://crabby-images/f2214/f2214464f76efeee9e2f4ac35d2f6e74aedabaf4" alt="Generations calculated by PHENIPS-Clim"
Generations calculated by PHENIPS-Clim
data:image/s3,"s3://crabby-images/c2fcb/c2fcbb3df7b6e5ca0ef2ca4df9980814555e9d16" alt="Generations calculated by PHENIPS"
Generations calculated by PHENIPS
data:image/s3,"s3://crabby-images/854ef/854ef6543f07752953b0b5bfe82720ddc1c1da18" alt="Generations calculated by RITY"
Generations calculated by RITY
data:image/s3,"s3://crabby-images/f0e87/f0e8790bcf90ed4584be8143425291b4c489a76f" alt="Generations calculated by the Lange model"
Generations calculated by the Lange model
data:image/s3,"s3://crabby-images/979f1/979f14c1929ce17acaaf993f5cc99ea65fbb5bfe" alt="Generations calculated by the Jönsson model"
Generations calculated by the Jönsson model
data:image/s3,"s3://crabby-images/f87a1/f87a1189fc701bfe2562c62c8130585f04f8d67f" alt="Generations calculated by BSO"
Generations calculated by BSO
data:image/s3,"s3://crabby-images/38cff/38cff8306a591082fba882cdcc8d9f20bc8fbac9" alt="Generations calculated by CHAPY"
Generations calculated by CHAPY
Stationwise outputs
To plot the development diagrams of particular raster cells, stations
can be defined by specifying their cell numbers. To get the stations’
coordinates, terra::xyFromCell
can be used.
# plot the locations of the stations
rst_aoi <- data[[1]][[1]] * 0
stations <- stations_create(c('station 1', 'station 2'), c(234 345))
station_coords <- vect(xyFromCell(rst_aoi, stations_cells(stations)))
plot(rst_aoi, col = '#AAAAAA', legend = FALSE, axes = FALSE, box = TRUE)
plot(station_coords, col = 'red', pch = 4, add = TRUE)
text(station_coords, names(stations), col = 'black', pos = 2)
data:image/s3,"s3://crabby-images/79163/79163759ef6e8547abc27c322bbbce871aba79a2" alt="Stations map"
Stations map
The stations should be passed to
plot_development_diagram()
to get the desired plots. Here,
only the models PHENIPS-Clim and PHENIPS are plotted to reduce the
complexity of the diagrams.
# plot the development diagrams
limits <- as.Date(c('2015-04-01', '2015-12-31'))
models <- c('phenips-clim', 'phenips')
walk(1:length(stations), \(i) {
plot_development_diagram(phenos[models],
stations[i],
.lty = 1:length(models),
.group = FALSE,
xlim = limits)
})
data:image/s3,"s3://crabby-images/308a7/308a790154f7037f93b95e707f1206a6e7a46bcb" alt="Development diagram for station 1"
Development diagram for station 1
data:image/s3,"s3://crabby-images/301c5/301c5aff1cef6c957030ac55f4c04e238221333f" alt="Development diagram for station 2"
Development diagram for station 2