Browse code

fix actions

pcastellanoescuder authored on 14/12/2023 19:52:19
Showing 7 changed files

... ...
@@ -1,6 +1,6 @@
1 1
 Package: POMA
2 2
 Title: Tools for Omics Data Analysis   
3
-Version: 1.13.4
3
+Version: 1.13.5
4 4
 Authors@R: 
5 5
     c(person(given = "Pol",
6 6
              family = "Castellano-Escuder",
... ...
@@ -55,7 +55,7 @@ Imports:
55 55
     lme4,
56 56
     magrittr,
57 57
     MASS,
58
-    Matrix,
58
+    Matrix (<= 1.6.1),
59 59
     mixOmics,
60 60
     randomForest,
61 61
     RankProd (>= 3.14),
... ...
@@ -1,4 +1,4 @@
1
-# POMA 1.13.4
1
+# POMA 1.13.5
2 2
 
3 3
 * New POMA theme and colorblind-friendly palette
4 4
 * Available sample normalization (sum and quantile)
... ...
@@ -86,7 +86,7 @@ PomaPLS <- function(data,
86 86
 
87 87
   if (method == "pls") {
88 88
     dependent_variable <- SummarizedExperiment::colData(data) %>% 
89
-      as.data.frame() %>% 
89
+      dplyr::as_tibble() %>% 
90 90
       dplyr::select_if(is.numeric)
91 91
     
92 92
     if (ncol(dependent_variable) == 0) {
... ...
@@ -152,7 +152,7 @@ PomaPLS <- function(data,
152 152
   
153 153
   else if (method == "plsda") {
154 154
     dependent_variable <- SummarizedExperiment::colData(data) %>% 
155
-      as.data.frame() %>% 
155
+      dplyr::as_tibble() %>% 
156 156
       dplyr::select_if(is.factor)
157 157
     
158 158
     if (ncol(dependent_variable) == 0) {
... ...
@@ -263,7 +263,7 @@ PomaPLS <- function(data,
263 263
 
264 264
   else if (method == "splsda") {
265 265
     dependent_variable <- SummarizedExperiment::colData(data) %>% 
266
-      as.data.frame() %>% 
266
+      dplyr::as_tibble() %>% 
267 267
       dplyr::select_if(is.factor)
268 268
     
269 269
     if (ncol(dependent_variable) == 0) {
... ...
@@ -122,8 +122,8 @@ PomaUnivariate <- function(data,
122 122
   }
123 123
 
124 124
   else if (method == "anova") {
125
-    covariates <- SummarizedExperiment::colData(data) %>%
126
-      as.data.frame() %>%
125
+    covariates <- SummarizedExperiment::colData(data) %>% 
126
+      dplyr::as_tibble() %>% 
127 127
       dplyr::select(-1)
128 128
     
129 129
     if (is.null(covs)) {
... ...
@@ -1,7 +1,8 @@
1 1
 
2 2
 help_extract <- function(fun, 
3
-                         section = "Description") {
4
-  x <- capture.output(tools::Rd2txt(utils:::.getHelpFile(help(fun, ...)), options = list(sectionIndent = 0)))
3
+                         section = "Description",
4
+                         ...) {
5
+  x <- capture.output(tools::Rd2txt(utils:::.getHelpFile(utils::help(fun, ...)), options = list(sectionIndent = 0)))
5 6
   B <- grep("^_", x)
6 7
   x <- gsub("_\b", "", x, fixed = TRUE)
7 8
   X <- rep(FALSE, length(x))
... ...
@@ -20,8 +21,9 @@ help_extract <- function(fun,
20 21
   return(out)
21 22
 }
22 23
 
23
-title_extract <- function(fun) {
24
-  x <- capture.output(tools::Rd2txt(utils:::.getHelpFile(help(fun, ...)), options = list(sectionIndent = 0)))
24
+title_extract <- function(fun,
25
+                          ...) {
26
+  x <- capture.output(tools::Rd2txt(utils:::.getHelpFile(utils::help(fun, ...)), options = list(sectionIndent = 0)))
25 27
   x <- gsub("_\b", "", x, fixed = TRUE)
26 28
   title <- x[1]
27 29
   return(title)
... ...
@@ -16,7 +16,7 @@ output: github_document
16 16
 | _BioC_ branch 	| Status 	| Version 	| Dependencies 	| Rank 	|
17 17
 |-	|-	|-	|-	|-	|
18 18
 | [Release](http://bioconductor.org/packages/release/bioc/html/POMA.html) 	| [![Bioc release status](https://bioconductor.org/shields/build/release/bioc/POMA.svg)](https://bioconductor.org/checkResults/release/bioc-LATEST/POMA/) 	| [![BioC released version](https://img.shields.io/badge/release%20version-1.6.0-blue.svg)](https://www.bioconductor.org/packages/POMA) 	| [![Dependencies](http://bioconductor.org/shields/dependencies/release/POMA.svg)](http://bioconductor.org/packages/release/bioc/html/POMA.html#since) 	| [![Rank](http://www.bioconductor.org/shields/downloads/release/POMA.svg)](https://bioconductor.org/packages/stats/bioc/POMA) 	|
19
-| [Devel](http://bioconductor.org/packages/devel/bioc/html/POMA.html) 	| [![Bioc devel status](https://bioconductor.org/shields/build/devel/bioc/POMA.svg)](https://bioconductor.org/checkResults/devel/bioc-LATEST/POMA/) 	| [![BioC devel version](https://img.shields.io/badge/devel%20version-1.13.4-blue.svg)](https://bioconductor.org/packages/devel/bioc/html/POMA.html) 	| [![Dependencies](http://bioconductor.org/shields/dependencies/devel/POMA.svg)](http://bioconductor.org/packages/devel/bioc/html/POMA.html#since) 	| [![Rank](http://www.bioconductor.org/shields/downloads/devel/POMA.svg)](https://bioconductor.org/packages/stats/bioc/POMA) 	|
19
+| [Devel](http://bioconductor.org/packages/devel/bioc/html/POMA.html) 	| [![Bioc devel status](https://bioconductor.org/shields/build/devel/bioc/POMA.svg)](https://bioconductor.org/checkResults/devel/bioc-LATEST/POMA/) 	| [![BioC devel version](https://img.shields.io/badge/devel%20version-1.13.5-blue.svg)](https://bioconductor.org/packages/devel/bioc/html/POMA.html) 	| [![Dependencies](http://bioconductor.org/shields/dependencies/devel/POMA.svg)](http://bioconductor.org/packages/devel/bioc/html/POMA.html#since) 	| [![Rank](http://www.bioconductor.org/shields/downloads/devel/POMA.svg)](https://bioconductor.org/packages/stats/bioc/POMA) 	|
20 20
 
21 21
   <!-- badges: end -->
22 22
 
... ...
@@ -17,7 +17,7 @@ v3](https://img.shields.io/badge/License-GPLv3-blue.svg)](https://www.gnu.org/li
17 17
 | *BioC* branch                                                           | Status                                                                                                                                                  | Version                                                                                                                                            | Dependencies                                                                                                                                         | Rank                                                                                                                         |
18 18
 |-------------------------------------------------------------------------|---------------------------------------------------------------------------------------------------------------------------------------------------------|----------------------------------------------------------------------------------------------------------------------------------------------------|------------------------------------------------------------------------------------------------------------------------------------------------------|------------------------------------------------------------------------------------------------------------------------------|
19 19
 | [Release](http://bioconductor.org/packages/release/bioc/html/POMA.html) | [![Bioc release status](https://bioconductor.org/shields/build/release/bioc/POMA.svg)](https://bioconductor.org/checkResults/release/bioc-LATEST/POMA/) | [![BioC released version](https://img.shields.io/badge/release%20version-1.6.0-blue.svg)](https://www.bioconductor.org/packages/POMA)              | [![Dependencies](http://bioconductor.org/shields/dependencies/release/POMA.svg)](http://bioconductor.org/packages/release/bioc/html/POMA.html#since) | [![Rank](http://www.bioconductor.org/shields/downloads/release/POMA.svg)](https://bioconductor.org/packages/stats/bioc/POMA) |
20
-| [Devel](http://bioconductor.org/packages/devel/bioc/html/POMA.html)     | [![Bioc devel status](https://bioconductor.org/shields/build/devel/bioc/POMA.svg)](https://bioconductor.org/checkResults/devel/bioc-LATEST/POMA/)       | [![BioC devel version](https://img.shields.io/badge/devel%20version-1.13.4-blue.svg)](https://bioconductor.org/packages/devel/bioc/html/POMA.html) | [![Dependencies](http://bioconductor.org/shields/dependencies/devel/POMA.svg)](http://bioconductor.org/packages/devel/bioc/html/POMA.html#since)     | [![Rank](http://www.bioconductor.org/shields/downloads/devel/POMA.svg)](https://bioconductor.org/packages/stats/bioc/POMA)   |
20
+| [Devel](http://bioconductor.org/packages/devel/bioc/html/POMA.html)     | [![Bioc devel status](https://bioconductor.org/shields/build/devel/bioc/POMA.svg)](https://bioconductor.org/checkResults/devel/bioc-LATEST/POMA/)       | [![BioC devel version](https://img.shields.io/badge/devel%20version-1.13.5-blue.svg)](https://bioconductor.org/packages/devel/bioc/html/POMA.html) | [![Dependencies](http://bioconductor.org/shields/dependencies/devel/POMA.svg)](http://bioconductor.org/packages/devel/bioc/html/POMA.html#since)     | [![Rank](http://www.bioconductor.org/shields/downloads/devel/POMA.svg)](https://bioconductor.org/packages/stats/bioc/POMA)   |
21 21
 
22 22
 <!-- badges: end -->
23 23