Last updated on 2019-12-14 16:46:30 CET.
Flavor | Version | Tinstall | Tcheck | Ttotal | Status | Flags |
---|---|---|---|---|---|---|
r-devel-linux-x86_64-debian-clang | 2.1.1 | 167.65 | 148.24 | 315.89 | ERROR | |
r-devel-linux-x86_64-debian-gcc | 2.1.1 | 112.00 | 111.71 | 223.71 | OK | |
r-devel-linux-x86_64-fedora-clang | 2.1.1 | 413.61 | OK | |||
r-devel-linux-x86_64-fedora-gcc | 2.1.1 | 393.42 | OK | |||
r-devel-windows-ix86+x86_64 | 2.1.1 | 301.00 | 221.00 | 522.00 | OK | |
r-devel-windows-ix86+x86_64-gcc8 | 2.1.1 | 333.00 | 398.00 | 731.00 | OK | |
r-patched-linux-x86_64 | 2.1.1 | 124.85 | 131.33 | 256.18 | OK | |
r-patched-solaris-x86 | 2.1.1 | 438.90 | OK | |||
r-release-linux-x86_64 | 2.1.1 | 131.54 | 133.76 | 265.30 | OK | |
r-release-windows-ix86+x86_64 | 2.1.1 | 292.00 | 227.00 | 519.00 | OK | |
r-release-osx-x86_64 | 2.1.1 | OK | ||||
r-oldrel-windows-ix86+x86_64 | 2.1.1 | 288.00 | 209.00 | 497.00 | OK | |
r-oldrel-osx-x86_64 | 2.1.1 | OK |
Version: 2.1.1
Check: examples
Result: ERROR
Running examples in 'DepthProc-Ex.R' failed
The error most likely occurred in:
> base::assign(".ptime", proc.time(), pos = "CheckExEnv")
> ### Name: fncBoxPlot
> ### Title: Functional boxplot based on Modified Band Depth
> ### Aliases: fncBoxPlot
>
> ### ** Examples
>
>
> # some data:
> x <- matrix(rnorm(200), ncol = 10)
>
> fncBoxPlot(x, bands = c(0, 0.5, 1), method = "FM")
> fncBoxPlot(x, bands = c(0, 0.5, 1), method = "FM", byrow = FALSE)
>
> colnames(x) <- paste0("f", 1:ncol(x))
> fncBoxPlot(x, bands = c(0, 0.5, 1), method = "FM")
>
> # fncBoxPlot handles zoo and xts objects
> library(xts)
Loading required package: zoo
Attaching package: 'zoo'
The following objects are masked from 'package:base':
as.Date, as.Date.numeric
> x <- matrix(rnorm(200), ncol = 10)
> time <- as.POSIXct(1:ncol(x) * 86400, origin = "1970-01-01")
> x_xts <- xts(t(x), order.by = time)
> fncBoxPlot(x_xts, bands = c(0, 0.5, 1), method = "FM")
----------- FAILURE REPORT --------------
--- failure: the condition has length > 1 ---
--- srcref ---
:
--- package (from environment) ---
DepthProc
--- call from context ---
fncDepth(um, Xm, method, byrow = TRUE, ...)
--- call from argument ---
if (class(u) != class(X)) {
stop("u and X must be the the same class!")
}
--- R stacktrace ---
where 1: fncDepth(um, Xm, method, byrow = TRUE, ...)
where 2: fncDepth.zoo(u, X, method = method, byrow = byrow, ...)
where 3: fncDepth(u, X, method = method, byrow = byrow, ...)
where 4: fncBoxPlot(x_xts, bands = c(0, 0.5, 1), method = "FM")
--- value of length: 2 type: logical ---
[1] FALSE FALSE
--- function from context ---
function (u, X = NULL, method = "MBD", byrow = NULL, ...)
{
if (!is.null(X)) {
if (class(u) != class(X)) {
stop("u and X must be the the same class!")
}
}
UseMethod("fncDepth")
}
<bytecode: 0x51996f0>
<environment: namespace:DepthProc>
--- function search by body ---
Function fncDepth in namespace DepthProc has this body.
----------- END OF FAILURE REPORT --------------
Error in if (class(u) != class(X)) { : the condition has length > 1
Calls: fncBoxPlot -> fncDepth -> fncDepth.zoo -> fncDepth
Execution halted
Flavor: r-devel-linux-x86_64-debian-clang