Skip to content

Commit

Permalink
Support '*' expansion in CellCounts (#30)
Browse files Browse the repository at this point in the history
  • Loading branch information
kevinushey committed Apr 4, 2014
1 parent c1f953e commit effa131
Show file tree
Hide file tree
Showing 3 changed files with 97 additions and 31 deletions.
53 changes: 51 additions & 2 deletions R/CellCounts.R
Expand Up @@ -75,12 +75,61 @@ CellCounts.COMPASSContainer <- function(data, combinations) {

.CellCounts_character <- function(data, combinations) {

## Pre-parse the combinations by expanding entries of the form
## "A*B*C" to
##
## A & B & C
## A & B & !C
## A & !B & C
## ...
##
## TODO: Handle things like A&(B*C)
combos <- lapply(combinations, function(x) {

## Bail if no '*'
if (!grepl("*", x, fixed=TRUE)) return(x)

## Bail if unsupported combination seen
if (grepl("*", x, fixed=TRUE) && grepl("[&|]", x, perl=TRUE)) {
stop("currently cannot combine '*' expander with '&' or '|'",
call.=FALSE)
}

## Generate a matrix of 0s and 1s that forms the same 'structure'
splat <- unlist(strsplit(x, "*", fixed = TRUE))
n <- length(splat)
values <- do.call(
function(...) {
expand.grid(..., KEEP.OUT.ATTRS = FALSE)
},
replicate(n, c(0, 1), simplify = FALSE)
)

## Replace the 0s and 1s with appropriate names
for (i in seq_along(values)) {
values[, i] <- swap(values[, i],
c(0, 1),
c(splat[i], paste0("!", splat[i]))
)
}

## Paste and return the output
do.call(
function(...) paste(..., sep = "&"),
values,

)

})

combos <- unlist(combos)

output <- .Call(C_COMPASS_CellCounts_character,
data,
lapply(combinations, function(x) parse(text=x))
lapply(combos, function(x) parse(text=x))
)
rownames(output) <- names(data)
colnames(output) <- unlist(combinations)
colnames(output) <- combos
return(output)
}

Expand Down
24 changes: 12 additions & 12 deletions src/RcppExports.cpp
Expand Up @@ -5,32 +5,32 @@

using namespace Rcpp;

// CellCounts
IntegerMatrix CellCounts(List x, List combos);
RcppExport SEXP COMPASS_CellCounts(SEXP xSEXP, SEXP combosSEXP) {
// CellCounts_character
IntegerMatrix CellCounts_character(List data, List combinations);
RcppExport SEXP COMPASS_CellCounts_character(SEXP dataSEXP, SEXP combinationsSEXP) {
BEGIN_RCPP
SEXP __sexp_result;
{
Rcpp::RNGScope __rngScope;
Rcpp::traits::input_parameter< List >::type x(xSEXP );
Rcpp::traits::input_parameter< List >::type combos(combosSEXP );
IntegerMatrix __result = CellCounts(x, combos);
Rcpp::traits::input_parameter< List >::type data(dataSEXP );
Rcpp::traits::input_parameter< List >::type combinations(combinationsSEXP );
IntegerMatrix __result = CellCounts_character(data, combinations);
PROTECT(__sexp_result = Rcpp::wrap(__result));
}
UNPROTECT(1);
return __sexp_result;
END_RCPP
}
// CellCounts_character
IntegerMatrix CellCounts_character(List data, List combinations);
RcppExport SEXP COMPASS_CellCounts_character(SEXP dataSEXP, SEXP combinationsSEXP) {
// CellCounts
IntegerMatrix CellCounts(List x, List combos);
RcppExport SEXP COMPASS_CellCounts(SEXP xSEXP, SEXP combosSEXP) {
BEGIN_RCPP
SEXP __sexp_result;
{
Rcpp::RNGScope __rngScope;
Rcpp::traits::input_parameter< List >::type data(dataSEXP );
Rcpp::traits::input_parameter< List >::type combinations(combinationsSEXP );
IntegerMatrix __result = CellCounts_character(data, combinations);
Rcpp::traits::input_parameter< List >::type x(xSEXP );
Rcpp::traits::input_parameter< List >::type combos(combosSEXP );
IntegerMatrix __result = CellCounts(x, combos);
PROTECT(__sexp_result = Rcpp::wrap(__result));
}
UNPROTECT(1);
Expand Down
51 changes: 34 additions & 17 deletions tests/testthat/test-CellCounts.R
Expand Up @@ -15,23 +15,40 @@ data <- lapply(data, function(x) {
return (x)
})
combinations <- colnames(data[[1]]) ## [1] "A" "B" "C" "D" "E" "F"
expect_identical(
CellCounts(data, combinations),
CellCounts(data, 1:6)
)

expect_identical(
CellCounts(data, list(c(1, 2, 3))),
CellCounts(data, list("A&B&C"))
)
test_that("The integer and character interfaces for CellCounts match up", {

y <- "A&B&C"
expect_identical(
CellCounts(data, list(c(1, 2, 3))),
CellCounts(data, list(y))
)
expect_identical(
CellCounts(data, combinations),
CellCounts(data, 1:6)
)

expect_identical(
CellCounts(data, list(c(1, 2, 3))),
CellCounts(data, list("A&B&C"))
)

y <- "A&B&C"
expect_identical(
CellCounts(data, list(c(1, 2, 3))),
CellCounts(data, list(y))
)

expect_identical(
CellCounts(data, 1:6),
marginal_counts(data)
)

})

expect_identical(
CellCounts(data, 1:6),
marginal_counts(data)
)
test_that("We properly expand with a '*' in the name", {

expect_identical(
CellCounts(data, "A*B"),
CellCounts(data, c("A&B", "!A&B", "A&!B", "!A&!B"))
)

## TODO: allow combinations of * and [&|]
expect_error( CellCounts(data, "A*B&C"))

})

0 comments on commit effa131

Please sign in to comment.