Skip to content

Commit 6de01cd

Browse files
committedApr 7, 2024·
attempting to fix the s3 method consistency warnings
1 parent c1203dc commit 6de01cd

File tree

1 file changed

+11
-11
lines changed

1 file changed

+11
-11
lines changed
 

‎R/dplyr-groups.R

+11-11
Original file line numberDiff line numberDiff line change
@@ -158,8 +158,8 @@ group_vars.Ranges <- function(x) character(0)
158158
#' @method group_keys GroupedGenomicRanges
159159
#' @export
160160
#' @importFrom dplyr group_keys
161-
group_keys.GroupedGenomicRanges <- function(.data, ...) {
162-
.data@group_keys
161+
group_keys.GroupedGenomicRanges <- function(.tbl, ...) {
162+
.tbl@group_keys
163163
}
164164

165165
#' @method group_keys GroupedIntegerRanges
@@ -168,11 +168,11 @@ group_keys.GroupedIntegerRanges <- group_keys.GroupedGenomicRanges
168168

169169
#' @method group_keys Ranges
170170
#' @export
171-
group_keys.Ranges <- function(.data, ...) {
171+
group_keys.Ranges <- function(.tbl, ...) {
172172
if (length(enquos(...)) == 0) {
173173
return(new("DFrame", nrows = 1L))
174174
}
175-
NextMethod(group_by(.data, ...))
175+
NextMethod(group_by(.tbl, ...))
176176
}
177177

178178
#' @method group_indices GroupedGenomicRanges
@@ -228,20 +228,20 @@ group_data.Ranges <- function(.data) {
228228
#' @method group_split GroupedGenomicRanges
229229
#' @export
230230
#' @importFrom dplyr group_split
231-
group_split.GroupedGenomicRanges <- function(.data, ..., keep = TRUE) {
231+
group_split.GroupedGenomicRanges <- function(.tbl, ..., keep = TRUE) {
232232
if (length(enquos(...)) > 0) {
233233
warning("Ignoring arguments to `...`
234234
and using existing group structure")
235235
}
236236

237-
rng <- .data@delegate
237+
rng <- .tbl@delegate
238238

239239
if (!keep) {
240-
vars_drop <- lapply(group_vars(.data), function(.) rlang::quo(-!!.))
240+
vars_drop <- lapply(group_vars(.tbl), function(.) rlang::quo(-!!.))
241241
rng <- select(rng, !!!vars_drop)
242242
}
243243

244-
unname(S4Vectors::split(rng, .data@group_indices))
244+
unname(S4Vectors::split(rng, .tbl@group_indices))
245245
}
246246

247247
#' @method group_split GroupedIntegerRanges
@@ -250,9 +250,9 @@ group_split.GroupedIntegerRanges <- group_split.GroupedGenomicRanges
250250

251251
#' @method group_split Ranges
252252
#' @export
253-
group_split.Ranges <- function(.data, ..., keep = TRUE) {
253+
group_split.Ranges <- function(.tbl, ..., keep = TRUE) {
254254
if (length(enquos(...)) == 0) {
255-
return(as(.data, "List"))
255+
return(as(.tbl, "List"))
256256
}
257-
NextMethod(group_by(.data, ...))
257+
NextMethod(group_by(.tbl, ...))
258258
}

0 commit comments

Comments
 (0)
Please sign in to comment.