Skip to content
forked from r-spatial/dtwSat

Time-Weighted Dynamic Time Warping for satellite image time series analysis

License

Notifications You must be signed in to change notification settings

Kira1690/dtwSat

 
 

Repository files navigation

dtwSat

Build Status License CRAN month total

Time-Weighted Dynamic Time Warping for satellite image time series analysis

The package dtwSat provides an implementation of the Time-Weighted Dynamic Time Warping (TWDTW) method for land cover mapping using multi-band satellite image time series (Maus et al. 2016, 2019). dtwSat provides full cycle of land cover classification using image time series, ranging from selecting temporal patterns to visualising, and assessing the results. Bellow we show a quick demo of the package usage.

Install

The GitHub version requires the package devtools

install.packages("devtools")
devtools::install_github("vwmaus/dtwSat")

Quick demo

In this quick demo we will perform a TWDTW analysis for a single time series. The data for the analysis are a set of temporal patterns in MOD13Q1.patterns.list and an example of time series in MOD13Q1.ts in the Brazilian state of Mato Grosso. These time series are in zoo format and come with the package installation. Suppose that we want to know the crop type of each subinterval in following time series:

library(dtwSat)
# Create and plot object time series 
ts <- twdtwTimeSeries(MOD13Q1.ts)
class(ts)
plot(ts, type = "timeseries")
Fig. 1. Example time series which we want to classify.

Fig. 1. Example time series which we want to classify.

For this region in Brazil we have a set of well known temporal patterns derived from field observations, such that:

# Create and plot object time series 
patt <- twdtwTimeSeries(MOD13Q1.MT.yearly.patterns)
class(patt)
plot(patt, type = "patterns") 
Fig. 2. Typical temporal patterns of *soybean*, *cotton*, and *maize*.

Fig. 2. Typical temporal patterns of *soybean*, *cotton*, and *maize*.

Using these temporal patterns we run the TWDTW analysis, such that

# Define logistic time-weight, see Maus et al. (2016)
log_fun <- logisticWeight(alpha = -0.1, beta = 50) 
# Run TWDTW analysis 
matches <- twdtwApply(x = ts, y = patt, weight.fun = log_fun, keep = TRUE) 

The result is a twdtwMatches object with all possible matches of the patterns to the time series

class(matches)
## [1] "twdtwMatches"
## attr(,"package")
## [1] "dtwSat"
show(matches)
## An object of class "twdtwMatches"
## Number of time series: 1 
## Number of alignments: 56 
## Patterns labels: Cotton-fallow Forest Low vegetation Pasture Soybean-cotton Soybean-fallow Soybean-maize Soybean-millet Soybean-sunflower Water Wetland

We can use several plot methods to visualize the results of the analysis in the twdtwMatches object, for example, to plot the alignments

plot(x = matches, type = "alignments", threshold = 2)
Fig. 3. TWDTW alignments over time and cost (distance) in y-axis.

Fig. 3. TWDTW alignments over time and cost (distance) in y-axis.

to plot matching point

plot(x = matches, type = "matches", attr = "evi", patterns.labels = "Soybean-cotton", k <- 1) 
Fig. 1. The four best matches of *soybean*.

Fig. 1. The four best matches of *soybean*.

to plot minimum cost paths

plot(x = matches, type = "paths", patterns.labels = "Soybean-cotton") 
Fig. 2. The minimum cost path of the TWDTW alignment for each crop type.

Fig. 2. The minimum cost path of the TWDTW alignment for each crop type.

and, finally to classify the subintervals of the time series. The plot will select the best match for each period of 6 months, i.e. the class for each period.

plot(x = matches, type = "classification",
     from = "2009-09-01", to = "2014-08-31", 
     by = "12 month", overlap = 0.5) 
Fig. 3. Classification using the best match for each subinterval.

Fig. 3. Classification using the best match for each subinterval.

Raster time series classification

The next example shows how to classify a raster time series, i.e. the same as we did in the quick demo but now for each pixel location. For that we use a set of MODIS (MOD13Q1 product) images from 2007 to 2013 for a region in the Brazilian Amazon. These data is included in the package installation. Load raster time series:

evi  <- brick(system.file("lucc_MT/data/evi.tif",  package = "dtwSat"))
ndvi <- brick(system.file("lucc_MT/data/ndvi.tif", package = "dtwSat"))
red  <- brick(system.file("lucc_MT/data/red.tif",  package = "dtwSat"))
blue <- brick(system.file("lucc_MT/data/blue.tif", package = "dtwSat"))
nir  <- brick(system.file("lucc_MT/data/nir.tif",  package = "dtwSat"))
mir  <- brick(system.file("lucc_MT/data/mir.tif",  package = "dtwSat"))
doy  <- brick(system.file("lucc_MT/data/doy.tif",  package = "dtwSat"))

Load the dates of the MODIS images:

timeline <- scan(system.file("lucc_MT/data/timeline", package = "dtwSat"), what = "date")

Build raster time series:

rts <- twdtwRaster(evi, ndvi, red, blue, nir, mir, timeline = timeline, doy = doy)

Load the set of ground truth samples and projection information:

field_samples <- read.csv(system.file("lucc_MT/data/samples.csv", package = "dtwSat"))
proj_str <- scan(system.file("lucc_MT/data/samples_projection", package = "dtwSat"), what = "character")

