diff --git a/DESCRIPTION b/DESCRIPTION index 9b4bc09..2f82f81 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -1,7 +1,7 @@ Package: tsmp Type: Package Title: Time Series with Matrix Profile -Version: 0.2.13.9053 +Version: 0.2.14.9009 Authors@R: c( person("Francisco", "Bischoff", email = "fbischoff@med.up.pt", role = c("aut", "cre"), comment = c(ORCID = "https://orcid.org/0000-0002-5301-8672")), person("Michael", "Yeh", email = "myeh003@ucr.edu", role = c("res", "ccp", "ctb"), comment = c(ORCID = "https://orcid.org/0000-0002-9807-2963")), @@ -15,6 +15,7 @@ URL: https://github.com/franzbischoff/tsmp BugReports: https://github.com/franzbischoff/tsmp/issues Depends: R (>= 2.10), audio, doSNOW, parallel, foreach Encoding: UTF-8 +Language: en-US LazyData: true Roxygen: list(markdown = TRUE) RoxygenNote: 6.1.0 diff --git a/NAMESPACE b/NAMESPACE index 738335e..0617192 100644 --- a/NAMESPACE +++ b/NAMESPACE @@ -20,7 +20,6 @@ export(stamp) export(stamp.par) export(unconstrain.search) import(audio) -import(beepr) import(doSNOW) import(foreach) import(parallel) diff --git a/R/fluss.R b/R/fluss.R index 2a94c17..bc4ef17 100644 --- a/R/fluss.R +++ b/R/fluss.R @@ -125,7 +125,7 @@ fluss.extract <- function(arc.counts, num.segments, window.size, exclusion.zone #' Computes the arc count with edge correction (CAC). #' #' Original paper suggest using the classic statistical-process-control heuristic to set a threshold -#' where a semantic change may occur in CAC. This may be useful in realtime implementation as we don't +#' where a semantic change may occur in CAC. This may be useful in real-time implementation as we don't #' know in advance the number of domain changes to look for. Please check original paper (1). #' #' @param profile.index the profile index for arc counting. diff --git a/R/m_guide_search.R b/R/m_guide_search.R index 66afa67..c39ccf9 100644 --- a/R/m_guide_search.R +++ b/R/m_guide_search.R @@ -4,7 +4,7 @@ #' #' Although this functions handles Multivariate Time Series, it can also be used to handle Univariate Time Series. #' -#' @param data a `matrix` of `numeric`, where each colums is a time series. Accepts `vector` (see details), `list` and `data.frame` too. +#' @param data a `matrix` of `numeric`, where each column is a time series. Accepts `vector` (see details), `list` and `data.frame` too. #' @param window.size an `int` with the size of the sliding window. #' @param matrix.profile multidimensional matrix profile (matrix) #' @param profile.index multidimensional profile index (from [mstomp()] or [mstomp.par()]). diff --git a/R/m_unconstrain_search.R b/R/m_unconstrain_search.R index b9ab749..dbaf0ed 100644 --- a/R/m_unconstrain_search.R +++ b/R/m_unconstrain_search.R @@ -4,7 +4,7 @@ #' #' Although this functions handles Multivariate Time Series, it can also be used to handle Univariate Time Series. #' -#' @param data a `matrix` of `numeric`, where each colums is a time series. Accepts `vector` (see details), `list` and `data.frame` too. +#' @param data a `matrix` of `numeric`, where each column is a time series. Accepts `vector` (see details), `list` and `data.frame` too. #' @param window.size an `int` with the size of the sliding window. #' @param matrix.profile multidimensional matrix profile (from [mstomp()] or [mstomp.par()]). #' @param profile.index multidimensional profile index (from [mstomp()] or [mstomp.par()]). diff --git a/R/misc.R b/R/misc.R index eb55b28..370a4bc 100644 --- a/R/misc.R +++ b/R/misc.R @@ -70,9 +70,35 @@ fast.movavg <- function(data, n) { std <- function(x) { sdx <- stats::sd(x) - if (sdx == 0) + if (sdx == 0) { return(sdx) + } return(sqrt((length(x) - 1) / length(x)) * sdx) } +#' Play sound with `audio` +#' +#' @param data sound data provided by this package +#' +#' @keywords internal +#' @import audio +beep <- function(data) { + if (!(is.null(audio::audio.drivers()) || nrow(audio::audio.drivers()) == 0)) { + tryCatch({ + audio::play(data) + }, + error = function(cond) { + message("Failed to play audio alert") + message(cond) + invisible() + }, + warning = function(cond) { + message("Something went wrong playing audio alert") + message(cond) + invisible() + } + ) + } + invisible() +} diff --git a/R/mstomp.R b/R/mstomp.R index be68679..810f5ec 100644 --- a/R/mstomp.R +++ b/R/mstomp.R @@ -8,7 +8,7 @@ #' Although this functions handles Multivariate Time Series, it can also be used to handle Univariate Time Series. #' `verbose` changes how much information is printed by this function; `0` means nothing, `1` means text, `2` means text and sound. #' -#' @param data a `matrix` of `numeric`, where each colums is a time series. Accepts `vector` (see details), `list` and `data.frame` too. +#' @param data a `matrix` of `numeric`, where each column is a time series. Accepts `vector` (see details), `list` and `data.frame` too. #' @param window.size an `int` with the size of the sliding window. #' @param must.dim an `int` or `vector` of which dimensions to forcibly include (default is `NULL`). #' @param exc.dim an `int` or `vector` of which dimensions to exclude (default is `NULL`). @@ -114,7 +114,7 @@ mstomp <- function(data, window.size, must.dim = NULL, exc.dim = NULL, exclusion on.exit(close(pb)) } if (verbose > 1) { - on.exit(audio::play(sounds[[1]]), TRUE) + on.exit(beep(sounds[[1]]), TRUE) } ## initialization @@ -198,7 +198,7 @@ mstomp <- function(data, window.size, must.dim = NULL, exc.dim = NULL, exclusion if (n.dim > 1) { dist.pro.sort <- t(apply(distance.profile, 1, sort)) - } # sort by row, put all -Inf to the first columns + } # sort by row, put all -Inf to the first column else { dist.pro.sort <- distance.profile } diff --git a/R/mstomp_par.R b/R/mstomp_par.R index cdfe947..a481426 100644 --- a/R/mstomp_par.R +++ b/R/mstomp_par.R @@ -8,7 +8,7 @@ #' Although this functions handles Multivariate Time Series, it can also be used to handle Univariate Time Series. #' `verbose` changes how much information is printed by this function; `0` means nothing, `1` means text, `2` means text and sound. #' -#' @param data a `matrix` of `numeric`, where each colums is a time series. Accepts `vector` (see details), `list` and `data.frame` too. +#' @param data a `matrix` of `numeric`, where each column is a time series. Accepts `vector` (see details), `list` and `data.frame` too. #' @param window.size an `int`. Size of the sliding window. #' @param must.dim an `int` or `vector` of which dimensions to forcibly include (default is `NULL`). #' @param exc.dim an `int` or `vector` of which dimensions to exclude (default is `NULL`). @@ -29,9 +29,8 @@ #' #' @examples #' # using all dimensions -#' Sys.sleep(1) # sometimes sleep is needed if you run parallel multiple times in a row #' mp <- mstomp.par(toy_data$data[1:100,], 30, verbose = 0) -#' @import audio doSNOW foreach parallel +#' @import doSNOW foreach parallel mstomp.par <- function(data, window.size, must.dim = NULL, exc.dim = NULL, exclusion.zone = 1 / 2, verbose = 2, n.workers = 2) { eps <- .Machine$double.eps^0.5 @@ -140,7 +139,7 @@ mstomp.par <- function(data, window.size, must.dim = NULL, exc.dim = NULL, exclu on.exit(close(pb), TRUE) } if (verbose > 1) { - on.exit(audio::play(sounds[[1]]), TRUE) + on.exit(beep(sounds[[1]]), TRUE) } ## initialize variable diff --git a/R/sdts_predict.R b/R/sdts_predict.R index 757c633..7512acf 100644 --- a/R/sdts_predict.R +++ b/R/sdts_predict.R @@ -87,7 +87,7 @@ sdts.predict <- function(model, data, window.size) { #' `beta` is used to balance F-score towards recall (`>1`) or precision (`<1`). #' #' @param gtruth a `vector` of `logical`. Ground truth annotation. -#' @param pred a `vector` of `logical`. Predictied annotation from [sdts.predict()] +#' @param pred a `vector` of `logical`. Predicted annotation from [sdts.predict()] #' @param beta a `numeric`. See details. (default is `1`). #' #' @return Returns a `list` with `f.score`, `precision` and `recall`. diff --git a/R/sdts_train.R b/R/sdts_train.R index 57d39a3..0988d90 100644 --- a/R/sdts_train.R +++ b/R/sdts_train.R @@ -148,7 +148,7 @@ sdts.train <- function(data, label, window.size, beta = 1, pat.max = Inf, parall on.exit(close(pb)) } if (verbose > 1) { - on.exit(audio::play(sounds[[1]]), TRUE) + on.exit(beep(sounds[[1]]), TRUE) } for (i in 1:n.window.size) { @@ -342,7 +342,7 @@ sdts.train <- function(data, label, window.size, beta = 1, pat.max = Inf, parall #' @param beta a number that balance the F-Score. Beta > 1 towards recall, < towards precision #' @param window.size an integer with the sliding window size #' -#' @return Returns the best threashold and its F-Score +#' @return Returns the best threshold and its F-Score #' #' @keywords internal #' @@ -384,7 +384,7 @@ golden.section <- function(dist.pro, label, pos.st, pos.ed, beta, window.size) { #' @param window.size an integer with the sliding window size #' @param fit.idx an integer with the index of the current threshold #' -#' @return Returns the best threashold and its F-Score +#' @return Returns the best threshold and its F-Score #' #' @keywords internal diff --git a/R/simple.R b/R/simple.R index e31156c..62ddc4e 100644 --- a/R/simple.R +++ b/R/simple.R @@ -4,7 +4,7 @@ #' #' `verbose` changes how much information is printed by this function; `0` means nothing, `1` means text, `2` means text and sound. #' -#' @param data a `matrix` of `numeric`, where each colums is a time series. Accepts `list` and `data.frame` too. +#' @param data a `matrix` of `numeric`, where each column is a time series. Accepts `list` and `data.frame` too. #' @param window.size an `int` with the size of the sliding window. #' @param exclusion.zone a `numeric`. Size of the exclusion zone, based on query size (default is `1/2`). #' @param verbose an `int`. See details. (Default is `2`). @@ -76,7 +76,7 @@ simple.fast <- function(data, window.size, exclusion.zone = 1 / 2, verbose = 2) on.exit(close(pb)) } if (verbose > 1) { - on.exit(audio::play(sounds[[1]]), TRUE) + on.exit(beep(sounds[[1]]), TRUE) } ## compute necessary values diff --git a/R/stamp.R b/R/stamp.R index d6f4809..542ddb6 100644 --- a/R/stamp.R +++ b/R/stamp.R @@ -10,7 +10,7 @@ #' @param ... a `matrix` or a `vector`. If a second time series is supplied it will be a join matrix profile. #' @param window.size an `int`. Size of the sliding window. #' @param exclusion.zone a `numeric`. Size of the exclusion zone, based on query size (default is `1/2`). See details. -#' @param s.size a `numeric`. for anytime algorithm, represents the size (in observations) the random calculation will occour (default is `Inf`). +#' @param s.size a `numeric`. for anytime algorithm, represents the size (in observations) the random calculation will occur (default is `Inf`). #' @param verbose an `int`. See details. (Default is `2`). #' #' @return Returns the matrix profile `mp` and profile index `pi`. @@ -98,7 +98,7 @@ stamp <- function(..., window.size, exclusion.zone = 1 / 2, s.size = Inf, verbos on.exit(close(pb)) } if (verbose > 1) { - on.exit(audio::play(sounds[[1]]), TRUE) + on.exit(beep(sounds[[1]]), TRUE) } # anytime must return the result always on.exit(return(list( diff --git a/R/stamp_par.R b/R/stamp_par.R index 8b451be..40ba10d 100644 --- a/R/stamp_par.R +++ b/R/stamp_par.R @@ -10,7 +10,7 @@ #' @param ... a `matrix` or a `vector`. If a second time series is supplied it will be a join matrix profile. #' @param window.size an `int`. Size of the sliding window. #' @param exclusion.zone a `numeric`. Size of the exclusion zone, based on query size (default is `1/2`). See details. -#' @param s.size a `numeric`. for anytime algorithm, represents the size (in observations) the random calculation will occour (default is `Inf`). +#' @param s.size a `numeric`. for anytime algorithm, represents the size (in observations) the random calculation will occur (default is `Inf`). #' @param n.workers an `int`. Number of workers for parallel. (Default is `2`). #' @param verbose an `int`. See details. (Default is `2`). #' @@ -25,7 +25,6 @@ #' @references Website: #' #' @examples -#' Sys.sleep(1) # sometimes sleep is needed if you run parallel multiple times in a row #' mp <- stamp.par(toy_data$data[1:200,1], window.size = 30, verbose = 0) #' \dontrun{ #' ref.data <- toy_data$data[,1] @@ -36,7 +35,7 @@ #' mp <- stamp.par(ref.data, query.data, window.size = 30, s.size = round(nrows(query.data) * 0.1)) #' } #' -#' @import beepr doSNOW foreach parallel +#' @import doSNOW foreach parallel stamp.par <- function(..., window.size, exclusion.zone = 1 / 2, s.size = Inf, n.workers = 2, verbose = 2) { args <- list(...) data <- args[[1]] @@ -107,7 +106,7 @@ stamp.par <- function(..., window.size, exclusion.zone = 1 / 2, s.size = Inf, n. on.exit(close(pb), TRUE) } if (verbose > 1) { - on.exit(audio::play(sounds[[1]]), TRUE) + on.exit(beep(sounds[[1]]), TRUE) } # anytime must return the result always on.exit(return(list( diff --git a/R/toy_data.R b/R/toy_data.R index 49007b5..2e383e3 100644 --- a/R/toy_data.R +++ b/R/toy_data.R @@ -1,11 +1,11 @@ #' Original data used in the mSTAMP demo #' -#' A synthetic dataset with embeded MOTIFs for multidimensional discovery +#' A synthetic dataset with embedded MOTIFs for multidimensional discovery #' #' @docType data #' @format A `list` with a `matrix` with 550 rows and 3 dimensions and an `int`: #' \describe{ -#' \item{data}{data with embeded MOTIFs} +#' \item{data}{data with embedded MOTIFs} #' \item{sub.len}{size of sliding window} #' } #' @source \url{https://sites.google.com/view/mstamp/} diff --git a/README.Rmd b/README.Rmd index 4d4607d..f7846e0 100644 --- a/README.Rmd +++ b/README.Rmd @@ -20,7 +20,7 @@ knitr::opts_chunk$set( ```{r include=FALSE} library(git2r) # current.branch <- repository_head()$name -current.branch <- "develop" +current.branch <- "master" lifecycle <- "maturing" # maturing-blue # stable-brightgreen lifecycle.color <- "blue" ``` diff --git a/README.md b/README.md index 09a2e0a..9188b2b 100644 --- a/README.md +++ b/README.md @@ -10,8 +10,8 @@ Francisco Bischoff [![Packagist](https://img.shields.io/packagist/l/doctrine/orm.svg)](https://choosealicense.com/licenses/mit) [![lifecycle](https://img.shields.io/badge/lifecycle-maturing-blue.svg)](https://www.tidyverse.org/lifecycle/#maturing) [![Build -Status](https://travis-ci.com/franzbischoff/tsmp.svg?branch=develop)](https://travis-ci.com/franzbischoff/tsmp) -[![codecov](https://codecov.io/gh/franzbischoff/tsmp/branch/develop/graph/badge.svg)](https://codecov.io/gh/franzbischoff/tsmp) +Status](https://travis-ci.com/franzbischoff/tsmp.svg?branch=master)](https://travis-ci.com/franzbischoff/tsmp) +[![codecov](https://codecov.io/gh/franzbischoff/tsmp/branch/master/graph/badge.svg)](https://codecov.io/gh/franzbischoff/tsmp) [![CRAN version](http://www.r-pkg.org/badges/version/tsmp)](https://cran.r-project.org/package=tsmp) diff --git a/docs/CODE_OF_CONDUCT.html b/docs/CODE_OF_CONDUCT.html index 7adf315..37fa517 100644 --- a/docs/CODE_OF_CONDUCT.html +++ b/docs/CODE_OF_CONDUCT.html @@ -61,7 +61,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 diff --git a/docs/LICENSE-text.html b/docs/LICENSE-text.html index f6356aa..aeb627f 100644 --- a/docs/LICENSE-text.html +++ b/docs/LICENSE-text.html @@ -61,7 +61,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 diff --git a/docs/LICENSE.html b/docs/LICENSE.html index df077dc..88aefef 100644 --- a/docs/LICENSE.html +++ b/docs/LICENSE.html @@ -61,7 +61,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 diff --git a/docs/authors.html b/docs/authors.html index c2eac3c..59f6a2a 100644 --- a/docs/authors.html +++ b/docs/authors.html @@ -61,7 +61,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 diff --git a/docs/index.html b/docs/index.html index 05cdaf7..db7aef0 100644 --- a/docs/index.html +++ b/docs/index.html @@ -30,7 +30,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 @@ -179,8 +179,8 @@

Dev status

diff --git a/docs/news/index.html b/docs/news/index.html index bf298ca..8d2c3a5 100644 --- a/docs/news/index.html +++ b/docs/news/index.html @@ -61,7 +61,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 diff --git a/docs/reference/beep.html b/docs/reference/beep.html new file mode 100644 index 0000000..1d0b7fc --- /dev/null +++ b/docs/reference/beep.html @@ -0,0 +1,154 @@ + + + + + + + + +Play sound with <code>audio</code> — beep • tsmp + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + +
+
+ + + +
+ +
+
+ + +
+ +

Play sound with audio

+ +
+ +
beep(data)
+ +

Arguments

+ + + + + + +
data

sound data provided by this package

+ + +
+ +
+ +
+ + +
+

Site built with pkgdown.

+
+ +
+
+ + + + + + diff --git a/docs/reference/compute.f.meas.html b/docs/reference/compute.f.meas.html index c103026..0c93a1d 100644 --- a/docs/reference/compute.f.meas.html +++ b/docs/reference/compute.f.meas.html @@ -63,7 +63,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 diff --git a/docs/reference/fast.movavg.html b/docs/reference/fast.movavg.html index af640f7..dd8744a 100644 --- a/docs/reference/fast.movavg.html +++ b/docs/reference/fast.movavg.html @@ -63,7 +63,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 diff --git a/docs/reference/fast.movsd.html b/docs/reference/fast.movsd.html index e4ae809..b08683f 100644 --- a/docs/reference/fast.movsd.html +++ b/docs/reference/fast.movsd.html @@ -63,7 +63,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 diff --git a/docs/reference/find.chains.html b/docs/reference/find.chains.html index 4d64f24..85d5ba9 100644 --- a/docs/reference/find.chains.html +++ b/docs/reference/find.chains.html @@ -63,7 +63,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 diff --git a/docs/reference/fluss.cac.html b/docs/reference/fluss.cac.html index 67eb95e..bc3de70 100644 --- a/docs/reference/fluss.cac.html +++ b/docs/reference/fluss.cac.html @@ -63,7 +63,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 @@ -140,7 +140,7 @@

Value

Details

Original paper suggest using the classic statistical-process-control heuristic to set a threshold -where a semantic change may occur in CAC. This may be useful in realtime implementation as we don't +where a semantic change may occur in CAC. This may be useful in real-time implementation as we don't know in advance the number of domain changes to look for. Please check original paper (1).

References

diff --git a/docs/reference/fluss.extract.html b/docs/reference/fluss.extract.html index f846c31..d2f8be1 100644 --- a/docs/reference/fluss.extract.html +++ b/docs/reference/fluss.extract.html @@ -63,7 +63,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 diff --git a/docs/reference/fluss.html b/docs/reference/fluss.html index 06b5722..81456de 100644 --- a/docs/reference/fluss.html +++ b/docs/reference/fluss.html @@ -64,7 +64,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 diff --git a/docs/reference/fluss.score.html b/docs/reference/fluss.score.html index eb8a2c5..9fa66e3 100644 --- a/docs/reference/fluss.score.html +++ b/docs/reference/fluss.score.html @@ -63,7 +63,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 diff --git a/docs/reference/fluss_data.html b/docs/reference/fluss_data.html index 3ed168f..061a2e5 100644 --- a/docs/reference/fluss_data.html +++ b/docs/reference/fluss_data.html @@ -64,7 +64,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 diff --git a/docs/reference/gait_data.html b/docs/reference/gait_data.html index f9f88ec..1026321 100644 --- a/docs/reference/gait_data.html +++ b/docs/reference/gait_data.html @@ -63,7 +63,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 diff --git a/docs/reference/golden.section.2.html b/docs/reference/golden.section.2.html index 5cbb6d5..aeaff7e 100644 --- a/docs/reference/golden.section.2.html +++ b/docs/reference/golden.section.2.html @@ -63,7 +63,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 @@ -155,7 +155,7 @@

Arg

Value

-

Returns the best threashold and its F-Score

+

Returns the best threshold and its F-Score

diff --git a/docs/reference/golden.section.html b/docs/reference/golden.section.html index d4ef0b8..bf91a6f 100644 --- a/docs/reference/golden.section.html +++ b/docs/reference/golden.section.html @@ -63,7 +63,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 @@ -146,7 +146,7 @@

Arg

Value

-

Returns the best threashold and its F-Score

+

Returns the best threshold and its F-Score

diff --git a/docs/reference/guide.search.html b/docs/reference/guide.search.html index 89fe6a2..ee2ee2b 100644 --- a/docs/reference/guide.search.html +++ b/docs/reference/guide.search.html @@ -63,7 +63,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 @@ -120,7 +120,7 @@

Arg data -

a matrix of numeric, where each colums is a time series. Accepts vector (see details), list and data.frame too.

+

a matrix of numeric, where each column is a time series. Accepts vector (see details), list and data.frame too.

window.size diff --git a/docs/reference/index.html b/docs/reference/index.html index 1f4d57a..be26baf 100644 --- a/docs/reference/index.html +++ b/docs/reference/index.html @@ -61,7 +61,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 diff --git a/docs/reference/mass.html b/docs/reference/mass.html index 74824be..794c65c 100644 --- a/docs/reference/mass.html +++ b/docs/reference/mass.html @@ -63,7 +63,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 diff --git a/docs/reference/mass.pre.html b/docs/reference/mass.pre.html index 7fd50b1..3b83f87 100644 --- a/docs/reference/mass.pre.html +++ b/docs/reference/mass.pre.html @@ -63,7 +63,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 diff --git a/docs/reference/mass.simple.html b/docs/reference/mass.simple.html index 7020120..a8825af 100644 --- a/docs/reference/mass.simple.html +++ b/docs/reference/mass.simple.html @@ -64,7 +64,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 diff --git a/docs/reference/mass.simple.pre.html b/docs/reference/mass.simple.pre.html index b6babee..db1ce95 100644 --- a/docs/reference/mass.simple.pre.html +++ b/docs/reference/mass.simple.pre.html @@ -63,7 +63,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 diff --git a/docs/reference/mode.html b/docs/reference/mode.html index e4f0b9c..1e3953e 100644 --- a/docs/reference/mode.html +++ b/docs/reference/mode.html @@ -63,7 +63,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 diff --git a/docs/reference/mstomp.html b/docs/reference/mstomp.html index df12516..88ba273 100644 --- a/docs/reference/mstomp.html +++ b/docs/reference/mstomp.html @@ -63,7 +63,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 @@ -121,7 +121,7 @@

Arg data -

a matrix of numeric, where each colums is a time series. Accepts vector (see details), list and data.frame too.

+

a matrix of numeric, where each column is a time series. Accepts vector (see details), list and data.frame too.

window.size diff --git a/docs/reference/mstomp.par.html b/docs/reference/mstomp.par.html index 957c25b..ca0714c 100644 --- a/docs/reference/mstomp.par.html +++ b/docs/reference/mstomp.par.html @@ -63,7 +63,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 @@ -121,7 +121,7 @@

Arg data -

a matrix of numeric, where each colums is a time series. Accepts vector (see details), list and data.frame too.

+

a matrix of numeric, where each column is a time series. Accepts vector (see details), list and data.frame too.

window.size @@ -181,7 +181,6 @@

See a

Examples

# using all dimensions -Sys.sleep(1) # sometimes sleep is needed if you run parallel multiple times in a row mp <- mstomp.par(toy_data$data[1:100,], 30, verbose = 0)
@@ -124,7 +124,7 @@

Arg pred -

a vector of logical. Predictied annotation from sdts.predict()

+

a vector of logical. Predicted annotation from sdts.predict()

beta diff --git a/docs/reference/sdts.predict.html b/docs/reference/sdts.predict.html index 6f74ad9..3be888c 100644 --- a/docs/reference/sdts.predict.html +++ b/docs/reference/sdts.predict.html @@ -63,7 +63,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 diff --git a/docs/reference/sdts.train.html b/docs/reference/sdts.train.html index c1f0763..62f9daf 100644 --- a/docs/reference/sdts.train.html +++ b/docs/reference/sdts.train.html @@ -63,7 +63,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 diff --git a/docs/reference/simple.fast.html b/docs/reference/simple.fast.html index 0a55327..dabafd3 100644 --- a/docs/reference/simple.fast.html +++ b/docs/reference/simple.fast.html @@ -63,7 +63,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 @@ -120,7 +120,7 @@

Arg data -

a matrix of numeric, where each colums is a time series. Accepts list and data.frame too.

+

a matrix of numeric, where each column is a time series. Accepts list and data.frame too.

window.size diff --git a/docs/reference/stamp.html b/docs/reference/stamp.html index 7b01264..4804304 100644 --- a/docs/reference/stamp.html +++ b/docs/reference/stamp.html @@ -63,7 +63,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 @@ -133,7 +133,7 @@

Arg s.size -

a numeric. for anytime algorithm, represents the size (in observations) the random calculation will occour (default is Inf).

+

a numeric. for anytime algorithm, represents the size (in observations) the random calculation will occur (default is Inf).

verbose diff --git a/docs/reference/stamp.par.html b/docs/reference/stamp.par.html index 58fcf1a..d6bf058 100644 --- a/docs/reference/stamp.par.html +++ b/docs/reference/stamp.par.html @@ -63,7 +63,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 @@ -133,7 +133,7 @@

Arg s.size -

a numeric. for anytime algorithm, represents the size (in observations) the random calculation will occour (default is Inf).

+

a numeric. for anytime algorithm, represents the size (in observations) the random calculation will occur (default is Inf).

n.workers @@ -174,8 +174,7 @@

See a

Examples

-
Sys.sleep(1) # sometimes sleep is needed if you run parallel multiple times in a row -mp <- stamp.par(toy_data$data[1:200,1], window.size = 30, verbose = 0)
# NOT RUN { +
mp <- stamp.par(toy_data$data[1:200,1], window.size = 30, verbose = 0)
# NOT RUN { ref.data <- toy_data$data[,1] query.data <- toy_data$data[,2] # self similarity diff --git a/docs/reference/std.html b/docs/reference/std.html index 6ea9bb5..4ad6ed7 100644 --- a/docs/reference/std.html +++ b/docs/reference/std.html @@ -63,7 +63,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 diff --git a/docs/reference/test_data.html b/docs/reference/test_data.html index ac63866..e74569f 100644 --- a/docs/reference/test_data.html +++ b/docs/reference/test_data.html @@ -65,7 +65,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 diff --git a/docs/reference/toy_data.html b/docs/reference/toy_data.html index a824399..55052f0 100644 --- a/docs/reference/toy_data.html +++ b/docs/reference/toy_data.html @@ -32,7 +32,7 @@ - + @@ -63,7 +63,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 @@ -109,7 +109,7 @@

Original data used in the mSTAMP demo

-

A synthetic dataset with embeded MOTIFs for multidimensional discovery

+

A synthetic dataset with embedded MOTIFs for multidimensional discovery

@@ -118,7 +118,7 @@

Original data used in the mSTAMP demo

Format

A list with a matrix with 550 rows and 3 dimensions and an int:

-
data

data with embeded MOTIFs

+
data

data with embedded MOTIFs

sub.len

size of sliding window

diff --git a/docs/reference/tsmp.html b/docs/reference/tsmp.html index 2493d20..4150bfa 100644 --- a/docs/reference/tsmp.html +++ b/docs/reference/tsmp.html @@ -64,7 +64,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 diff --git a/docs/reference/unconstrain.search.html b/docs/reference/unconstrain.search.html index d1989f6..85e7385 100644 --- a/docs/reference/unconstrain.search.html +++ b/docs/reference/unconstrain.search.html @@ -63,7 +63,7 @@ tsmp - 0.2.13.9053 + 0.2.14.9009 @@ -121,7 +121,7 @@

Arg data -

a matrix of numeric, where each colums is a time series. Accepts vector (see details), list and data.frame too.

+

a matrix of numeric, where each column is a time series. Accepts vector (see details), list and data.frame too.

window.size diff --git a/man/beep.Rd b/man/beep.Rd new file mode 100644 index 0000000..ab21044 --- /dev/null +++ b/man/beep.Rd @@ -0,0 +1,15 @@ +% Generated by roxygen2: do not edit by hand +% Please edit documentation in R/misc.R +\name{beep} +\alias{beep} +\title{Play sound with \code{audio}} +\usage{ +beep(data) +} +\arguments{ +\item{data}{sound data provided by this package} +} +\description{ +Play sound with \code{audio} +} +\keyword{internal} diff --git a/man/fluss.cac.Rd b/man/fluss.cac.Rd index 058cbe3..33e2e83 100644 --- a/man/fluss.cac.Rd +++ b/man/fluss.cac.Rd @@ -22,7 +22,7 @@ Computes the arc count with edge correction (CAC). } \details{ Original paper suggest using the classic statistical-process-control heuristic to set a threshold -where a semantic change may occur in CAC. This may be useful in realtime implementation as we don't +where a semantic change may occur in CAC. This may be useful in real-time implementation as we don't know in advance the number of domain changes to look for. Please check original paper (1). } \examples{ diff --git a/man/golden.section.2.Rd b/man/golden.section.2.Rd index ce1d5e2..c28f66f 100644 --- a/man/golden.section.2.Rd +++ b/man/golden.section.2.Rd @@ -25,7 +25,7 @@ golden.section.2(dist.pro, thold, label, pos.st, pos.ed, beta, window.size, \item{fit.idx}{an integer with the index of the current threshold} } \value{ -Returns the best threashold and its F-Score +Returns the best threshold and its F-Score } \description{ Computes the golden section for combined candidates diff --git a/man/golden.section.Rd b/man/golden.section.Rd index 20bbeb3..5eefa74 100644 --- a/man/golden.section.Rd +++ b/man/golden.section.Rd @@ -20,7 +20,7 @@ golden.section(dist.pro, label, pos.st, pos.ed, beta, window.size) \item{window.size}{an integer with the sliding window size} } \value{ -Returns the best threashold and its F-Score +Returns the best threshold and its F-Score } \description{ Computes the golden section for individual candidates diff --git a/man/guide.search.Rd b/man/guide.search.Rd index f33d6ad..1fe64df 100644 --- a/man/guide.search.Rd +++ b/man/guide.search.Rd @@ -7,7 +7,7 @@ guide.search(data, window.size, matrix.profile, profile.index, n.dim) } \arguments{ -\item{data}{a \code{matrix} of \code{numeric}, where each colums is a time series. Accepts \code{vector} (see details), \code{list} and \code{data.frame} too.} +\item{data}{a \code{matrix} of \code{numeric}, where each column is a time series. Accepts \code{vector} (see details), \code{list} and \code{data.frame} too.} \item{window.size}{an \code{int} with the size of the sliding window.} diff --git a/man/mstomp.Rd b/man/mstomp.Rd index 90fcf6b..880d584 100644 --- a/man/mstomp.Rd +++ b/man/mstomp.Rd @@ -8,7 +8,7 @@ mstomp(data, window.size, must.dim = NULL, exc.dim = NULL, exclusion.zone = 1/2, verbose = 2) } \arguments{ -\item{data}{a \code{matrix} of \code{numeric}, where each colums is a time series. Accepts \code{vector} (see details), \code{list} and \code{data.frame} too.} +\item{data}{a \code{matrix} of \code{numeric}, where each column is a time series. Accepts \code{vector} (see details), \code{list} and \code{data.frame} too.} \item{window.size}{an \code{int} with the size of the sliding window.} diff --git a/man/mstomp.par.Rd b/man/mstomp.par.Rd index e5150fa..169a9b0 100644 --- a/man/mstomp.par.Rd +++ b/man/mstomp.par.Rd @@ -8,7 +8,7 @@ mstomp.par(data, window.size, must.dim = NULL, exc.dim = NULL, exclusion.zone = 1/2, verbose = 2, n.workers = 2) } \arguments{ -\item{data}{a \code{matrix} of \code{numeric}, where each colums is a time series. Accepts \code{vector} (see details), \code{list} and \code{data.frame} too.} +\item{data}{a \code{matrix} of \code{numeric}, where each column is a time series. Accepts \code{vector} (see details), \code{list} and \code{data.frame} too.} \item{window.size}{an \code{int}. Size of the sliding window.} @@ -38,7 +38,6 @@ Although this functions handles Multivariate Time Series, it can also be used to } \examples{ # using all dimensions -Sys.sleep(1) # sometimes sleep is needed if you run parallel multiple times in a row mp <- mstomp.par(toy_data$data[1:100,], 30, verbose = 0) } \references{ diff --git a/man/sdts.f.score.Rd b/man/sdts.f.score.Rd index bef8d17..f62ac1a 100644 --- a/man/sdts.f.score.Rd +++ b/man/sdts.f.score.Rd @@ -9,7 +9,7 @@ sdts.f.score(gtruth, pred, beta = 1) \arguments{ \item{gtruth}{a \code{vector} of \code{logical}. Ground truth annotation.} -\item{pred}{a \code{vector} of \code{logical}. Predictied annotation from \code{\link[=sdts.predict]{sdts.predict()}}} +\item{pred}{a \code{vector} of \code{logical}. Predicted annotation from \code{\link[=sdts.predict]{sdts.predict()}}} \item{beta}{a \code{numeric}. See details. (default is \code{1}).} } diff --git a/man/simple.fast.Rd b/man/simple.fast.Rd index c900b4e..2de9521 100644 --- a/man/simple.fast.Rd +++ b/man/simple.fast.Rd @@ -7,7 +7,7 @@ simple.fast(data, window.size, exclusion.zone = 1/2, verbose = 2) } \arguments{ -\item{data}{a \code{matrix} of \code{numeric}, where each colums is a time series. Accepts \code{list} and \code{data.frame} too.} +\item{data}{a \code{matrix} of \code{numeric}, where each column is a time series. Accepts \code{list} and \code{data.frame} too.} \item{window.size}{an \code{int} with the size of the sliding window.} diff --git a/man/stamp.Rd b/man/stamp.Rd index 6ca3b81..c4cc4ab 100644 --- a/man/stamp.Rd +++ b/man/stamp.Rd @@ -14,7 +14,7 @@ stamp(..., window.size, exclusion.zone = 1/2, s.size = Inf, \item{exclusion.zone}{a \code{numeric}. Size of the exclusion zone, based on query size (default is \code{1/2}). See details.} -\item{s.size}{a \code{numeric}. for anytime algorithm, represents the size (in observations) the random calculation will occour (default is \code{Inf}).} +\item{s.size}{a \code{numeric}. for anytime algorithm, represents the size (in observations) the random calculation will occur (default is \code{Inf}).} \item{verbose}{an \code{int}. See details. (Default is \code{2}).} } diff --git a/man/stamp.par.Rd b/man/stamp.par.Rd index ba013ec..ca2850c 100644 --- a/man/stamp.par.Rd +++ b/man/stamp.par.Rd @@ -14,7 +14,7 @@ stamp.par(..., window.size, exclusion.zone = 1/2, s.size = Inf, \item{exclusion.zone}{a \code{numeric}. Size of the exclusion zone, based on query size (default is \code{1/2}). See details.} -\item{s.size}{a \code{numeric}. for anytime algorithm, represents the size (in observations) the random calculation will occour (default is \code{Inf}).} +\item{s.size}{a \code{numeric}. for anytime algorithm, represents the size (in observations) the random calculation will occur (default is \code{Inf}).} \item{n.workers}{an \code{int}. Number of workers for parallel. (Default is \code{2}).} @@ -34,7 +34,6 @@ The anytime STAMP computes the Matrix Profile and Profile Index in such manner t \code{exclusion.zone} is used to avoid trivial matches; if a query data is provided (join similarity), this parameter is ignored. } \examples{ -Sys.sleep(1) # sometimes sleep is needed if you run parallel multiple times in a row mp <- stamp.par(toy_data$data[1:200,1], window.size = 30, verbose = 0) \dontrun{ ref.data <- toy_data$data[,1] diff --git a/man/toy_data.Rd b/man/toy_data.Rd index 859bb62..698a35f 100644 --- a/man/toy_data.Rd +++ b/man/toy_data.Rd @@ -6,7 +6,7 @@ \title{Original data used in the mSTAMP demo} \format{A \code{list} with a \code{matrix} with 550 rows and 3 dimensions and an \code{int}: \describe{ -\item{data}{data with embeded MOTIFs} +\item{data}{data with embedded MOTIFs} \item{sub.len}{size of sliding window} }} \source{ @@ -16,7 +16,7 @@ toy_data } \description{ -A synthetic dataset with embeded MOTIFs for multidimensional discovery +A synthetic dataset with embedded MOTIFs for multidimensional discovery } \references{ \enumerate{ diff --git a/man/unconstrain.search.Rd b/man/unconstrain.search.Rd index e0a94af..0acf4c7 100644 --- a/man/unconstrain.search.Rd +++ b/man/unconstrain.search.Rd @@ -8,7 +8,7 @@ unconstrain.search(data, window.size, matrix.profile, profile.index, n.bit = 4, k = Inf) } \arguments{ -\item{data}{a \code{matrix} of \code{numeric}, where each colums is a time series. Accepts \code{vector} (see details), \code{list} and \code{data.frame} too.} +\item{data}{a \code{matrix} of \code{numeric}, where each column is a time series. Accepts \code{vector} (see details), \code{list} and \code{data.frame} too.} \item{window.size}{an \code{int} with the size of the sliding window.} diff --git a/packrat/packrat.lock b/packrat/packrat.lock index 921126a..5365dc2 100644 --- a/packrat/packrat.lock +++ b/packrat/packrat.lock @@ -77,12 +77,6 @@ Source: CRAN Version: 0.1-3 Hash: c590d29e555926af053055e23ee79efb -Package: beepr -Source: CRAN -Version: 1.3 -Hash: 3b06c76c8608889c0577b1f9d472a6c0 -Requires: audio, stringr - Package: bit Source: CRAN Version: 1.1-14 @@ -123,19 +117,10 @@ Hash: ae3d74ab94396fc7f6b879f17fb71a12 Requires: R6, processx Package: cli -Source: github -Version: 1.0.0.9002 -Hash: 231fd025f7a15312bfa29af3e10d27c9 -Requires: R6, assertthat, crayon, fansi, glue, progress, selectr, - withr, xml2 -GithubRepo: cli -GithubUsername: r-lib -GithubRef: master -GithubSha1: 1ce51456bd1d8ee703e07065ccb8824862d09e73 -RemoteHost: api.github.com -RemoteRepo: cli -RemoteUsername: r-lib -RemoteSha: 1ce51456bd1d8ee703e07065ccb8824862d09e73 +Source: CRAN +Version: 1.0.0 +Hash: f4239f89feb7ddc65821e4514e9734ae +Requires: assertthat, crayon Package: clipr Source: CRAN @@ -158,53 +143,18 @@ Version: 1.5 Hash: 432a16a9967055dad6b39f1c14fd6b2c Package: covr -Source: CRAN +Source: github Version: 3.1.0 -Hash: 55eaad0d3e61626cc0c8928985a849fa +Hash: 6022dedb19a9462e0496ae14615810da Requires: crayon, digest, httr, jsonlite, rex, withr - -Package: crancache -Source: github -Version: 0.0.0.9000 -Hash: 534a806e0a083e675c71f60fb3f2b7b3 -Requires: callr, cranlike, curl, desc, digest, parsedate, rappdirs, - withr -GithubRepo: crancache +GithubRepo: covr GithubUsername: r-lib GithubRef: master -GithubSha1: e2185c76b6fcd36c9970cfa22ffd2cb62b13eb53 -RemoteHost: api.github.com -RemoteRepo: crancache -RemoteUsername: r-lib -RemoteSha: e2185c76b6fcd36c9970cfa22ffd2cb62b13eb53 - -Package: cranlike -Source: github -Version: 1.0.1.9001 -Hash: 228d02131e3aa54af9a684864a6511ad -Requires: DBI, RSQLite, debugme, desc -GithubRepo: cranlike -GithubUsername: r-hub -GithubRef: master -GithubSha1: 3c72c14ea25a6cfe7b5585cef871ab1711a5aee9 -RemoteHost: api.github.com -RemoteRepo: cranlike -RemoteUsername: r-hub -RemoteSha: 3c72c14ea25a6cfe7b5585cef871ab1711a5aee9 - -Package: cranlogs -Source: github -Version: 2.1.1 -Hash: 6811357ef92c6f13a4a1c3d1cfc0a9e2 -Requires: httr, jsonlite -GithubRepo: cranlogs -GithubUsername: metacran -GithubRef: master -GithubSha1: 554a99ef6089d5618e6fe64d580aa217bb7558e3 +GithubSha1: e15d96cf088821b6bcbadb89595ed35c3d50f811 RemoteHost: https://api.github.com -RemoteRepo: cranlogs -RemoteUsername: metacran -RemoteSha: 554a99ef6089d5618e6fe64d580aa217bb7558e3 +RemoteRepo: covr +RemoteUsername: r-lib +RemoteSha: e15d96cf088821b6bcbadb89595ed35c3d50f811 Package: crayon Source: CRAN @@ -229,33 +179,25 @@ Hash: c233690edd9fa17a63f7c8d83c1ca153 Requires: crayon Package: desc -Source: github +Source: CRAN Version: 1.2.0 -Hash: acb5cf9e16dd327a0d0fc6ab6522939d +Hash: a1fd2baa29d4954951e3d1816deab6af Requires: R6, assertthat, crayon, rprojroot -GithubRepo: desc -GithubUsername: r-lib -GithubRef: master -GithubSha1: 4f60833fdb6d1aae4cbf09b7eb293c5fa0770e5c -RemoteHost: api.github.com -RemoteRepo: desc -RemoteUsername: r-lib -RemoteSha: 4f60833fdb6d1aae4cbf09b7eb293c5fa0770e5c Package: devtools Source: github Version: 1.13.6.9000 -Hash: 18814b1ead54eb753df1b2b2e2b40e41 +Hash: dd085b2f37d87787a7aaaa78ac29529f Requires: callr, cli, digest, git2r, httr, jsonlite, memoise, pkgbuild, pkgload, rcmdcheck, rstudioapi, usethis, withr GithubRepo: devtools GithubUsername: r-lib GithubRef: master -GithubSha1: 5bbcac458f7c874e465229c01f07d4ff229d3dfc +GithubSha1: 2d012d171b77fcfb54684ba1472797ccd0950709 RemoteHost: https://api.github.com RemoteRepo: devtools RemoteUsername: r-lib -RemoteSha: 5bbcac458f7c874e465229c01f07d4ff229d3dfc +RemoteSha: 2d012d171b77fcfb54684ba1472797ccd0950709 Package: digest Source: CRAN @@ -304,18 +246,10 @@ Requires: digest, gtable, lazyeval, plyr, reshape2, rlang, scales, tibble, viridisLite, withr Package: gh -Source: github +Source: CRAN Version: 1.0.1 -Hash: 7d6e51bfd8cb23d0f3d36b95c787a39f +Hash: 0fafa863f1a86a1f1966e5d5b46a48b5 Requires: httr, ini, jsonlite -GithubRepo: gh -GithubUsername: r-lib -GithubRef: master -GithubSha1: a8b645364f59a5d5030ccfd8d074de640d8b72cd -RemoteHost: https://api.github.com -RemoteRepo: gh -RemoteUsername: r-lib -RemoteSha: a8b645364f59a5d5030ccfd8d074de640d8b72cd Package: git2r Source: CRAN @@ -348,12 +282,6 @@ Source: CRAN Version: 0.7 Hash: 20757f5c393ed0ecf96c9e8e6d8d514c -Package: hms -Source: CRAN -Version: 0.4.2 -Hash: b4096a4f6a6736138e9a825c2baaacf0 -Requires: pkgconfig, rlang - Package: htmltools Source: CRAN Version: 0.3.6 @@ -477,18 +405,10 @@ Hash: 3e43f774fa6dfba877caca1aebbeaa6a Requires: cli, crayon, fansi, rlang, utf8 Package: pkgbuild -Source: github +Source: CRAN Version: 1.0.0 -Hash: 6d46ad074349b737b4e96f2b032c9b67 +Hash: 0a49f0fd623849e51386a274c6ebdbd9 Requires: R6, callr, crayon, desc, rprojroot, withr -GithubRepo: pkgbuild -GithubUsername: r-lib -GithubRef: master -GithubSha1: 3d3d6cf487ecffefcd218f0ab5747f569d8f1680 -RemoteHost: https://api.github.com -RemoteRepo: pkgbuild -RemoteUsername: r-lib -RemoteSha: 3d3d6cf487ecffefcd218f0ab5747f569d8f1680 Package: pkgconfig Source: CRAN @@ -538,20 +458,6 @@ Version: 3.2.0 Hash: 906405f0bc681c9438826952417d5d5a Requires: R6, assertthat, crayon, ps -Package: progress -Source: github -Version: 1.2.0 -Hash: c2beada98e1d490daf2b221763f3875c -Requires: R6, crayon, hms, prettyunits -GithubRepo: progress -GithubUsername: r-lib -GithubRef: master -GithubSha1: 842852869af44a8618e948485b24cdbaf2829736 -RemoteHost: api.github.com -RemoteRepo: progress -RemoteUsername: r-lib -RemoteSha: 842852869af44a8618e948485b24cdbaf2829736 - Package: promises Source: CRAN Version: 1.0.1 @@ -584,7 +490,7 @@ GithubRepo: rcmdcheck GithubUsername: r-lib GithubRef: master GithubSha1: ad42561aa6e06297367455546b6312dcf59282b6 -RemoteHost: api.github.com +RemoteHost: https://api.github.com RemoteRepo: rcmdcheck RemoteUsername: r-lib RemoteSha: ad42561aa6e06297367455546b6312dcf59282b6 @@ -600,41 +506,12 @@ Version: 2.0.1 Hash: b7f86a340a404c69cfb770dfd2081dd9 Requires: tibble -Package: remotes -Source: github -Version: 1.1.1.9000 -Hash: e92091b6a2e32fb964f5a33d4e063d3b -GithubRepo: remotes -GithubUsername: r-lib -GithubRef: master -GithubSha1: 7a576028506708f56bc5db0bde5491de26648e5f -RemoteHost: api.github.com -RemoteRepo: remotes -RemoteUsername: r-lib -RemoteSha: 7a576028506708f56bc5db0bde5491de26648e5f - Package: reshape2 Source: CRAN Version: 1.4.3 Hash: a08472524968be4e233b4c8d0ae5aef1 Requires: Rcpp, plyr, stringr -Package: revdepcheck -Source: github -Version: 1.0.0.9000 -Hash: f2091d76552847c80ccd612dcde54851 -Requires: DBI, RSQLite, assertthat, callr, cli, clisymbols, crancache, - crayon, desc, glue, gmailr, jsonlite, knitr, prettyunits, processx, - progress, rcmdcheck, remotes, sessioninfo, whoami, withr, yaml -GithubRepo: revdepcheck -GithubUsername: r-lib -GithubRef: master -GithubSha1: ee4ca3a7747d6f1f4b77edb900100be969fd30ba -RemoteHost: api.github.com -RemoteRepo: revdepcheck -RemoteUsername: r-lib -RemoteSha: ee4ca3a7747d6f1f4b77edb900100be969fd30ba - Package: rex Source: CRAN Version: 1.1.2 @@ -734,8 +611,8 @@ Requires: commonmark, hunspell, knitr, xml2 Package: stringi Source: CRAN -Version: 1.2.4 -Hash: 03ab60ef7fa4627b38ad67c95ce6b04c +Version: 1.1.7 +Hash: d3dbb18da9a7b73a5b59416e33ad2cbd Package: stringr Source: CRAN @@ -769,19 +646,11 @@ Hash: a149d4e6a2f7d6422e063a19cca52bb9 Requires: xfun Package: usethis -Source: github -Version: 1.4.0.9000 -Hash: 7cc9190f229ba4971678535221c3f172 +Source: CRAN +Version: 1.4.0 +Hash: bdf0ce7802818c5dfc592dd73d62db5b Requires: clipr, clisymbols, crayon, curl, desc, fs, gh, git2r, glue, rlang, rprojroot, rstudioapi, whisker -GithubRepo: usethis -GithubUsername: r-lib -GithubRef: master -GithubSha1: 01dd42bca6a2f7d377e6dcedea7da23f29fe7678 -RemoteHost: https://api.github.com -RemoteRepo: usethis -RemoteUsername: r-lib -RemoteSha: 01dd42bca6a2f7d377e6dcedea7da23f29fe7678 Package: utf8 Source: CRAN diff --git a/packrat/packrat.opts b/packrat/packrat.opts index fe842a8..b7bdb6d 100644 --- a/packrat/packrat.opts +++ b/packrat/packrat.opts @@ -6,7 +6,7 @@ vcs.ignore.src: FALSE external.packages: local.repos: load.external.packages.on.startup: TRUE -ignored.packages: +ignored.packages: tsmp ignored.directories: data inst diff --git a/tests/testthat/test.simple.R b/tests/testthat/test.simple.R index ac15544..eb82b48 100644 --- a/tests/testthat/test.simple.R +++ b/tests/testthat/test.simple.R @@ -3,8 +3,11 @@ library(tsmp) w <- 30 data <- toy_data$data # 3 dimensions matrix -Sys.sleep(1) -result <- simple.fast(data, w, verbose = 2) +if (skip_on_cran()) { + result <- simple.fast(data, w, verbose = 2) +} else { + result <- simple.fast(data, w, verbose = 0) +} test_that("SiMPle Results", { expect_equal(round(sum(result$mp), 3), 806.132) diff --git a/tests/testthat/test.stamps.R b/tests/testthat/test.stamps.R index 12d471e..6f6e6a6 100644 --- a/tests/testthat/test.stamps.R +++ b/tests/testthat/test.stamps.R @@ -33,13 +33,13 @@ if (skip_on_cran()) { }) test_that("Finish", { - Sys.sleep(1) + Sys.sleep(0.5) expect_message(stamp(toy_data$data[1:200, 1], window.size = 30), regex = "Finished") - Sys.sleep(1) + Sys.sleep(0.5) expect_message(stamp.par(toy_data$data[1:200, 1], window.size = 30), regex = "Finished") - Sys.sleep(1) + Sys.sleep(0.5) expect_message(mstomp(toy_data$data[1:200, 1], window.size = 30), regex = "Finished") - Sys.sleep(1) + Sys.sleep(0.5) expect_message(mstomp.par(toy_data$data[1:200, 1], window.size = 30), regex = "Finished") })