Introduction to the bSims package

Peter Solymos

Introduction

The bSims R package is a highly scientific and utterly addictive bird point count simulator. Highly scientific, because it implements a spatially explicit mechanistic simulation that is based on statistical models widely used in bird point count analysis (i.e. removal models, distance sampling), and utterly addictive because the implementation is designed to allow rapid interactive exploration (via shiny apps) and efficient simulation (supporting various parallel backends), thus elevating the user experience.

The goals of the package are to:

  1. allow easy testing of statistical assumptions and explore effects of violating these assumptions,
  2. aid survey design by comparing different options,
  3. and most importantly, to have fun while doing it via an intuitive and interactive user interface.

The simulation interface was designed with the following principles in mind:

  1. isolation: the spatial scale is small (local point count scale) so that we can treat individual landscapes as more or less homogeneous units (but see below how certain stratified designs and edge effects can be incorporated) and independent independent in space and time;
  2. realism: the implementation of biological mechanisms and observation processes are realistic, defaults are chosen to reflect common practice and assumptions;
  3. efficiency: implementation is computationally efficient utilizing parallel computing backends when available;
  4. extensibility: the package functionality is well documented and easily extensible.

This documents outlines the major functionality of the package. First we describe the motivation for the simulation and the details of the layers. Then we outline an interactive workflow to design simulation studies and describe how to run efficient simulation experiments. Finally we present some of the current limitations of the framework and how to extend the existing functionality of the package to incorporate more of the biological realism into the simulations.

Simulation layers

Introductory stats books begin with the coin flip to introduce the binomial distribution. In R we can easily simulate an outcome from such a random variable \(Y \sim Binomial(1, p)\) doing something like this:

p <- 0.5

Y <- rbinom(1, size = 1, prob = p)

But a coin flip in reality is a lot more complicated: we might consider the initial force, the height of the toss, the spin, and the weight of the coin.

Bird behavior combined with the observation process presents a more complicated system, that is often treated as a mixture of a count distribution and a detection/nondetection process, e.g.:

D <- 2 # individuals / unit area
A <- 1 # area
p <- 0.8 # probability of availability given presence
q <- 0.5 # probability of detection given availability

N <- rpois(1, lambda = A * D)
Y <- rbinom(1, size = N, prob = p * q)

This looks not too complicated, corresponding to the true abundance being a random variables \(N \sim Poisson(DA)\), while the observed count being \(Y \sim Binomial(N, pq)\). This is the exact simulation that we need when we want to make sure that an estimator is capable of estimating the model parameters (lambda and prob here). But such probabilistic simulations are not very useful when we are interested how well the model captures important aspects of reality.

Going back to the Poisson–Binomial example, N would be a result of all the factors influencing bird abundance, such as geographical location, season, habitat suitability, number of conspecifics, competitors, or predators. Y however would largely depend on how the birds behave depending on timing, or how an observer might detect or miss the different individuals, or count the same individual twice, etc.

Therefore the package has layers, that by default are conditionally independent of each other. This design decision is meant to facilitate the comparison of certain settings while keeping all the underlying realizations identical, thus helping to pinpoint effects without the extra variability introduced by all the other effects.

The conditionally independent layers of a bSims realization are the following, with the corresponding function:

  1. landscape (bsims_init),
  2. population (bsims_populate),
  3. behavior with movement and vocalization events (bsims_animate),
  4. the physical side of the observation process (bsims_detect), and
  5. the human aspect of the observation process (bsims_transcribe).

See this example as a sneak peek that we’ll explain in the following subsections:

library(bSims)
#> Loading required package: intrval
#> Loading required package: mefa4
#> Loading required package: Matrix
#> mefa4 0.3-6   2019-06-20
#> Loading required package: MASS
#> Loading required package: deldir
#> deldir 0.1-23
#> bSims 0.2-1   2019-12-16      woonk-a-chunk

phi <- 0.5                 # singing rate
tau <- 1:3                 # detection distances by strata
tbr <- c(3, 5, 10)         # time intervals
rbr <- c(0.5, 1, 1.5, Inf) # count radii

l <- bsims_init(10, 0.5, 1)# landscape
p <- bsims_populate(l, 1)  # population
e <- bsims_animate(p,      # events
  vocal_rate=phi)
d <- bsims_detect(e,       # detections
  tau=tau)
