3333# ' individual methods for extra arguments and differences in behaviour.
3434# '
3535# ' The following methods are currently available in loaded packages:
36- # '
36+ # '
3737# ' @param .data A data frame, data frame extension (e.g. a tibble), or a
3838# ' lazy data frame (e.g. from dbplyr or dtplyr). See *Methods*, below, for
3939# ' more details.
4040# ' @param ... <[`tidy-eval`][dplyr_tidy_eval]> Variables, or functions or
4141# ' variables. Use [desc()] to sort a variable in descending order.
4242# ' @param .by_group If TRUE, will sort first by grouping variable. Applies to grouped data frames only.
43- # '
43+ # '
4444# ' @return A tibble
4545# ' @family single table verbs
46- # '
46+ # '
4747# ' @rdname arrange-methods
4848# ' @name arrange
4949# ' @importFrom dplyr arrange
50- # '
50+ # '
5151# ' @examples
52- # ' `%>%` = magrittr::`%>%`
52+ # '
5353# ' arrange(mtcars, cyl, disp)
54- # '
54+ # '
5555# ' @export
5656NULL
5757
@@ -101,10 +101,10 @@ arrange.tidybulk <- function(.data, ..., .by_group = FALSE) {
101101# ' used instead.
102102# ' @return `bind_rows()` and `bind_cols()` return the same type as
103103# ' the first input, either a data frame, `tbl_df`, or `grouped_df`.
104- # '
105- # '
104+ # '
105+ # '
106106# ' @examples
107- # ' `%>%` = magrittr::`%>%`
107+ # '
108108# ' one <- mtcars[1:4, ]
109109# ' two <- mtcars[11:14, ]
110110# '
@@ -116,9 +116,9 @@ arrange.tidybulk <- function(.data, ..., .by_group = FALSE) {
116116NULL
117117
118118# ' @rdname bind-methods
119- # '
119+ # '
120120# ' @inheritParams bind
121- # '
121+ # '
122122# ' @export
123123# '
124124bind_rows <- function (... , .id = NULL ) {
@@ -134,9 +134,9 @@ bind_rows.default <- function(..., .id = NULL)
134134# ' @importFrom rlang dots_values
135135# ' @importFrom rlang flatten_if
136136# ' @importFrom rlang is_spliced
137- # '
137+ # '
138138# ' @export
139- # '
139+ # '
140140bind_rows.tidybulk <- function (... , .id = NULL )
141141{
142142
@@ -156,9 +156,9 @@ bind_rows.tidybulk <- function(..., .id = NULL)
156156}
157157
158158# ' @export
159- # '
159+ # '
160160# ' @inheritParams bind
161- # '
161+ # '
162162# ' @rdname bind-methods
163163bind_cols <- function (... , .id = NULL ) {
164164 UseMethod(" bind_cols" )
@@ -173,9 +173,9 @@ bind_cols.default <- function(..., .id = NULL)
173173# ' @importFrom rlang dots_values
174174# ' @importFrom rlang flatten_if
175175# ' @importFrom rlang is_spliced
176- # '
176+ # '
177177# ' @export
178- # '
178+ # '
179179bind_cols.tidybulk <- function (... , .id = NULL )
180180{
181181
@@ -198,7 +198,7 @@ bind_cols.tidybulk <- function(..., .id = NULL)
198198# ' @rdname distinct-methods
199199# ' @name distinct
200200# ' @importFrom dplyr distinct
201- # '
201+ # '
202202# ' @examples
203203# '
204204# ' tidybulk::se_mini %>% tidybulk() %>% distinct()
@@ -276,11 +276,11 @@ distinct.tidybulk <- function (.data, ..., .keep_all = FALSE)
276276# '
277277# ' The following methods are currently available in loaded packages:
278278# ' @seealso [filter_all()], [filter_if()] and [filter_at()].
279- # '
279+ # '
280280# ' @rdname filter-methods
281281# ' @name filter
282282# ' @importFrom dplyr filter
283- # '
283+ # '
284284# ' @export
285285# ' @examples
286286# '
@@ -365,10 +365,10 @@ group_by.tidybulk <- function (.data, ..., .add = FALSE, .drop = group_by_drop_d
365365# ' @rdname ungroup-methods
366366# ' @name ungroup
367367# ' @importFrom dplyr ungroup
368- # '
368+ # '
369369# ' @param x A [tbl()]
370370# ' @param ... See dplyr
371- # '
371+ # '
372372# ' @export
373373ungroup.tidybulk <- function (x , ... )
374374{
@@ -591,15 +591,15 @@ mutate.nested_tidybulk <- function(.data, ...)
591591 .data %> %
592592 drop_class(c(" nested_tidybulk" , " tt" )) %> %
593593 dplyr :: mutate(... ) %> %
594-
594+
595595 # Attach attributes
596596 reattach_internals(.data ) %> %
597-
597+
598598 # Add class
599599 add_class(" tt" ) %> %
600600 add_class(" nested_tidybulk" )
601-
602-
601+
602+
603603}
604604
605605# ' Rename columns
@@ -632,7 +632,7 @@ mutate.nested_tidybulk <- function(.data, ...)
632632# ' `%>%` = magrittr::`%>%`
633633# ' iris <- as_tibble(iris) # so it prints a little nicer
634634# ' rename(iris, petal_length = Petal.Length)
635- # '
635+ # '
636636# ' @rdname rename-methods
637637# ' @name rename
638638# ' @importFrom dplyr rename
@@ -685,7 +685,7 @@ rename.tidybulk <- function(.data, ...)
685685# ' `%>%` = magrittr::`%>%`
686686# ' df <- expand.grid(x = 1:3, y = 3:1)
687687# ' df_done <- df %>% rowwise() %>% do(i = seq(.$x, .$y))
688- # '
688+ # '
689689# ' @rdname rowwise-methods
690690# ' @name rowwise
691691# ' @importFrom dplyr rowwise
0 commit comments