We use the package caret to split the samples into training (10%) and validation (90%)

library(caret)
set.seed(1)
I <- unlist(createDataPartition(field_samples$label, p = 0.1))
training_samples <- field_samples[I, ]
validation_samples <- field_samples[-I, ]

Extract training time series from raster time series

training_ts <- getTimeSeries(rts, y = training_samples, proj4string = proj_str)
validation_ts <- getTimeSeries(rts, y = validation_samples, proj4string = proj_str)

Create temporal patterns using training samples

temporal_patterns <- createPatterns(training_ts, freq = 8, formula = y ~ s(x))
plot(temporal_patterns, type = "patterns") 
Fig. 4. Typical temporal patterns of *Cotton-fallow*, *Forest*, *Soybean-cotton*, *Soybean-maize*, and *Soybean-millet*.

Fig. 4. Typical temporal patterns of *Cotton-fallow*, *Forest*, *Soybean-cotton*, *Soybean-maize*, and *Soybean-millet*.

Apply TWDTW analysis:

# Define logistic time-weight, see Maus et al. (2016)
log_fun <- logisticWeight(-0.1, 50)

# Run TWDTW analysis 
r_twdtw <- twdtwApply(x = rts, y = temporal_patterns, weight.fun = log_fun, progress = 'text')

Classify raster raster time series using the results from the TWDTW analysis

r_lucc <- twdtwClassify(r_twdtw, progress = 'text')

Visualizing the results.

Land cover maps

plot(x = r_lucc, type = "maps")
Fig. 5. Land cover maps based on TWDTW analysis.

Fig. 5. Land cover maps based on TWDTW analysis.

Land cover area for each class over time

plot(x = r_lucc, type = "area")
Fig. 6. Land cover area based on TWDTW analysis.

Fig. 6. Land cover area based on TWDTW analysis.

Land cover changes over time (gains and losses from/to classes)

plot(x = r_lucc, type = "changes")
Fig. 7. Land cover changes based on TWDTW analysis.

Fig. 7. Land cover changes based on TWDTW analysis.

We use the validation samples to compute the metrics for accuracy assessment.

twdtw_assess <- twdtwAssess(object = r_lucc, y = validation_samples, 
  proj4string = proj_str, conf.int = .95) 
show(twdtw_assess)
## An object of class "twdtwAssessment"
## Number of classification intervals: 6 
## Accuracy metrics summary
## 
## Overall
## Accuracy      Var       sd      ci* 
##   0.9615   0.0001   0.0100   0.0196 
## 
## User's
##                Accuracy     Var    sd   ci*
## Cotton-fallow      0.95 0.00071 0.027 0.052
## Forest             1.00 0.00000 0.000 0.000
## Soybean-cotton     1.00 0.00000 0.000 0.000
## Soybean-maize      0.92 0.00059 0.024 0.048
## Soybean-millet     1.00 0.00000 0.000 0.000
## unclassified       1.00 0.00000 0.000 0.000
## 
## Producer's
##                Accuracy     Var    sd   ci*
## Cotton-fallow      1.00 0.00000 0.000 0.000
## Forest             1.00 0.00000 0.000 0.000
## Soybean-cotton     0.68 0.00516 0.072 0.141
## Soybean-maize      1.00 0.00000 0.000 0.000
## Soybean-millet     0.93 0.00078 0.028 0.055
## unclassified       1.00 0.00000 0.000 0.000
## 
## Area and uncertainty
##                 Mapped Adjusted     ci*
## Cotton-fallow  4.3e+07  4.1e+07 2249196
## Forest         7.4e+07  7.4e+07       0
## Soybean-cotton 1.6e+07  2.4e+07 4973269
## Soybean-maize  1.2e+08  1.1e+08 5884484
## Soybean-millet 6.5e+07  6.9e+07 4065291
## unclassified   0.0e+00  0.0e+00       0
## 
## * 95 % confidence interval

Visualizing User’s and Producer’s accuracy

plot(twdtw_assess, type = "accuracy")
Fig. 8. User's and Producer's accuracy.

Fig. 8. User’s and Producer’s accuracy.

Visualizing area uncertainty

plot(twdtw_assess, type = "area")
Fig. 9. Area uncertainty.

Fig. 9. Area uncertainty.

For further discussion on the package and learn more about the TWDTW method see, Maus et al. (2016) and Maus et al. (2019).

References

Maus, Victor, Gilberto Camara, Marius Appel, and Edzer Pebesma. 2019. “dtwSat: Time-Weighted Dynamic Time Warping for Satellite Image Time Series Analysis in R.” Journal of Statistical Software 88 (5): 1–31. https://doi.org/10.18637/jss.v088.i05.

Maus, Victor, Gilberto Camara, Ricardo Cartaxo, Alber Sanchez, Fernando M. Ramos, and Gilberto R. de Queiroz. 2016. “A Time-Weighted Dynamic Time Warping Method for Land-Use and Land-Cover Mapping.” IEEE Journal of Selected Topics in Applied Earth Observations and Remote Sensing 9 (8): 3729–39. https://doi.org/10.1109/JSTARS.2016.2517118.

About

Time-Weighted Dynamic Time Warping for satellite image time series analysis

Resources

License

Stars

Watchers

Forks

Packages

No packages published

Languages

  • R 91.1%
  • Fortran 7.5%
  • Other 1.4%