x <- bsims_transcribe(d,   # transcription
  tint=tbr, rint=rbr)

get_table(x) # removal table
#>          0-3min 3-5min 5-10min
#> 0-50m         1      0       1
#> 50-100m       3      0       0
#> 100-150m      1      0       0
#> 150+m         8      2       0
plot(x)

Landscape

The bsims_ini function sets up the geometry of a local landscape. The extent of the landscape determines the edge lengths of a square shaped area. With no argument values passed, the function assumes a homogeneous habitat (H) in a 10 units x 10 units landscape, 1 unit is 100 meters. Having units this way allows easier conversion to ha as area unit that is often used in the North American bird literature. As a result, our landscape has an area of 1 km\(^2\).

The road argument defines the half-width of the road that is placed in a vertical position. The edge argument defines the width of the edge stratum on both sides of the road. Habitat (H), edge (E), and road (R) defines the 3 strata that we refer to by their initials (H for no stratification, HER for all 3 strata present).

The origin of the Cartesian coordinate system inside the landscape is centered at the middle of the square. The offset argument allows the road and edge strata to be shifted to the left (negative values) or to the right (positive values) of the horizontal axis. This makes it possible to create landscapes with only two strata. The bsims_init function returns a landscape object (with class ‘bsims_landscape’).

Population

The bsims_populate function populates the landscape we created by the bsims_init function, which is the first argument we have to pass to bsims_populate. The function returns a population object (with class ‘bsims_population’). The most important argument that controls how many individuals will inhabit our landscape is density that defines the expected value of individuals per unit area (1 ha). By default, density = 1 (\(D=1\)) and we have 100 ha in the landscape (\(A=100\)) which translates into 100 individuals on average (\(E[N]=\lambda=AD\)). The actual number of individuals in the landscape might deviate from this expectation, because \(N\) is a random variable (\(N \sim f(\lambda)\)). The abund_fun argument controls this relationship between the expected (\(\lambda\)) and realized abundance (\(N\)). The default is a Poisson distribution:

Changing abund_fun can be useful to make abundance constant or allow under or overdispersion, e.g.:

Once we determine how many individuals will populate the landscape, we have control over the spatial arrangement of the nest location for each individual. The default is a homogeneous Poisson point process (complete spatial randomness). Deviations from this can be controlled by the xy_fun. This function takes distance as its only argument and returns a numeric value between 0 and 1. A function function(d) reurn(1) would be equivalent with the Poisson process, meaning that every new random location is accepted with probability 1 irrespective of the distance between the new location and the previously generated point locations in the landscape. When this function varies with distance, it leads to a non-homogeneous point process via this accept-reject algorithm. The other arguments (margin, maxit, fail) are passed to the underlying accepreject function to remove edge effects and handle high rejection rates.

In the next example, we fix the abundance to be constant (i.e. not a random variable, \(N=\lambda\)) and different spatial point processes:

The get_nests function extracts the nest locations. get_abundance and get_density gives the total abundance (\(N\)) and density (\(D=N/A\), where \(A\) is extent^2) in the landscape, respectively.

If the landscape is stratified, that has no effect on density unless we specify different values through the density argument as a vector of length 3 referring to the HER strata:

Behavior

The bsims_animate function animates the population created by the bsims_populate function. bsims_animate returns an events object (with class ‘bsims_events’). The most important arguments are governing the duration of the simulation in minutes, the vocalization (vocal_rate), and the movement (move_rate) rates as average number of events per minute.

We can describe these behavioral events using survival modeling terminology. Event time (\(T\)) is a continuous random variable. In the simplest case, its probability density function is the Exponential distribution: \(f(t)=\phi e^{-t\phi}\). The corresponding cumulative distribution function is: \(F(t)=\int_{0}^{t} f(t)dt=1-e^{-t\phi}=p_t\), giving the probability that the event has occurred by duration \(t\). The parameter \(\phi\) is the rate of the Exponential distribution with mean \(1/\phi\) and variance \(1/\phi^2\).

In survival models, the complement of \(F(t)\) is called the survival function (\(S(t)=1-F(t)\), \(S(0)=1\)), which gives the probability that the event has not occurred by duration \(t\). The hazard function (\(\lambda(t)=f(t)/S(t)\)) defines the instantaneous rate of occurrence of the event (risk, the density of events at \(t\) divided by the probability of surviving). The cumulative hazard (cumulative risk) is the sum of the risks between duration 0 and \(t\) (\(\Lambda(t)=\int_{0}^{t} \lambda(t)dt\)).

