... | ... |
@@ -7,6 +7,7 @@ S3method(FunctionalityScore,COMPASSResult) |
7 | 7 |
S3method(FunctionalityScore,default) |
8 | 8 |
S3method(PolyfunctionalityScore,COMPASSResult) |
9 | 9 |
S3method(PolyfunctionalityScore,default) |
10 |
+S3method(Response,COMPASSResult) |
|
10 | 11 |
S3method(UniqueCombinations,COMPASSContainer) |
11 | 12 |
S3method(UniqueCombinations,default) |
12 | 13 |
S3method(markers,COMPASSContainer) |
... | ... |
@@ -23,6 +23,7 @@ Response <- function(x, markers, degree, max.prob, cond_response){ |
23 | 23 |
} |
24 | 24 |
|
25 | 25 |
##' @rdname Response |
26 |
+##' @export |
|
26 | 27 |
Response.COMPASSResult <- function(x, markers = NULL, degree = 1, max.prob = FALSE, cond_response = FALSE) { |
27 | 28 |
## we drop the last column as it is the 'NULL' category |
28 | 29 |
if (is.null(markers)) { |