xcms.Rcheck/tests_i386/testthat.Rout
R version 3.5.1 Patched (2018-07-24 r75005) -- "Feather Spray"
Copyright (C) 2018 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(xcms)
Loading required package: Biobase
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, lengths, 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
Welcome to Bioconductor
Vignettes contain introductory material; view with
'browseVignettes()'. To cite Bioconductor, see
'citation("Biobase")', and for packages 'citation("pkgname")'.
Loading required package: BiocParallel
Loading required package: MSnbase
Loading required package: mzR
Loading required package: Rcpp
Loading required package: ProtGenerics
This is MSnbase version 2.6.4
Visit https://lgatto.github.io/MSnbase/ to get started.
Attaching package: 'MSnbase'
The following object is masked from 'package:stats':
smooth
The following object is masked from 'package:base':
trimws
This is xcms version 3.2.0
Attaching package: 'xcms'
The following object is masked from 'package:stats':
sigma
> library(faahKO)
> library(msdata)
>
> attr(faahko, "filepaths") <- sapply(
+ as.list(basename(attr(faahko, "filepaths"))),
+ function(x) system.file("cdf", if (length(grep("ko",x)) > 0) "KO" else "WT",
+ x, package = "faahKO"))
> if (.Platform$OS.type == "unix") {
+ prm <- MulticoreParam()
+ } else {
+ prm <- SnowParam()
+ }
> register(bpstart(prm))
>
> ## Create some objects we can re-use in different tests:
> faahko_3_files <- c(system.file('cdf/KO/ko15.CDF', package = "faahKO"),
+ system.file('cdf/KO/ko16.CDF', package = "faahKO"),
+ system.file('cdf/KO/ko18.CDF', package = "faahKO"))
>
> ## An xcmsRaw for the first file:
> faahko_xr_1 <- xcmsRaw(system.file('cdf/KO/ko15.CDF', package = "faahKO"),
+ profstep = 0)
> faahko_od <- readMSData(faahko_3_files, mode = "onDisk")
Polarity can not be extracted from netCDF files, please set manually the polarity with the 'polarity' method.
> faahko_xod <- findChromPeaks(faahko_od, param = CentWaveParam(noise = 10000,
+ snthresh = 40))
Detecting mass traces at 25 ppm ... OK
Detecting chromatographic peaks in 937 regions of interest ... OK: 87 found.
Detecting mass traces at 25 ppm ... OK
Detecting chromatographic peaks in 1025 regions of interest ... OK: 100 found.
Detecting mass traces at 25 ppm ... OK
Detecting chromatographic peaks in 919 regions of interest ... OK: 61 found.
> faahko_xs <- xcmsSet(faahko_3_files, profparam = list(step = 0),
+ method = "centWave", noise = 10000, snthresh = 40)
Loading required package: xcms
This is xcms version 3.2.0
Attaching package: 'xcms'
The following object is masked from 'package:stats':
sigma
Detecting mass traces at 25 ppm ... OK
Detecting chromatographic peaks in 919 regions of interest ... OK: 61 found.
Loading required package: xcms
This is xcms version 3.2.0
Attaching package: 'xcms'
The following object is masked from 'package:stats':
sigma
Detecting mass traces at 25 ppm ... OK
Detecting chromatographic peaks in 937 regions of interest ... OK: 87 found.
Loading required package: xcms
This is xcms version 3.2.0
Attaching package: 'xcms'
The following object is masked from 'package:stats':
sigma
Detecting mass traces at 25 ppm ... OK
Detecting chromatographic peaks in 1025 regions of interest ... OK: 100 found.
> faahko_xsg <- group(faahko_xs)
Processing 2572 mz slices ... OK
> ## Doing also the retention time correction etc
> od_x <- faahko_od
> xod_x <- faahko_xod
> pdp <- PeakDensityParam(sampleGroups = rep(1, 3))
> xod_xg <- groupChromPeaks(xod_x, param = pdp)
Processing 2572 mz slices ... OK
> xod_xgr <- adjustRtime(xod_xg, param = PeakGroupsParam(span = 0.4))
Performing retention time correction using 19 peak groups.
Applying retention time adjustment to the identified chromatographic peaks ... OK
> xod_xgrg <- groupChromPeaks(xod_xgr, param = pdp)
Processing 2572 mz slices ... OK
> xod_r <- adjustRtime(as(od_x, "XCMSnExp"), param = ObiwarpParam())
Sample number 2 used as center sample.
Aligning ko15.CDF against ko16.CDF ... OK
Aligning ko18.CDF against ko16.CDF ... OK
>
> faahko_grouped_filled <- fillPeaks(group(faahko))
Processing 3195 mz slices ... OK
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/KO/ko15.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/KO/ko16.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/KO/ko18.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/WT/wt15.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/WT/wt16.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/WT/wt18.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/KO/ko19.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/KO/ko21.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/KO/ko22.CDF
method: bin
step: 0.1
Loading required package: xcms
Loading required package: Biobase
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, lengths, 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
Welcome to Bioconductor
Vignettes contain introductory material; view with
'browseVignettes()'. To cite Bioconductor, see
'citation("Biobase")', and for packages 'citation("pkgname")'.
Loading required package: BiocParallel
Loading required package: MSnbase
Loading required package: mzR
Loading required package: Rcpp
Loading required package: ProtGenerics
This is MSnbase version 2.6.4
Visit https://lgatto.github.io/MSnbase/ to get started.
Attaching package: 'MSnbase'
The following object is masked from 'package:stats':
smooth
The following object is masked from 'package:base':
trimws
This is xcms version 3.2.0
Attaching package: 'xcms'
The following object is masked from 'package:stats':
sigma
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/WT/wt19.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/WT/wt21.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/WT/wt22.CDF
method: bin
step: 0.1
> faahko_grouped_retcor_filled <-
+ fillPeaks(group(retcor(group(updateObject(faahko)))))
Processing 3195 mz slices ... OK
Performing retention time correction using 132 peak groups.
Processing 3195 mz slices ... OK
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/KO/ko15.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/KO/ko16.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/KO/ko18.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/WT/wt19.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/WT/wt21.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/WT/wt22.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/KO/ko19.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/KO/ko21.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/KO/ko22.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/WT/wt15.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/WT/wt16.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/WT/wt18.CDF
method: bin
step: 0.1
>
> microtofq_fs <- c(system.file("microtofq/MM14.mzML", package = "msdata"),
+ system.file("microtofq/MM8.mzML", package = "msdata"))
> microtofq_xr <- xcmsRaw(microtofq_fs[1], profstep = 0)
> microtofq_od <- readMSData(microtofq_fs, mode = "onDisk")
>
> ## Direct injection data:
> fticrf <- list.files(system.file("fticr", package = "msdata"),
+ recursive = TRUE, full.names = TRUE)
> fticr <- readMSData(fticrf[1:2], msLevel. = 1, mode = "onDisk")
> fticr_xod <- findChromPeaks(fticr, MSWParam(scales = c(1, 7),
+ peakThr = 80000, ampTh = 0.005,
+ SNR.method = "data.mean",
+ winSize.noise = 500))
> fticr_xs <- xcmsSet(method="MSW", files=fticrf[1:2], scales=c(1,7),
+ SNR.method='data.mean' , winSize.noise=500,
+ peakThr=80000, amp.Th=0.005)
>
> fs <- c(system.file('cdf/KO/ko15.CDF', package = "faahKO"),
+ system.file('cdf/KO/ko16.CDF', package = "faahKO"),
+ system.file('cdf/KO/ko18.CDF', package = "faahKO"),
+ system.file('cdf/KO/ko19.CDF', package = "faahKO"))
> xs_1 <- xcmsSet(fs, profparam = list(step = 0), method = "centWave",
+ noise = 10000, snthresh = 50)
Detecting mass traces at 25 ppm ... OK
Detecting chromatographic peaks in 937 regions of interest ... OK: 75 found.
Detecting mass traces at 25 ppm ... OK
Detecting chromatographic peaks in 781 regions of interest ... OK: 46 found.
Detecting mass traces at 25 ppm ... OK
Detecting chromatographic peaks in 919 regions of interest ... OK: 41 found.
Detecting mass traces at 25 ppm ... OK
Detecting chromatographic peaks in 1025 regions of interest ... OK: 79 found.
>
> test_check("xcms")
8.00 16.00 24.00 28.00 32.00 40.00 48.00 52.00 56.00 60.00 64.00 72.00 80.00 84.00 88.00 96.00 100.00
8.00 16.00 28.00 32.00 40.00 64.00 80.00 96.00 100.00
8.00 16.00 24.00 28.00 32.00 40.00 48.00 52.00 56.00 60.00 64.00 72.00 80.00 84.00 88.00 96.00 100.00
center sample: ko16
Processing: ko15 ko18
center sample: ko18
Processing: ko15 ko16
center sample: ko18
Processing: ko15 ko16
8.00 16.00 24.00 28.00 32.00 40.00 48.00 52.00 56.00 60.00 64.00 72.00 80.00 84.00 88.00 96.00 100.00
8.00 16.00 24.00 28.00 32.00 40.00 48.00 52.00 56.00 60.00 64.00 72.00 80.00 84.00 88.00 96.00 100.00
8.00 16.00 28.00 32.00 40.00 56.00 64.00 80.00 88.00 96.00 100.00
8.00 16.00 28.00 32.00 40.00 56.00 64.00 80.00 88.00 96.00 100.00
8.00 16.00 24.00 28.00 32.00 40.00 48.00 52.00 56.00 60.00 64.00 72.00 80.00 84.00 88.00 96.00 100.00
8.00 16.00 24.00 28.00 32.00 40.00 48.00 52.00 56.00 60.00 64.00 72.00 80.00 84.00 88.00 96.00 100.00
HAM004_641fE_14-11-07--Exp1.extracted HAM004_641fE_14-11-07--Exp2.extracted
method: bin
step: 0.1
method: bin
step: 0.3
method: binlin
step: 0.2
method: binlinbase
step: 0.2
method: intlin
step: 0.2
center sample: ko15
Processing: ko16
center sample: ko16
Processing: ko15
center sample: ko16
Processing: ko15
center sample: ko16
Processing: ko15
center sample: ko16
Processing: ko15
center sample: ko16
Processing: ko15
center sample: ko16
Processing: ko15
center sample: ko16
Processing: ko15
Comparing peaks...OK
Comparing peaks...OK
Comparing peaks...OK
Comparing peak groups...OK
Comparing peaks...OK
Comparing peak groups...OK
Comparing peaks...OK
Comparing peak groups...OK
== testthat results ===========================================================
OK: 2287 SKIPPED: 4 FAILED: 0
>
> proc.time()
user system elapsed
383.01 7.70 473.29
There were 50 or more warnings (use warnings() to see the first 50)
Warning messages:
There were 50 or more warnings (use warnings() to see the first 50)
1: There were 50 or more warnings (use warnings() to see the first 50)
In .getPeaks_new(object, peakrange, step = step) :
getPeaks: Peak m/z:246.05-246.1, RT:2502.79243216103-2532.91912290636is out of retention time range for this sample (C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/WT/wt19.CDF), using zero intensity value.
2: In lmrob.S(x, y, control = control) :
S-estimated scale == 0: Probably exact fit; check your data
3: In lmrob.S(x, y, control = control) :
S-estimated scale == 0: Probably exact fit; check your data
4: In lmrob.S(x, y, control = control) :
S-estimated scale == 0: Probably exact fit; check your data
5: In lmrob.S(x, y, control = control) :
S-estimated scale == 0: Probably exact fit; check your data
6: In lmrob.S(x, y, control = control) :
S-estimated scale == 0: Probably exact fit; check your data
|
xcms.Rcheck/tests_x64/testthat.Rout
R version 3.5.1 Patched (2018-07-24 r75005) -- "Feather Spray"
Copyright (C) 2018 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(xcms)
Loading required package: Biobase
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, lengths, 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
Welcome to Bioconductor
Vignettes contain introductory material; view with
'browseVignettes()'. To cite Bioconductor, see
'citation("Biobase")', and for packages 'citation("pkgname")'.
Loading required package: BiocParallel
Loading required package: MSnbase
Loading required package: mzR
Loading required package: Rcpp
Loading required package: ProtGenerics
This is MSnbase version 2.6.4
Visit https://lgatto.github.io/MSnbase/ to get started.
Attaching package: 'MSnbase'
The following object is masked from 'package:stats':
smooth
The following object is masked from 'package:base':
trimws
This is xcms version 3.2.0
Attaching package: 'xcms'
The following object is masked from 'package:stats':
sigma
> library(faahKO)
> library(msdata)
>
> attr(faahko, "filepaths") <- sapply(
+ as.list(basename(attr(faahko, "filepaths"))),
+ function(x) system.file("cdf", if (length(grep("ko",x)) > 0) "KO" else "WT",
+ x, package = "faahKO"))
> if (.Platform$OS.type == "unix") {
+ prm <- MulticoreParam()
+ } else {
+ prm <- SnowParam()
+ }
> register(bpstart(prm))
>
> ## Create some objects we can re-use in different tests:
> faahko_3_files <- c(system.file('cdf/KO/ko15.CDF', package = "faahKO"),
+ system.file('cdf/KO/ko16.CDF', package = "faahKO"),
+ system.file('cdf/KO/ko18.CDF', package = "faahKO"))
>
> ## An xcmsRaw for the first file:
> faahko_xr_1 <- xcmsRaw(system.file('cdf/KO/ko15.CDF', package = "faahKO"),
+ profstep = 0)
> faahko_od <- readMSData(faahko_3_files, mode = "onDisk")
Polarity can not be extracted from netCDF files, please set manually the polarity with the 'polarity' method.
> faahko_xod <- findChromPeaks(faahko_od, param = CentWaveParam(noise = 10000,
+ snthresh = 40))
Detecting mass traces at 25 ppm ... OK
Detecting chromatographic peaks in 1025 regions of interest ... OK: 100 found.
Detecting mass traces at 25 ppm ... OK
Detecting chromatographic peaks in 919 regions of interest ... OK: 61 found.
Detecting mass traces at 25 ppm ... OK
Detecting chromatographic peaks in 937 regions of interest ... OK: 87 found.
> faahko_xs <- xcmsSet(faahko_3_files, profparam = list(step = 0),
+ method = "centWave", noise = 10000, snthresh = 40)
Loading required package: xcms
This is xcms version 3.2.0
Attaching package: 'xcms'
The following object is masked from 'package:stats':
sigma
Detecting mass traces at 25 ppm ... OK
Detecting chromatographic peaks in 919 regions of interest ... OK: 61 found.
Loading required package: xcms
This is xcms version 3.2.0
Attaching package: 'xcms'
The following object is masked from 'package:stats':
sigma
Detecting mass traces at 25 ppm ... OK
Detecting chromatographic peaks in 937 regions of interest ... OK: 87 found.
Loading required package: xcms
This is xcms version 3.2.0
Attaching package: 'xcms'
The following object is masked from 'package:stats':
sigma
Detecting mass traces at 25 ppm ... OK
Detecting chromatographic peaks in 1025 regions of interest ... OK: 100 found.
> faahko_xsg <- group(faahko_xs)
Processing 2572 mz slices ... OK
> ## Doing also the retention time correction etc
> od_x <- faahko_od
> xod_x <- faahko_xod
> pdp <- PeakDensityParam(sampleGroups = rep(1, 3))
> xod_xg <- groupChromPeaks(xod_x, param = pdp)
Processing 2572 mz slices ... OK
> xod_xgr <- adjustRtime(xod_xg, param = PeakGroupsParam(span = 0.4))
Performing retention time correction using 19 peak groups.
Applying retention time adjustment to the identified chromatographic peaks ... OK
> xod_xgrg <- groupChromPeaks(xod_xgr, param = pdp)
Processing 2572 mz slices ... OK
> xod_r <- adjustRtime(as(od_x, "XCMSnExp"), param = ObiwarpParam())
Sample number 2 used as center sample.
Aligning ko15.CDF against ko16.CDF ... OK
Aligning ko18.CDF against ko16.CDF ... OK
>
> faahko_grouped_filled <- fillPeaks(group(faahko))
Processing 3195 mz slices ... OK
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/WT/wt15.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/WT/wt16.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/WT/wt18.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/KO/ko15.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/KO/ko16.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/KO/ko18.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/KO/ko19.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/KO/ko21.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/KO/ko22.CDF
method: bin
step: 0.1
Loading required package: xcms
Loading required package: Biobase
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, lengths, 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
Welcome to Bioconductor
Vignettes contain introductory material; view with
'browseVignettes()'. To cite Bioconductor, see
'citation("Biobase")', and for packages 'citation("pkgname")'.
Loading required package: BiocParallel
Loading required package: MSnbase
Loading required package: mzR
Loading required package: Rcpp
Loading required package: ProtGenerics
This is MSnbase version 2.6.4
Visit https://lgatto.github.io/MSnbase/ to get started.
Attaching package: 'MSnbase'
The following object is masked from 'package:stats':
smooth
The following object is masked from 'package:base':
trimws
This is xcms version 3.2.0
Attaching package: 'xcms'
The following object is masked from 'package:stats':
sigma
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/WT/wt19.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/WT/wt21.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/WT/wt22.CDF
method: bin
step: 0.1
> faahko_grouped_retcor_filled <-
+ fillPeaks(group(retcor(group(updateObject(faahko)))))
Processing 3195 mz slices ... OK
Performing retention time correction using 132 peak groups.
Processing 3195 mz slices ... OK
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/WT/wt19.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/WT/wt21.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/WT/wt22.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/KO/ko19.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/KO/ko21.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/KO/ko22.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/WT/wt15.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/WT/wt16.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/WT/wt18.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/KO/ko15.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/KO/ko16.CDF
method: bin
step: 0.1
C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/KO/ko18.CDF
method: bin
step: 0.1
>
> microtofq_fs <- c(system.file("microtofq/MM14.mzML", package = "msdata"),
+ system.file("microtofq/MM8.mzML", package = "msdata"))
> microtofq_xr <- xcmsRaw(microtofq_fs[1], profstep = 0)
> microtofq_od <- readMSData(microtofq_fs, mode = "onDisk")
>
> ## Direct injection data:
> fticrf <- list.files(system.file("fticr", package = "msdata"),
+ recursive = TRUE, full.names = TRUE)
> fticr <- readMSData(fticrf[1:2], msLevel. = 1, mode = "onDisk")
> fticr_xod <- findChromPeaks(fticr, MSWParam(scales = c(1, 7),
+ peakThr = 80000, ampTh = 0.005,
+ SNR.method = "data.mean",
+ winSize.noise = 500))
> fticr_xs <- xcmsSet(method="MSW", files=fticrf[1:2], scales=c(1,7),
+ SNR.method='data.mean' , winSize.noise=500,
+ peakThr=80000, amp.Th=0.005)
>
> fs <- c(system.file('cdf/KO/ko15.CDF', package = "faahKO"),
+ system.file('cdf/KO/ko16.CDF', package = "faahKO"),
+ system.file('cdf/KO/ko18.CDF', package = "faahKO"),
+ system.file('cdf/KO/ko19.CDF', package = "faahKO"))
> xs_1 <- xcmsSet(fs, profparam = list(step = 0), method = "centWave",
+ noise = 10000, snthresh = 50)
Detecting mass traces at 25 ppm ... OK
Detecting chromatographic peaks in 781 regions of interest ... OK: 46 found.
Detecting mass traces at 25 ppm ... OK
Detecting chromatographic peaks in 1025 regions of interest ... OK: 79 found.
Detecting mass traces at 25 ppm ... OK
Detecting chromatographic peaks in 919 regions of interest ... OK: 41 found.
Detecting mass traces at 25 ppm ... OK
Detecting chromatographic peaks in 937 regions of interest ... OK: 75 found.
>
> test_check("xcms")
8.00 16.00 24.00 28.00 32.00 40.00 48.00 52.00 56.00 60.00 64.00 72.00 80.00 84.00 88.00 96.00 100.00
8.00 16.00 28.00 32.00 40.00 64.00 80.00 96.00 100.00
8.00 16.00 24.00 28.00 32.00 40.00 48.00 52.00 56.00 60.00 64.00 72.00 80.00 84.00 88.00 96.00 100.00
center sample: ko16
Processing: ko15 ko18
center sample: ko18
Processing: ko15 ko16
center sample: ko18
Processing: ko15 ko16
8.00 16.00 24.00 28.00 32.00 40.00 48.00 52.00 56.00 60.00 64.00 72.00 80.00 84.00 88.00 96.00 100.00
8.00 16.00 24.00 28.00 32.00 40.00 48.00 52.00 56.00 60.00 64.00 72.00 80.00 84.00 88.00 96.00 100.00
8.00 16.00 28.00 32.00 40.00 56.00 64.00 80.00 88.00 96.00 100.00
8.00 16.00 28.00 32.00 40.00 56.00 64.00 80.00 88.00 96.00 100.00
8.00 16.00 24.00 28.00 32.00 40.00 48.00 52.00 56.00 60.00 64.00 72.00 80.00 84.00 88.00 96.00 100.00
8.00 16.00 24.00 28.00 32.00 40.00 48.00 52.00 56.00 60.00 64.00 72.00 80.00 84.00 88.00 96.00 100.00
HAM004_641fE_14-11-07--Exp1.extracted HAM004_641fE_14-11-07--Exp2.extracted
method: bin
step: 0.1
method: bin
step: 0.3
method: binlin
step: 0.2
method: binlinbase
step: 0.2
method: intlin
step: 0.2
center sample: ko15
Processing: ko16
center sample: ko16
Processing: ko15
center sample: ko16
Processing: ko15
center sample: ko16
Processing: ko15
center sample: ko16
Processing: ko15
center sample: ko16
Processing: ko15
center sample: ko16
Processing: ko15
center sample: ko16
Processing: ko15
Comparing peaks...OK
Comparing peaks...OK
Comparing peaks...OK
Comparing peak groups...OK
Comparing peaks...OK
Comparing peak groups...OK
Comparing peaks...OK
Comparing peak groups...OK
== testthat results ===========================================================
OK: 2287 SKIPPED: 4 FAILED: 0
>
> proc.time()
user system elapsed
407.82 5.96 503.20
There were 50 or more warnings (use warnings() to see the first 50)
There were 50 or more warnings (use warnings() to see the first 50)
There were 50 or more warnings (use warnings() to see the first 50)
Warning messages:
1: In .getPeaks_new(object, peakrange, step = step) :
getPeaks: Peak m/z:246.05-246.1, RT:2502.79243216103-2532.91912290636is out of retention time range for this sample (C:/Users/biocbuild/bbs-3.7-bioc/R/library/faahKO/cdf/WT/wt19.CDF), using zero intensity value.
2: In lmrob.S(x, y, control = control) :
S-estimated scale == 0: Probably exact fit; check your data
3: In lmrob.S(x, y, control = control) :
S-estimated scale == 0: Probably exact fit; check your data
4: In lmrob.S(x, y, control = control) :
S-estimated scale == 0: Probably exact fit; check your data
5: In lmrob.S(x, y, control = control) :
S-estimated scale == 0: Probably exact fit; check your data
6: In lmrob.S(x, y, control = control) :
S-estimated scale == 0: Probably exact fit; check your data
|