The simplest survival distribution assumes constant risk over time (\(\lambda(t)=\phi\)), which corresponds to the Exponential distribution. The Exponential distribution also happens to describe the lengths of the inter-event times in a homogeneous Poisson process (events are independent, it is a ‘memory-less’ process).

bsims_animate uses independent Exponential distributions with rates vocal_rate and move_rate to simulate vocalization and movement events, respectively. The get_events function extracts the events as a data frame with columns describing the location (x, y) and time (t) of the events (v is 1 for vocalizations and 0 otherwise) for each individual (i gives the individual identifier that links individuals to the nest locations)

There are no movement related events when move_rate = 0, the individuals are always located at the nest, i.e. there is no within territory movement. If we increase the movement rate, we also have to increase the value of movement, that is the standard deviation of bivariate Normal kernels centered around each nest location. This kernel is used to simulate new locations for the movement events.

Individuals in the landscape might have different vocalization rates depending on, e.g., breeding status. Such heterogeneity can be added to the simulations as a finite mixture: vocal_rate and move_rate can be supplied as a vector, each element giving the rate for the groups. The mixture argument is then used to specify the mixture proportions.

Vocal and movement rates (and corresponding kernel standard deviations) can be defined four different ways:

Strata based groups are tracked by column s, behavior based groups are tracked as the column g in the output of get_nests.

Here is how different territory sizes can be achieved in a two-habitat landscape:

Stratum related behavior groups depend on the nest location. Sometimes it makes sense to restrict movement even further, i.e. individuals do not land in certain strata (but can cross a stratum if movement is large enough). For example we can restrict movement into the road stratum (this requires density to be 0 in that stratum):

Another way to restrict the movement of individuals is to prevent the overlap based on a Voronoi tessellation around the nest locations. Note: we are using the update method here to update the allow_overlap argument of the previous call, and also the plot method from the deldir package used for tessellation.

We haven’t mentioned the initial_location argument yet. This allows to override this whole layer and make all individuals fully available for the other layers applied on top. I.e. it is possible to study the observation process without any behavioral interference when initial_location = TRUE.

Detection

The bsims_detect function detects the events created by the bsims_animate function. bsims_detect returns a detections object (with class ‘bsims_detections’). The argument xy defines the location of the observer in the landscape. By default, it is in the middle, but can be moved anywhere within the bounds of the landscape.

tau is the parameter of the distance function dist_fun. The distance function (\(g(d)\)) describes the monotonic relationship of how the probability of detecting an individual decreases with distance (\(d\)). Detection probability at 0 distance is 1.

The most commonly used distance function is the Half-Normal. This is a one-parameter function (\(g(d) = e^{-(d/\tau)^2}\)) where probability initially remain high, reflecting an increased chance of detecting individuals closer to the observer (\(\tau^2\) is variance of the unfolded Normal distribution, \(\tau^2/2\) is the variance of the Half-Normal distribution). Run run_app("distfunH") to launch a shiny app to explore different distance functions, like Hazard rate.

The distance function must take distance d as its 1st argument and the parameter tau is its second argument (other arguments can be passed as well). E.g. the default is function(d, tau) exp(-(d/tau)^2), or the Hazard rate function can be written as function(d, tau, b=2) 1-exp(-(d/tau)^-b).

