This page was generated on 2023-01-02 09:00:26 -0500 (Mon, 02 Jan 2023).
R Under development (unstable) (2022-12-25 r83502 ucrt) -- "Unsuffered Consequences"
Copyright (C) 2022 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("DelayedArray")
Loading required package: stats4
Loading required package: Matrix
Loading required package: BiocGenerics
Attaching package: 'BiocGenerics'
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, aperm, append,
as.data.frame, basename, cbind, 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, rownames, sapply, setdiff, sort, table,
tapply, union, unique, unsplit, which.max, which.min
Loading required package: MatrixGenerics
Loading required package: matrixStats
Attaching package: 'MatrixGenerics'
The following objects are masked from 'package:matrixStats':
colAlls, colAnyNAs, colAnys, colAvgsPerRowSet, colCollapse,
colCounts, colCummaxs, colCummins, colCumprods, colCumsums,
colDiffs, colIQRDiffs, colIQRs, colLogSumExps, colMadDiffs,
colMads, colMaxs, colMeans2, colMedians, colMins, colOrderStats,
colProds, colQuantiles, colRanges, colRanks, colSdDiffs, colSds,
colSums2, colTabulates, colVarDiffs, colVars, colWeightedMads,
colWeightedMeans, colWeightedMedians, colWeightedSds,
colWeightedVars, rowAlls, rowAnyNAs, rowAnys, rowAvgsPerColSet,
rowCollapse, rowCounts, rowCummaxs, rowCummins, rowCumprods,
rowCumsums, rowDiffs, rowIQRDiffs, rowIQRs, rowLogSumExps,
rowMadDiffs, rowMads, rowMaxs, rowMeans2, rowMedians, rowMins,
rowOrderStats, rowProds, rowQuantiles, rowRanges, rowRanks,
rowSdDiffs, rowSds, rowSums2, rowTabulates, rowVarDiffs, rowVars,
rowWeightedMads, rowWeightedMeans, rowWeightedMedians,
rowWeightedSds, rowWeightedVars
Loading required package: S4Vectors
Attaching package: 'S4Vectors'
The following objects are masked from 'package:Matrix':
expand, unname
The following objects are masked from 'package:base':
I, expand.grid, unname
Loading required package: IRanges
Attaching package: 'IRanges'
The following object is masked from 'package:grDevices':
windows
Attaching package: 'DelayedArray'
The following objects are masked from 'package:base':
apply, rowsum, scale, sweep
> # library("HDF5Array") # comment out
> # library("BiocSingular") # comment out
> library("rTensor")
Attaching package: 'rTensor'
The following object is masked from 'package:S4Vectors':
fold
> library("DelayedRandomArray")
> # library("irlba") # comment out
> # library("Matrix") # comment out
> library("einsum")
> library("DelayedTensor")
Attaching package: 'DelayedTensor'
The following object is masked from 'package:einsum':
einsum
The following objects are masked from 'package:rTensor':
cp, cs_fold, cs_unfold, fnorm, fold, hadamard_list, hosvd,
innerProd, k_fold, k_unfold, khatri_rao, khatri_rao_list,
kronecker_list, matvec, modeMean, modeSum, mpca, pvd, rs_fold,
rs_unfold, ttl, ttm, tucker, unfold, unmatvec, vec
The following object is masked from 'package:S4Vectors':
fold
The following objects are masked from 'package:Matrix':
diag, diag<-, kronecker
The following object is masked from 'package:methods':
kronecker
The following objects are masked from 'package:base':
diag, diag<-, kronecker
> library("reticulate")
> library("testthat")
> library("HDF5Array")
Loading required package: rhdf5
Attaching package: 'HDF5Array'
The following object is masked from 'package:rhdf5':
h5ls
>
> # Setting
> options(testthat.use_colours = FALSE)
> options(delayedtensor.sparse = FALSE)
> options(delayedtensor.verbose = FALSE)
> setHDF5DumpCompressionLevel(level=9L)
> source("testthat/test_Einsum_objects.R")
>
> # source("../R/Decomp.R") # comment out
> # source("../R/Einsum.R") # comment out
> # source("../R/Generics.R") # comment out
> # source("../R/Global-settings.R") # comment out
> # source("../R/Misc.R") # comment out
> # source("../R/SVD.R") # comment out
> # source("../R/Utils.R") # comment out
> # source("../R/zzz.R") # comment out
>
> # for(size in c(1E+9,1E+8,1E+7,1E+6,1E+5,1E+4,1E+3,1E+2,50,20:1)){ # comment out
> # setAutoBlockSize(size=size) # comment out
> # getAutoBlockSize() # comment out
> test_file("testthat/test_Generics.R")
══ Testing test_Generics.R ═════════════════════════════════════════════════════
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 0 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 0 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 1 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 2 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 3 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 4 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 5 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 6 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 6 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 7 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 8 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 9 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 9 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 10 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 10 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 11 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 12 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 13 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 13 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 14 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 15 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 16 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 16 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 17 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 18 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 19 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 20 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 21 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 22 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 22 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 23 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 24 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 25 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 26 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 27 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 28 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 28 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 29 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 29 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 30 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 30 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 31 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 31 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 32 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 32 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 33 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 33 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 34 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 34 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 35 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 35 ]
[ FAIL 1 | WARN 0 | SKIP 0 | PASS 35 ]
── Error ('test_Generics.R:168'): (code run outside of `test_that()`) ──────────
Error in `all.equal.numeric(x, y, tolerance = tolerance, check.attributes = check.attributes,
...)`: length(tolerance) == 1L is not TRUE
Backtrace:
1. testthat::expect_equal(tnsr@data, tnsr2@data, as.array(darr2))
at test_Generics.R:168:0
3. testthat:::compare.numeric(act$val, exp$val, ...)
5. base::all.equal.numeric(...)
6. base::stopifnot(length(tolerance) == 1L)
[ FAIL 1 | WARN 0 | SKIP 0 | PASS 35 ]
> test_file("testthat/test_Misc.R")
══ Testing test_Misc.R ═════════════════════════════════════════════════════════
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 0 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 0 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 1 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 1 ]
[ FAIL 1 | WARN 0 | SKIP 0 | PASS 1 ]
── Error ('test_Misc.R:29'): (code run outside of `test_that()`) ───────────────
Error in `all.equal.numeric(x, y, tolerance = tolerance, check.attributes = check.attributes,
...)`: length(tolerance) == 1L is not TRUE
Backtrace:
1. testthat::expect_equal(...)
at test_Misc.R:29:0
3. testthat:::compare.numeric(act$val, exp$val, ...)
5. base::all.equal.numeric(...)
6. base::stopifnot(length(tolerance) == 1L)
[ FAIL 1 | WARN 0 | SKIP 0 | PASS 1 ]
> # test_file("testthat/test_SVD.R") # comment out
> test_file("testthat/test_4thorder.R")
══ Testing test_4thorder.R ═════════════════════════════════════════════════════
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 0 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 0 ][1] "unfold"
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 1 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 2 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 3 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 4 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 5 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 6 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 7 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 7 ][1] "modeSum"
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 8 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 9 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 10 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 11 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 12 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 13 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 14 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 15 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 15 ][1] "innerProd"
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 16 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 16 ][1] "vec"
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 17 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 17 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 18 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 18 ][1] "fold"
[ FAIL 1 | WARN 0 | SKIP 0 | PASS 18 ]
── Error ('test_4thorder.R:91'): (code run outside of `test_that()`) ───────────
Error in `all.equal.numeric(x, y, tolerance = tolerance, check.attributes = check.attributes,
...)`: length(tolerance) == 1L is not TRUE
Backtrace:
1. testthat::expect_equal(arr4, tnsr4_2@data, as.array(darr4_2))
at test_4thorder.R:91:0
3. testthat:::compare.numeric(act$val, exp$val, ...)
5. base::all.equal.numeric(...)
6. base::stopifnot(length(tolerance) == 1L)
[ FAIL 1 | WARN 0 | SKIP 0 | PASS 18 ]
> test_file("testthat/test_Einsum.R")
══ Testing test_Einsum.R ═══════════════════════════════════════════════════════
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 0 ]
[ FAIL 0 | WARN 0 | SKIP 0 | PASS 0 ]
[ FAIL 1 | WARN 0 | SKIP 0 | PASS 0 ]
── Error ('test_Einsum.R:4'): (code run outside of `test_that()`) ──────────────
Error in `all.equal.numeric(x, y, tolerance = tolerance, check.attributes = check.attributes,
...)`: length(tolerance) == 1L is not TRUE
Backtrace:
1. testthat::expect_equal(...)
at test_Einsum.R:4:0
3. testthat:::compare.numeric(act$val, exp$val, ...)
5. base::all.equal.numeric(...)
6. base::stopifnot(length(tolerance) == 1L)
[ FAIL 1 | WARN 0 | SKIP 0 | PASS 0 ]
> # gc();gc() # comment out
> # } # comment out
>
> # setAutoBlockSize(size=1E+8)
> # test_file("testthat/test_Decomp.R")
> # test_file("testthat/test_Einsum_Py.R") # comment out
> # source("testthat/test_Verbose.R")
> # source("testthat/test_Sparse.R")
>
> # Profiling
> # source("testthat/test_SuperBig.R") # comment out
>
> proc.time()
user system elapsed
14.48 2.39 23.36