DelayedDataFrame.Rcheck/tests_i386/testthat.Rout.fail
R Under development (unstable) (2019-03-09 r76216) -- "Unsuffered Consequences"
Copyright (C) 2019 The R Foundation for Statistical Computing
Platform: i386-w64-mingw32/i386 (32-bit)
R is free software and comes with ABSOLUTELY NO WARRANTY.
You are welcome to redistribute it under certain conditions.
Type 'license()' or 'licence()' for distribution details.
R is a collaborative project with many contributors.
Type 'contributors()' for more information and
'citation()' on how to cite R or R packages in publications.
Type 'demo()' for some demos, 'help()' for on-line help, or
'help.start()' for an HTML browser interface to help.
Type 'q()' to quit R.
> library(testthat)
> library(DelayedDataFrame)
Loading required package: S4Vectors
Loading required package: stats4
Loading required package: BiocGenerics
Loading required package: parallel
Attaching package: 'BiocGenerics'
The following objects are masked from 'package:parallel':
clusterApply, clusterApplyLB, clusterCall, clusterEvalQ,
clusterExport, clusterMap, parApply, parCapply, parLapply,
parLapplyLB, parRapply, parSapply, parSapplyLB
The following objects are masked from 'package:stats':
IQR, mad, sd, var, xtabs
The following objects are masked from 'package:base':
Filter, Find, Map, Position, Reduce, anyDuplicated, append,
as.data.frame, basename, cbind, colMeans, colSums, colnames,
dirname, do.call, duplicated, eval, evalq, get, grep, grepl,
intersect, is.unsorted, lapply, mapply, match, mget, order, paste,
pmax, pmax.int, pmin, pmin.int, rank, rbind, rowMeans, rowSums,
rownames, sapply, setdiff, sort, table, tapply, union, unique,
unsplit, which, which.max, which.min
Attaching package: 'S4Vectors'
The following object is masked from 'package:base':
expand.grid
Loading required package: DelayedArray
Loading required package: matrixStats
Loading required package: IRanges
Attaching package: 'IRanges'
The following object is masked from 'package:grDevices':
windows
Loading required package: BiocParallel
Attaching package: 'DelayedArray'
The following objects are masked from 'package:matrixStats':
colMaxs, colMins, colRanges, rowMaxs, rowMins, rowRanges
The following objects are masked from 'package:base':
aperm, apply, rowsum
>
> test_check("DelayedDataFrame")
-- 1. Error: [<-,DelayedDataFrame 2-D subseting works (@test_DelayedDataFrame-me
invalid class "DelayedDataFrame" object:
'.index(x)' must be of same length of 'ncols(x)'
1: `[<-`(`*tmp*`, 1:5, 1, value = c("e", "d", "c", "b", "a")) at testthat/test_DelayedDataFrame-method.R:145
2: `[<-`(`*tmp*`, 1:5, 1, value = c("e", "d", "c", "b", "a"))
3: callNextMethod()
4: .nextMethod(x = x, i = i, j = j, value = value)
5: mergeROWS(extractCOLS(x, j), i, value)
6: extractCOLS(x, j)
7: extractCOLS(x, j)
8: initialize(x, listData = new_listData, elementMetadata = new_mcols)
9: initialize(x, listData = new_listData, elementMetadata = new_mcols)
10: validObject(.Object)
11: stop(msg, ": ", errors, domain = NA)
-- 2. Error: [[<-,DelayedDataFrame is correct (@test_DelayedDataFrame-method.R#2
cannot coerce class "list" to a DataFrame
1: `[[<-`(`*tmp*`, "da0", value = structure(c(6L, 8L, 10L, 3L, 2L, 9L, 1L, 5L, 4L, 7L
), .Dim = 10L)) at testthat/test_DelayedDataFrame-method.R:220
2: `[[<-`(`*tmp*`, "da0", value = structure(c(6L, 8L, 10L, 3L, 2L, 9L, 1L, 5L, 4L, 7L
), .Dim = 10L))
3: callNextMethod(x, i, value = value)
4: eval(call, callEnv)
5: eval(call, callEnv)
6: .nextMethod(x, i, value = value)
7: setListElement(x, i, value)
8: setListElement(x, i, value)
9: .replace_list_element(x, i2, value)
10: `[<-`(`*tmp*`, i, value = new("DelayedDataFrame", lazyIndex = new("LazyIndex", index = 1L,
listData = list(NULL), elementType = "ANY", elementMetadata = NULL, metadata = list()),
rownames = NULL, nrows = 10L, listData = list(da0 = structure(c(6L, 8L, 10L,
3L, 2L, 9L, 1L, 5L, 4L, 7L), .Dim = 10L)), elementType = "ANY", elementMetadata = NULL,
metadata = list()))
...
14: replaceCOLS(x, i, value)
15: replaceCOLS(x, i, value)
16: initialize(x, sl, rownames = .make_rownames(x, ri, ri, value), nrows = max_len)
17: initialize(x, sl, rownames = .make_rownames(x, ri, ri, value), nrows = max_len)
18: `as<-`(`*tmp*`, Classi, value = obj)
19: asMethod(object, Class, value)
20: as(from, "DataFrame", TRUE)
21: asMethod(object)
22: DataFrame(listData, row.names = rownames(from))
23: stop("cannot coerce class \"", class(listData[[i]])[1L], "\" to a DataFrame")
== testthat results ===========================================================
OK: 109 SKIPPED: 0 FAILED: 2
1. Error: [<-,DelayedDataFrame 2-D subseting works (@test_DelayedDataFrame-method.R#145)
2. Error: [[<-,DelayedDataFrame is correct (@test_DelayedDataFrame-method.R#220)
Error: testthat unit tests failed
Execution halted
|
DelayedDataFrame.Rcheck/tests_x64/testthat.Rout.fail
R Under development (unstable) (2019-03-09 r76216) -- "Unsuffered Consequences"
Copyright (C) 2019 The R Foundation for Statistical Computing
Platform: x86_64-w64-mingw32/x64 (64-bit)
R is free software and comes with ABSOLUTELY NO WARRANTY.
You are welcome to redistribute it under certain conditions.
Type 'license()' or 'licence()' for distribution details.
R is a collaborative project with many contributors.
Type 'contributors()' for more information and
'citation()' on how to cite R or R packages in publications.
Type 'demo()' for some demos, 'help()' for on-line help, or
'help.start()' for an HTML browser interface to help.
Type 'q()' to quit R.
> library(testthat)
> library(DelayedDataFrame)
Loading required package: S4Vectors
Loading required package: stats4
Loading required package: BiocGenerics
Loading required package: parallel
Attaching package: 'BiocGenerics'
The following objects are masked from 'package:parallel':
clusterApply, clusterApplyLB, clusterCall, clusterEvalQ,
clusterExport, clusterMap, parApply, parCapply, parLapply,
parLapplyLB, parRapply, parSapply, parSapplyLB
The following objects are masked from 'package:stats':
IQR, mad, sd, var, xtabs
The following objects are masked from 'package:base':
Filter, Find, Map, Position, Reduce, anyDuplicated, append,
as.data.frame, basename, cbind, colMeans, colSums, colnames,
dirname, do.call, duplicated, eval, evalq, get, grep, grepl,
intersect, is.unsorted, lapply, mapply, match, mget, order, paste,
pmax, pmax.int, pmin, pmin.int, rank, rbind, rowMeans, rowSums,
rownames, sapply, setdiff, sort, table, tapply, union, unique,
unsplit, which, which.max, which.min
Attaching package: 'S4Vectors'
The following object is masked from 'package:base':
expand.grid
Loading required package: DelayedArray
Loading required package: matrixStats
Loading required package: IRanges
Attaching package: 'IRanges'
The following object is masked from 'package:grDevices':
windows
Loading required package: BiocParallel
Attaching package: 'DelayedArray'
The following objects are masked from 'package:matrixStats':
colMaxs, colMins, colRanges, rowMaxs, rowMins, rowRanges
The following objects are masked from 'package:base':
aperm, apply, rowsum
>
> test_check("DelayedDataFrame")
-- 1. Error: [<-,DelayedDataFrame 2-D subseting works (@test_DelayedDataFrame-me
invalid class "DelayedDataFrame" object:
'.index(x)' must be of same length of 'ncols(x)'
1: `[<-`(`*tmp*`, 1:5, 1, value = c("e", "d", "c", "b", "a")) at testthat/test_DelayedDataFrame-method.R:145
2: `[<-`(`*tmp*`, 1:5, 1, value = c("e", "d", "c", "b", "a"))
3: callNextMethod()
4: .nextMethod(x = x, i = i, j = j, value = value)
5: mergeROWS(extractCOLS(x, j), i, value)
6: extractCOLS(x, j)
7: extractCOLS(x, j)
8: initialize(x, listData = new_listData, elementMetadata = new_mcols)
9: initialize(x, listData = new_listData, elementMetadata = new_mcols)
10: validObject(.Object)
11: stop(msg, ": ", errors, domain = NA)
-- 2. Error: [[<-,DelayedDataFrame is correct (@test_DelayedDataFrame-method.R#2
cannot coerce class "list" to a DataFrame
1: `[[<-`(`*tmp*`, "da0", value = structure(c(6L, 8L, 7L, 4L, 9L, 1L, 3L, 2L, 5L, 10L
), .Dim = 10L)) at testthat/test_DelayedDataFrame-method.R:220
2: `[[<-`(`*tmp*`, "da0", value = structure(c(6L, 8L, 7L, 4L, 9L, 1L, 3L, 2L, 5L, 10L
), .Dim = 10L))
3: callNextMethod(x, i, value = value)
4: eval(call, callEnv)
5: eval(call, callEnv)
6: .nextMethod(x, i, value = value)
7: setListElement(x, i, value)
8: setListElement(x, i, value)
9: .replace_list_element(x, i2, value)
10: `[<-`(`*tmp*`, i, value = new("DelayedDataFrame", lazyIndex = new("LazyIndex", index = 1L,
listData = list(NULL), elementType = "ANY", elementMetadata = NULL, metadata = list()),
rownames = NULL, nrows = 10L, listData = list(da0 = structure(c(6L, 8L, 7L, 4L,
9L, 1L, 3L, 2L, 5L, 10L), .Dim = 10L)), elementType = "ANY", elementMetadata = NULL,
metadata = list()))
...
14: replaceCOLS(x, i, value)
15: replaceCOLS(x, i, value)
16: initialize(x, sl, rownames = .make_rownames(x, ri, ri, value), nrows = max_len)
17: initialize(x, sl, rownames = .make_rownames(x, ri, ri, value), nrows = max_len)
18: `as<-`(`*tmp*`, Classi, value = obj)
19: asMethod(object, Class, value)
20: as(from, "DataFrame", TRUE)
21: asMethod(object)
22: DataFrame(listData, row.names = rownames(from))
23: stop("cannot coerce class \"", class(listData[[i]])[1L], "\" to a DataFrame")
== testthat results ===========================================================
OK: 109 SKIPPED: 0 FAILED: 2
1. Error: [<-,DelayedDataFrame 2-D subseting works (@test_DelayedDataFrame-method.R#145)
2. Error: [[<-,DelayedDataFrame is correct (@test_DelayedDataFrame-method.R#220)
Error: testthat unit tests failed
Execution halted
|