This page was generated on 2018-04-12 13:08:49 -0400 (Thu, 12 Apr 2018).
RTCA 1.30.0 Jitao David Zhang
Snapshot Date: 2018-04-11 16:45:18 -0400 (Wed, 11 Apr 2018) |
URL: https://git.bioconductor.org/packages/RTCA |
Branch: RELEASE_3_6 |
Last Commit: cff347b |
Last Changed Date: 2017-10-30 12:39:27 -0400 (Mon, 30 Oct 2017) |
| malbec1 | Linux (Ubuntu 16.04.1 LTS) / x86_64 | NotNeeded | OK | [ OK ] | | |
tokay1 | Windows Server 2012 R2 Standard / x64 | NotNeeded | OK | OK | OK | |
veracruz1 | OS X 10.11.6 El Capitan / x86_64 | NotNeeded | OK | OK | OK | |
R version 3.4.4 (2018-03-15) -- "Someone to Lean On"
Copyright (C) 2018 The R Foundation for Statistical Computing
Platform: x86_64-pc-linux-gnu (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(RTCA)
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, cbind, colMeans, colSums, colnames, 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: RColorBrewer
Loading required package: gtools
>
>
> tl <- new("RTCAtimeline")
> timeUnit(tl) <- "hour"
> startTime(tl) <- Sys.time()-3e6
> show(tl)
RTCAtimeline
================================================
time action
0 start
================================================
Time unit: hour
RTCA-run start time: 2018-03-08 08:18:08
>
> tl2 <- addAction(tl, 1, "seeding")
> show(tl2)
RTCAtimeline
================================================
time action
0 start
1 seeding
================================================
Time unit: hour
RTCA-run start time: 2018-03-08 08:18:08
> stopifnot(getAction(tl2, 0)=="start")
> stopifnot(is.null(getAction(tl2, -1)))
>
> rmAction(tl2, 0)
RTCAtimeline
================================================
time action
1 seeding
================================================
Time unit: hour
RTCA-run start time: 2018-03-08 08:18:08
> rmAction(tl2, 1)
RTCAtimeline
================================================
time action
0 start
================================================
Time unit: hour
RTCA-run start time: 2018-03-08 08:18:08
> rmAction(tl2, -1)
RTCAtimeline
================================================
time action
0 start
1 seeding
================================================
Time unit: hour
RTCA-run start time: 2018-03-08 08:18:08
>
> updateAction(tl2, 1, "not seeding")
RTCAtimeline
================================================
time action
0 start
1 not seeding
================================================
Time unit: hour
RTCA-run start time: 2018-03-08 08:18:08
> updateAction(tl2, -1,"not seeding")
RTCAtimeline
================================================
time action
-1 not seeding
0 start
1 seeding
================================================
Time unit: hour
RTCA-run start time: 2018-03-08 08:18:08
> updateAction(tl2, -1,"not seeding", ifnotfound="ignore")
RTCAtimeline
================================================
time action
0 start
1 seeding
================================================
Time unit: hour
RTCA-run start time: 2018-03-08 08:18:08
> startTime(tl2) <- as.POSIXct("2009-05-06 14:52:03")
> tl2
RTCAtimeline
================================================
time action
0 start
1 seeding
================================================
Time unit: hour
RTCA-run start time: 2009-05-06 14:52:03
>
> ofile <- system.file("/extdata/testOutput.csv", package="RTCA")
> x <- parseRTCA(ofile)
Read 245 items
>
> ## add actions to timeline
> x <- addAction(x, 22, "transfection")
> x <- addAction(x, 30, "change medium")
>
> xr <- ratioTransform(x, 35)
> xrs <- smoothTransform(xr)
> xi <- interpolationTransform(x)
> xd <- derivativeTransform(x)
> xrgr <- rgrTransform(x)
> #plotRTCA(xrgr, xlim=c(35, 80), ylim=c(-0.2, 0.2))
> plot(sliceRTCA(x,0, 80)[,c(11,13)], type="l", col="black", ylim=c(0, 1.5))
> abline(h=0, col=2, lty=5)
> plot(sliceRTCA(xrgr, 20, 80)[,c(11,13)], type="l", col="black")
> abline(h=0, col=2, lty=5)
>
> plotGridEffect(x)
> plotGridEffect(x, "col")
> plateView(sliceRTCA(x, 0, 80))
>
> proc.time()
user system elapsed
2.744 0.076 2.816