Individuals are detected via auditory and visual cues that are related to vocalization or movement events, respectively. The event_type argument determines what kinds of events can be detected, vocalization, movement, or both. Detection here refers to the Bernoulli process with probability $g(d)given the actual linear distance between the individual at that time and the observer. Theget_detectionsfunction extracts the events that are detected, the columnd` contains the distances (in 100 m units).

The tau argument can be a vector of length 3, referring to detection distances in the HER strata. When the landscape is stratified and detection distances are different among the strata the bsims_detect function uses a segmented attenuation model along the linear distance between the bird and the observer. The run_app("distfunHER") shiny explores the segmented attenuation.

Transcription

The last layer of simulation is the bsims_transcribe function that transcribes the detections created by the bsims_detect function. bsims_transcribe returns a detections object (with class ‘bsims_transcript’). This layer refers to the process of the observer assigning detected individuals to time and distance categories. The tint argument is a vector containing the endpoints of the the time intervals within the total duration in minutes. rint defines the distance bands in 100 m units, the maximum can be infinite referring to an unlimited distance count.

The error argument refers to distance estimation error. This does not impact the actual distance between the bird and the observer, but it can lead to misclassification of the distance interval where the individual is assigned. The argument is the log scale standard deviation for lognormally distributed random variable representing this error.

The condition argument defines which events will be transcribed: "event1" refers to the 1st event (detected or not), "det1" refers to the 1st detection, "alldet" means all detections (possibly counting the same individual multiple times). The event_type argument can be redefined here, too.

perception creates individual identifiers as perceived by the observer. The argument defines the perceived number of individuals relative to the actual number of individuals. It can be a non-negative number (<1 values lead to under counting, >1 values lead to over counting), or NULL (observer correctly identifies all individuals). The algorithm uses the event based locations in a hierarchical clustering. The dendrogram is cut at a height corresponding to specified perception level and group membership is used as individual identifier.

The bsims_transcribe eventually prepares a ‘removal’ table that counts the new individuals in each time/distance interval. This table is used in removal and distance sampling. The ‘visits’ table counts individuals by time and distance interval, but counting restarts in every time interval (i.e. not just the new individuals are counted). The plot method overlays the distance bands and a representation of the time intervals.

Statistical validity of the simulations

We can test the validity of the simulations when all of the assumptions are met (that is the default) in the homogeneous habitat case. We set singing rate (phi), detection distance (tau), and density (Den) for the simulations. Density is in this case unrealistically high, because we are not using replication only a single landscape. This will help with the estimation.

phi <- 0.5 # singing rate
tau <- 2   # detection distance
Den <- 10  # density

set.seed(1)
l <- bsims_init()
a <- bsims_populate(l, density=Den)
b <- bsims_animate(a, vocal_rate=phi)
o <- bsims_detect(b, tau=tau)

tint <- c(1, 2, 3, 4, 5)
rint <- c(0.5, 1, 1.5, 2) # truncated at 200 m
(x <- bsims_transcribe(o, tint=tint, rint=rint))
#> bSims transcript
#>   1 km x 1 km
#>   stratification: H
#>   total abundance: 1014
#>   duration: 10 min
#>   detected: 259 heard
#>   1st event detected by breaks:
#>     [0, 1, 2, 3, 4, 5 min]
#>     [0, 50, 100, 150, 200 m]
(y <- get_table(x, "removal")) # binned new individuals
#>          0-1min 1-2min 2-3min 3-4min 4-5min
#> 0-50m         1      3      1      2      0
#> 50-100m       7      3      5      1      1
#> 100-150m     12      2      2      1      2
#> 150-200m     13      8      2      1      1
colSums(y)
#> 0-1min 1-2min 2-3min 3-4min 4-5min 
#>     33     16     10      5      4
rowSums(y)
#>    0-50m  50-100m 100-150m 150-200m 
#>        7       17       19       25
plot(x)

We use the detect package to fit removal model and distance sampling model to the simulated output. This is handily implemented in the estimate method for the transcription objects. First we estimate singing rate, effective detection distance, and density based on truncated distance counts:

library(detect)
#> Loading required package: Formula
#> Loading required package: stats4
#> Loading required package: pbapply
#> detect 0.4-2      2018-08-29
cbind(true = c(phi=phi, tau=tau, D=Den), 
  estimate = estimate(x))
#>     true  estimate
#> phi  0.5 0.5768794
#> tau  2.0 2.2733052
#> D   10.0 8.2330714

Next we estimate singing rate, effective detection distance, and density based on unlimited distance counts:

rint <- c(0.5, 1, 1.5, 2, Inf) # unlimited

(x <- bsims_transcribe(o, tint=tint, rint=rint))
#> bSims transcript
#>   1 km x 1 km
#>   stratification: H
#>   total abundance: 1014
#>   duration: 10 min
#>   detected: 259 heard
#>   1st event detected by breaks:
#>     [0, 1, 2, 3, 4, 5 min]
#>     [0, 50, 100, 150, 200, Inf m]
(y <- get_table(x, "removal")) # binned new individuals
#>          0-1min 1-2min 2-3min 3-4min 4-5min
#> 0-50m         1      3      1      2      0
#> 50-100m       7      3      5      1      1
#> 100-150m     12      2      2      1      2
#> 150-200m     13      8      2      1      1
#> 200+m        15      9      6      6      2
colSums(y)
#> 0-1min 1-2min 2-3min 3-4min 4-5min 
#>     48     25     16     11      6
rowSums(y)
#>    0-50m  50-100m 100-150m 150-200m    200+m 
#>        7       17       19       25       38

cbind(true = c(phi=phi, tau=tau, D=Den), 
  estimate = estimate(x))
#>     true  estimate
#> phi  0.5 0.5128359
#> tau  2.0 1.9928785
#> D   10.0 9.2041636

Deviations from the assumptions and bias in density estimation can be done by systematically evaluating the simulations settings, which we describe in the next section.

Simulation workflow

We recommend exploring the simulation settings interactively in the shiny apps using run_app("distfunH") app for the homogeneous habitat case and the run_app("distfunHER") app for the stratified habitat case. The apps represent the simulation layers as tabs, the last tab presenting the settings that can be copied onto the clipboard and pasted into the R session or code. In simple situations, comparing results from a few different settings might be enough.

Let us consider the following simple comparison: we want to see how much of an effect does roads have when the only effect is that the road stratum is unsuitable. Otherwise there are no behavioral or detectability effects of the road.

tint <- c(2, 4, 6, 8, 10)
rint <- c(0.5, 1, 1.5, 2, Inf) # unlimited

## no road
b1 <- bsims_all(
  road = 0,
  density = c(1, 1, 0),
  tint = tint,
  rint = rint)
## road
b2 <- bsims_all(
  road = 0.5,
  density = c(1, 1, 0),
  tint = tint,
  rint = rint)
b1
#> bSims wrapper object with settings:
#>   road   : 0
#>   density: 1, 1, 0
#>   tint   : 2, 4, 6, 8, 10
#>   rint   : 0.5, 1, 1.5, 2, Inf
b2
#> bSims wrapper object with settings:
#>   road   : 0.5
#>   density: 1, 1, 0
#>   tint   : 2, 4, 6, 8, 10
#>   rint   : 0.5, 1, 1.5, 2, Inf

The bsims_all function accepts all the arguments we discussed before for the simulation layers. Unspecified arguments will be taken to be the default value. However, bsims_all does not evaluate these arguments, but it creates a closure with the settings. Realizations can be drawn as:

b1$new()
#> bSims transcript
#>   1 km x 1 km
#>   stratification: H
#>   total abundance: 75
#>   duration: 10 min
#>   detected: 12 heard
#>   1st event detected by breaks:
#>     [0, 2, 4, 6, 8, 10 min]
#>     [0, 50, 100, 150, 200, Inf m]
b2$new()
#> bSims transcript
#>   1 km x 1 km
#>   stratification: HR
#>   total abundance: 95
#>   duration: 10 min
#>   detected: 4 heard
#>   1st event detected by breaks:
#>     [0, 2, 4, 6, 8, 10 min]
#>     [0, 50, 100, 150, 200, Inf m]

Run multiple realizations is done as:

B <- 25  # number of runs
bb1 <- b1$replicate(B)
bb2 <- b2$replicate(B)

The replicate function takes an argument for the number of replicates (B) and returns a list of transcript objects with \(B\) elements. The cl argument can be used to parallelize the work, it can be a numeric value on Unix/Linux/OSX, or a cluster object on any OS. The recover = TRUE argument allows to run simulations with error catching.

Simulated objects returned by bsims_all will contain different realizations and all the conditionally independent layers. Use a customized layered approach if former layers are meant to be kept identical across runs.

In more complex situations the shiny apps will help identifying corner cases that are used to define a gradient of settings for single or multiple simulation options. Let us consider the following scenario: we would like to evaluate how the estimates are changing with increasing road width. We will use the expand_list function which creates a list from all combinations of the supplied inputs. Note that we need to wrap vectors inside list() to avoid interpreting those as values to iterate over.

s <- expand_list(
  road = c(0, 0.5, 1),
  density = list(c(1, 1, 0)),
  tint = list(tint),
  rint = list(rint))
str(s)
#> List of 3
#>  $ :List of 4
#>   ..$ road   : num 0
#>   ..$ density: num [1:3] 1 1 0
#>   ..$ tint   : num [1:5] 2 4 6 8 10
#>   ..$ rint   : num [1:5] 0.5 1 1.5 2 Inf
#>  $ :List of 4
#>   ..$ road   : num 0.5
#>   ..$ density: num [1:3] 1 1 0
#>   ..$ tint   : num [1:5] 2 4 6 8 10
#>   ..$ rint   : num [1:5] 0.5 1 1.5 2 Inf
#>  $ :List of 4
#>   ..$ road   : num 1
#>   ..$ density: num [1:3] 1 1 0
#>   ..$ tint   : num [1:5] 2 4 6 8 10
#>   ..$ rint   : num [1:5] 0.5 1 1.5 2 Inf

We now can use this list of settings to run simulations for each. The following illustrates the use of multiple cores:

b <- lapply(s, bsims_all)
nc <- 4 # number of cores to use
library(parallel)
cl <- makeCluster(nc)
bb <- lapply(b, function(z) z$replicate(B, cl=cl))
stopCluster(cl)

In some cases, we want to evaluate crossed effects of multiple settings. For example road width and spatial pattern (random vs. clustered):

s <- expand_list(
  road = c(0, 0.5),
  xy_fun = list(
    NULL,
    function(d) exp(-d^2/1^2) + 0.5*(1-exp(-d^2/4^2))),
  density = list(c(1, 1, 0)),
  tint = list(tint),
  rint = list(rint))
str(s)
#> List of 4
#>  $ :List of 5
#>   ..$ road   : num 0
#>   ..$ xy_fun : NULL
#>   ..$ density: num [1:3] 1 1 0
#>   ..$ tint   : num [1:5] 2 4 6 8 10
#>   ..$ rint   : num [1:5] 0.5 1 1.5 2 Inf
#>  $ :List of 5
#>   ..$ road   : num 0.5
#>   ..$ xy_fun : NULL
#>   ..$ density: num [1:3] 1 1 0
#>   ..$ tint   : num [1:5] 2 4 6 8 10
#>   ..$ rint   : num [1:5] 0.5 1 1.5 2 Inf
#>  $ :List of 5
#>   ..$ road   : num 0
#>   ..$ xy_fun :function (d)  
#>   .. ..- attr(*, "srcref")= 'srcref' int [1:8] 5 5 5 53 5 53 5 5
#>   .. .. ..- attr(*, "srcfile")=Classes 'srcfilecopy', 'srcfile' <environment: 0x7fafab6fe940> 
#>   ..$ density: num [1:3] 1 1 0
#>   ..$ tint   : num [1:5] 2 4 6 8 10
#>   ..$ rint   : num [1:5] 0.5 1 1.5 2 Inf
#>  $ :List of 5
#>   ..$ road   : num 0.5
#>   ..$ xy_fun :function (d)  
#>   .. ..- attr(*, "srcref")= 'srcref' int [1:8] 5 5 5 53 5 53 5 5
#>   .. .. ..- attr(*, "srcfile")=Classes 'srcfilecopy', 'srcfile' <environment: 0x7fafab6fe940> 
#>   ..$ density: num [1:3] 1 1 0
#>   ..$ tint   : num [1:5] 2 4 6 8 10
#>   ..$ rint   : num [1:5] 0.5 1 1.5 2 Inf

Limitations and extensions

The package is not equipped with all the possible ways to estimate the model parameters. It only has rudimentary removal modeling and distance sampling functionality implemented for the interactive visualization and testing purposes. Estimating parameters for more complex situations ( i.e. finite mixture removal models, or via Hazard rate distance functions) or estimating abundance via multiple-visit N-mixture models etc. is outside of the scope of the package and it is the responsibility of the user to make sure those work as expected.

Other intentional limitation of the package is the lack of reverse interactions between the layers. For example the presence of an observer could influence behavior of the birds close to the observer. Such features can be implemented as methods extending the current functionality.

Another limitation is that this implementation considers single species. Observers rarely collect data on single species but rather count multiple species as part of the same count. The commonness of the species, observer ability, etc. can influence the observation process when the whole community is considered. Such scenarios are also not considered at present. Although the same landscape can be reused for multiple species, and building up the simulation that way.

We do not have directionality effects of vocalization direction or wind related distortion of detection distances in the package, but that can be incorporated quite easily using a ratio relative to direct

We do not have autocorrelated behaviour (vocal or movement).