... | ... |
@@ -97,15 +97,17 @@ plotRTgroup <- function(x, i, group, type = c("graph", "pairs"), |
97 | 97 |
} else { |
98 | 98 |
## Background colors by feature group |
99 | 99 |
.panel.diagcol <- function(x, i, ...) { |
100 |
+ ## From 4.2, resetting graphical parameters with queried values seem |
|
101 |
+ ## to raise a warning |
|
100 | 102 |
usr <- par("usr") |
101 |
- on.exit(par(usr)) |
|
103 |
+ ## on.exit(par(usr)) |
|
102 | 104 |
rect(usr[1],usr[3],usr[2],usr[4], col = cols[i]) |
103 | 105 |
} |
104 | 106 |
|
105 | 107 |
## From pairs function examples |
106 | 108 |
.panel.cor <- function(x, y, digits = 2, prefix = "", cex.cor, ...) { |
107 |
- usr <- par("usr") |
|
108 |
- on.exit(par(usr)) |
|
109 |
+ ## usr <- par("usr") |
|
110 |
+ ## on.exit(par(usr)) |
|
109 | 111 |
par(usr = c(0, 1, 0, 1)) |
110 | 112 |
## r <- abs(cor(x, y)) |
111 | 113 |
r <- cor(x, y) |
... | ... |
@@ -27,8 +27,8 @@ knitr::opts_chunk$set( |
27 | 27 |
|
28 | 28 |
The `qmtools` package provides basic tools for imputation, normalization, and |
29 | 29 |
dimension-reduction of metabolomics data with the standard |
30 |
-`SummarizedExperiment` class. It also provides several helper functions to |
|
31 |
-assist visualization of data. This vignette is intended to brief descriptions of |
|
30 |
+`SummarizedExperiment` class. It also offers several helper functions to assist |
|
31 |
+visualization of data. This vignette gives brief descriptions of |
|
32 | 32 |
these tools with toy examples. |
33 | 33 |
|
34 | 34 |
# Installation |