In this vignette, we walk through data preparation, variogram analysis, and maximum likelihood estimation.

Data Preparation

The first step is to import your MoveBank csv file:

yourAnimals <- as.telemetry("yourAnimalsMoveBank.csv")

Alternatively, if you want to clean your csv file first, you can import it as a data frame

yourAnimalsDF <- read.csv("yourAnimalsMoveBank.csv")

and then edit the data frame before converting it into a telemetry object for ctmm via

yourAnimals <- as.telemetry(yourAnimalsDF)

For most species, the default two-point equidistant projection will be fine, however you can provide any PROJ.4 formatted projection with the projection argument (see help(as.telemetry)). A single fixed projection should be used if you are going to plot groups of individuals that span multiple MoveBank files. This is done by default if multiple individuals are included in a single data frame.

The output of as.telemetry will be an individual telemetry object or list of telemetry objects, depending on how many individual animals are in your csv file. telemetry objects contain the components t for time in seconds, and x and y for the projected locations in meters. Times in your MoveBank file should be sorted and non-repeating.

Our example buffalo data is already prepared into a list of telemetry objects. Let us look at the first buffalo and then every buffalo:

library(ctmm)
data(buffalo)
cilla <- buffalo[[1]]
plot(cilla)
title("1 Buffalo")
plot(buffalo,col=rainbow(length(buffalo),alpha=0.5))
title("5 Buffalo")

Looking at the raw movement tracks is a good way to pick out any obvious migratory behaviors. In the future, we will have migration models to select, but for now all of our models are range resident and so only those portions of the data should be selected. These buffalo all look fairly range resident, and so we can move on to variograms.

Variograms

Variograms are an unbiased way to visualize autocorrelation structure when migration, range shifting, drift, or other translations of the mean location are not happening. When drift occurs in the data, then the variogram represents a mixture of both the drift and the autocorrelation structure, each of which contains distinct movement behaviors. In the future, we will have models that can allow for drift, but the current models assume range residence, which we can check with the variogram.

var <- variogram(cilla)
plot(var,fraction=0.005)
title("zoomed in")
plot(var,fraction=0.65,alpha=0.5)
title("zoomed out")

The first plot is zoomed in to the short lag behavior, while the second plot is zoomed out. You can do this on the fly with zoom(cilla) in R-studio. The variogram represents the average square distance traveled (vertical axis) within some time lag (horizontal axis).

For the long range behavior we can see that the variogram flattens (asymptotes) at approximately 20 days. This is, roughly, how coarse you need to make the timeseries so that methods assuming independence (no autocorrelation) can be valid. This includes, conventional kernel density estimation (KDE), minimum convex polygon (MCP), conventional species distribution modeling (SDM), and a host of other analyses.

The asymptote of our variogram is around 23 square km, and the fact that it takes roughly 20 days for the variogram to asymptote is indicative of the fact that the buffalo’s location appears continuous at this timescale. This is also, roughly, the time it takes for the buffalo to cross its home range. We can guesstimate some continuous-time models for this behavior with the commands

m0 <- ctmm(sigma=23*1000^2) # 23 km^2 in m^2
m1 <- ctmm(sigma=23*1000^2,tau=6*24*60^2) # and 6 days in seconds
plot(var,CTMM=m0,fraction=0.65,alpha=0.5,col.CTMM="red")
title("m0")
plot(var,CTMM=m1,fraction=0.65,alpha=0.5,col.CTMM="purple")
title("m1")

where for both the models m0 and m1, sigma is the asymptotic variance. In model m1, tau is a single timescale that governs the autocorrelation in position and dictates the animal’s home-range crossing time. The null model m0 has no autocorrelation. Notice that all units are in meters and seconds.

The uncorrelated model m0 is obviously incorrect and in the zoomed in plot we can also see that the model m1 is incorrectly linear at short lags, whereas the empirical variogram actually curves up for an hour or two before it becomes linear. Let us introduce a model that incorporates this behavior.

m2 <- ctmm(sigma=23*1000^2,tau=c(6*24*60^2,1*60^2)) # and 1 hour in seconds
plot(var,CTMM=m1,fraction=0.002,col.CTMM="purple")
title("m1")
plot(var,CTMM=m2,fraction=0.002,col.CTMM="blue")
title("m2")

The confidence intervals at short lags are also very narrow, though both of these models look the same at coarser scales and so the discrepancy is only revealed by high resolution data.

plot(var,CTMM=m1,fraction=0.65,alpha=0.5,col.CTMM="purple")
title("m1")
plot(var,CTMM=m2,fraction=0.65,alpha=0.5,col.CTMM="blue")
title("m2")

The model m2 introduces an additional autocorrelation timescale for the animal’s velocity, so that it more closely matches the initial behavior of the variogram. The initial curve upwards tells us that there is continuity in the animal’s velocity at this timescale. Conventional Markovian animal movement models do not capture this, which leads to the same kind of bias and underestimation of confidence intervals as when ignoring autocorrelation entirely.

The linear regime of the variogram (regular diffusion) is just as important as the asymptotic regime. In the linear regime it is reasonable to assume a Markovian model as with step selection functions (SSF) and Brownian bridges (BB). Therefore, the variogram has informed us as to how much we need to coarsen our data for it to be appropriate in many common analyses that neglect various aspects of movement.

