... | ... |
@@ -22,7 +22,6 @@ S3method(print,COMPASSResult) |
22 | 22 |
S3method(subset,COMPASSContainer) |
23 | 23 |
S3method(summary,COMPASSContainer) |
24 | 24 |
S3method(summary,COMPASSResult) |
25 |
-export(">=") |
|
26 | 25 |
export("COMPASSDescription<-") |
27 | 26 |
export("metadata<-") |
28 | 27 |
export(COMPASS) |
... | ... |
@@ -45,12 +44,9 @@ export(SimpleCOMPASS) |
45 | 44 |
export(TotalCellCounts) |
46 | 45 |
export(UniqueCombinations) |
47 | 46 |
export(categories) |
48 |
-export(condition) |
|
49 |
-export(degree) |
|
50 | 47 |
export(getCounts) |
51 | 48 |
export(markers) |
52 | 49 |
export(metadata) |
53 |
-export(on) |
|
54 | 50 |
export(pheatmap) |
55 | 51 |
export(plot2) |
56 | 52 |
export(plotCOMPASSResultStack) |
... | ... |
@@ -60,7 +56,6 @@ export(shinyCOMPASS) |
60 | 56 |
export(shinyCOMPASSDeps) |
61 | 57 |
export(translate_marker_names) |
62 | 58 |
export(transpose_list) |
63 |
-export(x) |
|
64 | 59 |
import(data.table) |
65 | 60 |
import(grid) |
66 | 61 |
import(magrittr) |
... | ... |
@@ -14,16 +14,15 @@ |
14 | 14 |
#' @details |
15 | 15 |
#' The response is computed from the sampled Gamma matrix, subsetting on the selected markers, and |
16 | 16 |
#' @return A \code{vector} of response probabilities for each subject. |
17 |
-#' @export |
|
18 |
-#' |
|
19 | 17 |
#' @examples |
18 |
+#' |
|
20 | 19 |
#' Response(CR, markers = c("M1","M2","M3"), degree = 2) |
20 |
+#' @export |
|
21 | 21 |
Response <- function(x, markers, degree, max.prob, cond_response){ |
22 | 22 |
UseMethod("Response") |
23 | 23 |
} |
24 | 24 |
|
25 | 25 |
##' @rdname Response |
26 |
-##' @export |
|
27 | 26 |
Response.COMPASSResult <- function(x, markers = NULL, degree = 1, max.prob = FALSE, cond_response = FALSE) { |
28 | 27 |
## we drop the last column as it is the 'NULL' category |
29 | 28 |
if (is.null(markers)) { |
... | ... |
@@ -63,7 +62,7 @@ Response.COMPASSResult <- function(x, markers = NULL, degree = 1, max.prob = FAL |
63 | 62 |
rownames(response) <- rownames(new_mean_gamma) |
64 | 63 |
colnames(response) <- paste0("Pr(response|degree >=",degree,")") |
65 | 64 |
}else{ |
66 |
- #' condition on degree >= x |
|
65 |
+ #condition on degree >= x |
|
67 | 66 |
response <- new_mean_gamma[,include_cols, drop = FALSE] |
68 | 67 |
if (!max.prob & !cond_response) { |
69 | 68 |
# probability of response from total probability |
... | ... |
@@ -34,5 +34,6 @@ i.e., the probability of at least \code{degree} markers exhibiting an antigen sp |
34 | 34 |
The response is computed from the sampled Gamma matrix, subsetting on the selected markers, and |
35 | 35 |
} |
36 | 36 |
\examples{ |
37 |
+ |
|
37 | 38 |
Response(CR, markers = c("M1","M2","M3"), degree = 2) |
38 | 39 |
} |