...
|
...
|
@@ -140,7 +140,7 @@ gmql_select <- function(input_data, predicate, region_predicate, s_join)
|
140
|
140
|
#'
|
141
|
141
|
#' @param .data GMQLDataset class object
|
142
|
142
|
#'
|
143
|
|
-#' @param not_in logical value: TRUE => for a given sample of input dataset
|
|
143
|
+#' @param is_in logical value: TRUE => for a given sample of input dataset
|
144
|
144
|
#' ".data" in \code{\link{filter}} method if and only if there exists at
|
145
|
145
|
#' least one sample in dataset 'data' with metadata attributes defined
|
146
|
146
|
#' in groupBy and these attributes of 'data' have at least one value in
|
...
|
...
|
@@ -182,7 +182,7 @@ gmql_select <- function(input_data, predicate, region_predicate, s_join)
|
182
|
182
|
#' @return semijoin condition as list
|
183
|
183
|
#' @export
|
184
|
184
|
#'
|
185
|
|
-semijoin <- function(.data, not_in = FALSE, groupBy)
|
|
185
|
+semijoin <- function(.data, is_in = TRUE, groupBy)
|
186
|
186
|
{
|
187
|
187
|
if(!is.null(groupBy))
|
188
|
188
|
{
|
...
|
...
|
@@ -204,9 +204,9 @@ semijoin <- function(.data, not_in = FALSE, groupBy)
|
204
|
204
|
if(!isClass("GMQLDataset", .data))
|
205
|
205
|
stop("data: Must be a GMQLDataset object")
|
206
|
206
|
|
207
|
|
- .check_logical(not_in)
|
|
207
|
+ .check_logical(is_in)
|
208
|
208
|
ptr_data <- value(.data)
|
209
|
|
- data_cond <- cbind(ptr_data,not_in)
|
|
209
|
+ data_cond <- cbind(ptr_data,is_in)
|
210
|
210
|
all_conds <- rbind(data_cond,cond)
|
211
|
211
|
join_condition_matrix <- .jarray(all_conds, dispatch = TRUE)
|
212
|
212
|
|