Finally, the R-studio function variogram.fit(var) is much easier to use than guestimating the model parameters by hand as we did above. variogram.fit gives you sliders to choose the most visually appropriate parameters and save them to a global variable (global.variogram.fit by default).

Variogram Error is Autocorrelated

It is important to note that variogram errors—the difference between the empirical variogram and the true semi-variance function—are themselves autocorrelated. Therefore, the smooth wiggling around that the point estimate does within the confidence bands is not necessarily meaningful. To demonstrate this, let us simulate some data from the model m2 and look at its empirical variogram.

# simulate fake buffalo with the same sampling schedule
willa <- simulate(m2,t=cilla$t)
plot(willa)
title("simulation")
# now calculate and plot its variogram
var2 <- variogram(willa)
plot(var2,CTMM=m2,fraction=0.65,alpha=c(0.5,0.05),col.CTMM="blue")
title("simulation")

Non-Stationarity in Stationary Variograms

Non-stationary behaviors, like a seasonal change in variance, is averaged over in the variogram. Moreover, if we fit a stationary model to non-stationary data, we are estimating an average effect. For instance, if an animal rests at night and diffuses at some rate D during the day, then without modeling the rest behavior we estimate an average of zero and D. Its not terribly detrimental to average over frequently repeated non-stationarity, but if an animal migrates once in a dataset then this behavior really needs to be included in the model. These kinds of models will be included in future versions of ctmm.

More Models

Telemetry Error

The GPS buffalo example do not exhibit telemetry errors that are significant enough to notice in our variograms. If we were working with ARGOS data or the high-resolution and unfiltered GPS data of a small animal, then we get a “nugget” effect that looks like an initial discontinuity at short time lags.

The height of this initial discontinuity corresponds to the variance of uncorrelated location errors. You will soon be able to incorporate these kinds of errors into ctmm analysis.

The second plot is a depiction of the kind of initial discontinuity one has with detector array data. The end of the (slope) discontinuity is highlighted with a circle. This discontinuity is smooth because the movement and detection are correlated. The height of this initial discontinuity is also (at least roughly) the variance of the location errors.

Cycles and Periodicities

One-Off Migrations

Repeated Migrations

Model Fitting

Now let us fit each of our proposed models m0, m1, m2, store the corresponding best-fit result in M0, M1, M2, and then compare some of their outputs.

M0 <- ctmm.fit(cilla,m0)
summary(M0)
##                               low      ML     high
## area (square kilometers) 432.9209 432.923 432.9251
M1 <- ctmm.fit(cilla,m1)
summary(M1)
##                                 low       ML      high
## area (square kilometers) 206.178671 397.2375 649.89860
## tau position (days)        5.669662  12.9888  29.75644
M2 <- ctmm.fit(cilla,m2)
summary(M2)
##                                 low         ML      high
## area (square kilometers) 280.445510 441.652201 638.87717
## tau position (days)        3.503477   5.954729  10.12103
## tau velocity (minutes)    43.800426  46.791126  49.98603
## speed (kilometers/day)    10.923133  11.105718  11.29136

Notice how tiny the (Gaussian) area uncertainty is in model M0. Let us look into some details of the models.

TAB <- rbind( c(M0$AICc,M0$DOF.mu) , c(M1$AICc,M1$DOF.mu) , c(M2$AICc,M2$DOF.mu) )
colnames(TAB) <- c("AICc","DOF(mu)")
rownames(TAB) <- c("M0","M1","M2")
TAB
##        AICc     DOF(mu)
## M0 139099.6 3528.000000
## M1 103336.5    6.648584
## M2 101878.2   13.252764

AICc is the (linearly) corrected Akaike information criteria. AIC balances likelihood against model complexity in a way that is good if we want to make optimal predictions. A lower AIC is better. Getting the AIC to go down by 5 is great, while getting the AIC to go down by 10 is awesome. Our AIC is going down by thousands.

The fit parameter DOF.mu is the number of degrees of freedom worth of data we have to estimate the mean parameter mu, assuming that the model is correct. Notice that the uncorrelated model M0 perceives thousands of independent data points, while the autocorrelated models M1 and M2 only see a handful of independent data points. This is why the uncorrelated model produced tiny confidence intervals on the predicted (Gaussian) area.

Back to the Variogram

Now its time to make sure that our selected model is explaining the most significant features of the animal’s movement. Let us plot our variogram again with our fit models

plot(var,CTMM=list(M0,M1,M2),col.CTMM=c("red","purple","blue"),fraction=0.65,alpha=0.5)
title("zoomed out")
plot(var,CTMM=list(M0,M1,M2),col.CTMM=c("red","purple","blue"),fraction=0.002,alpha=0.5)
title("zoomed in")

Notice that the purple model M1 is significantly biased downward and is underestimating diffusion. This is because the continuous-velocity behavior at short time lags, which M1 does not account for, is throwing off the estimate. M0 is ignoring autocorrelation completely, while M1 is ignoring autocorrelation in the buffalo’s velocity.