Browse code

whoops

gfinak authored on 08/05/2019 17:29:58
Showing 1 changed files

... ...
@@ -84,9 +84,9 @@ Response.COMPASSResult <- function(x, markers = NULL, degree = 1, max.prob = FAL
84 84
         response <-
85 85
           structure(
86 86
             rowSums(exp(log(
87
-              apply(Gamma(scr), 1:2, mean)
87
+              apply(Gamma(x), 1:2, mean)
88 88
             ) - log(
89
-              rowSums(apply(Gamma(scr), 1:2, mean)) + 1e-10
89
+              rowSums(apply(Gamma(x), 1:2, mean)) + 1e-10
90 90
             ))[, include_cols, drop = FALSE]),
91 91
             dim = c(nrow(response), 1),
92 92
             names = NULL,