Skip to content

Commit 7bb5652

Browse files
chrmongeaukrlmlr
authored andcommitted
Add tribble to imported objects
The `tibble` package states that "frame_data() is an older name for tribble(). It will eventually be phased out." (See: https://github.com/tidyverse/tibble/blob/2ba09826536ec33f4fb7b2edde146f19c99d95bd/man/tribble.Rd#L25-L26 ) This commit adds `tribble` to the imported objects from `tibble`.
1 parent 8c8ea30 commit 7bb5652

File tree

6 files changed

+57
-47
lines changed

6 files changed

+57
-47
lines changed

NAMESPACE

+2
Original file line numberDiff line numberDiff line change
@@ -530,6 +530,7 @@ export(translate_sql)
530530
export(translate_sql_)
531531
export(transmute)
532532
export(transmute_)
533+
export(tribble)
533534
export(trunc_mat)
534535
export(type_sum)
535536
export(ungroup)
@@ -555,6 +556,7 @@ importFrom(tibble,glimpse)
555556
importFrom(tibble,lst)
556557
importFrom(tibble,lst_)
557558
importFrom(tibble,tibble)
559+
importFrom(tibble,tribble)
558560
importFrom(tibble,trunc_mat)
559561
importFrom(tibble,type_sum)
560562
importFrom(utils,head)

NEWS.md

+2
Original file line numberDiff line numberDiff line change
@@ -105,6 +105,8 @@
105105

106106
* `mutate_all()` etc now accept unnamed additional arguments.
107107

108+
* `tribble()` is now imported from tibble (#2336, @chrMongeau).
109+
108110
# dplyr 0.5.0
109111

110112
## Breaking changes

R/RcppExports.R

+12-12
Original file line numberDiff line numberDiff line change
@@ -86,18 +86,6 @@ filter_impl <- function(df, dots) {
8686
.Call('dplyr_filter_impl', PACKAGE = 'dplyr', df, dots)
8787
}
8888

89-
grouped_indices_grouped_df_impl <- function(gdf) {
90-
.Call('dplyr_grouped_indices_grouped_df_impl', PACKAGE = 'dplyr', gdf)
91-
}
92-
93-
grouped_indices_impl <- function(data, symbols) {
94-
.Call('dplyr_grouped_indices_impl', PACKAGE = 'dplyr', data, symbols)
95-
}
96-
97-
group_size_grouped_cpp <- function(gdf) {
98-
.Call('dplyr_group_size_grouped_cpp', PACKAGE = 'dplyr', gdf)
99-
}
100-
10189
resolve_vars <- function(new_groups, names) {
10290
.Call('dplyr_resolve_vars', PACKAGE = 'dplyr', new_groups, names)
10391
}
@@ -114,6 +102,18 @@ ungroup_grouped_df <- function(df) {
114102
.Call('dplyr_ungroup_grouped_df', PACKAGE = 'dplyr', df)
115103
}
116104

105+
grouped_indices_grouped_df_impl <- function(gdf) {
106+
.Call('dplyr_grouped_indices_grouped_df_impl', PACKAGE = 'dplyr', gdf)
107+
}
108+
109+
grouped_indices_impl <- function(data, symbols) {
110+
.Call('dplyr_grouped_indices_impl', PACKAGE = 'dplyr', data, symbols)
111+
}
112+
113+
group_size_grouped_cpp <- function(gdf) {
114+
.Call('dplyr_group_size_grouped_cpp', PACKAGE = 'dplyr', gdf)
115+
}
116+
117117
semi_join_impl <- function(x, y, by_x, by_y) {
118118
.Call('dplyr_semi_join_impl', PACKAGE = 'dplyr', x, y, by_x, by_y)
119119
}

R/tibble-reexport.r

+4
Original file line numberDiff line numberDiff line change
@@ -42,6 +42,10 @@ tibble::glimpse
4242
#' @export
4343
tibble::frame_data
4444

45+
#' @importFrom tibble tribble
46+
#' @export
47+
tibble::tribble
48+
4549
#' @importFrom tibble tibble
4650
#' @export
4751
tibble::tibble

man/reexports.Rd

+3-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

src/RcppExports.cpp

+34-34
Original file line numberDiff line numberDiff line change
@@ -191,40 +191,6 @@ BEGIN_RCPP
191191
return rcpp_result_gen;
192192
END_RCPP
193193
}
194-
// grouped_indices_grouped_df_impl
195-
IntegerVector grouped_indices_grouped_df_impl(GroupedDataFrame gdf);
196-
RcppExport SEXP dplyr_grouped_indices_grouped_df_impl(SEXP gdfSEXP) {
197-
BEGIN_RCPP
198-
Rcpp::RObject rcpp_result_gen;
199-
Rcpp::RNGScope rcpp_rngScope_gen;
200-
Rcpp::traits::input_parameter< GroupedDataFrame >::type gdf(gdfSEXP);
201-
rcpp_result_gen = Rcpp::wrap(grouped_indices_grouped_df_impl(gdf));
202-
return rcpp_result_gen;
203-
END_RCPP
204-
}
205-
// grouped_indices_impl
206-
IntegerVector grouped_indices_impl(DataFrame data, ListOf<Symbol> symbols);
207-
RcppExport SEXP dplyr_grouped_indices_impl(SEXP dataSEXP, SEXP symbolsSEXP) {
208-
BEGIN_RCPP
209-
Rcpp::RObject rcpp_result_gen;
210-
Rcpp::RNGScope rcpp_rngScope_gen;
211-
Rcpp::traits::input_parameter< DataFrame >::type data(dataSEXP);
212-
Rcpp::traits::input_parameter< ListOf<Symbol> >::type symbols(symbolsSEXP);
213-
rcpp_result_gen = Rcpp::wrap(grouped_indices_impl(data, symbols));
214-
return rcpp_result_gen;
215-
END_RCPP
216-
}
217-
// group_size_grouped_cpp
218-
IntegerVector group_size_grouped_cpp(GroupedDataFrame gdf);
219-
RcppExport SEXP dplyr_group_size_grouped_cpp(SEXP gdfSEXP) {
220-
BEGIN_RCPP
221-
Rcpp::RObject rcpp_result_gen;
222-
Rcpp::RNGScope rcpp_rngScope_gen;
223-
Rcpp::traits::input_parameter< GroupedDataFrame >::type gdf(gdfSEXP);
224-
rcpp_result_gen = Rcpp::wrap(group_size_grouped_cpp(gdf));
225-
return rcpp_result_gen;
226-
END_RCPP
227-
}
228194
// resolve_vars
229195
SEXP resolve_vars(List new_groups, CharacterVector names);
230196
RcppExport SEXP dplyr_resolve_vars(SEXP new_groupsSEXP, SEXP namesSEXP) {
@@ -272,6 +238,40 @@ BEGIN_RCPP
272238
return rcpp_result_gen;
273239
END_RCPP
274240
}
241+
// grouped_indices_grouped_df_impl
242+
IntegerVector grouped_indices_grouped_df_impl(GroupedDataFrame gdf);
243+
RcppExport SEXP dplyr_grouped_indices_grouped_df_impl(SEXP gdfSEXP) {
244+
BEGIN_RCPP
245+
Rcpp::RObject rcpp_result_gen;
246+
Rcpp::RNGScope rcpp_rngScope_gen;
247+
Rcpp::traits::input_parameter< GroupedDataFrame >::type gdf(gdfSEXP);
248+
rcpp_result_gen = Rcpp::wrap(grouped_indices_grouped_df_impl(gdf));
249+
return rcpp_result_gen;
250+
END_RCPP
251+
}
252+
// grouped_indices_impl
253+
IntegerVector grouped_indices_impl(DataFrame data, ListOf<Symbol> symbols);
254+
RcppExport SEXP dplyr_grouped_indices_impl(SEXP dataSEXP, SEXP symbolsSEXP) {
255+
BEGIN_RCPP
256+
Rcpp::RObject rcpp_result_gen;
257+
Rcpp::RNGScope rcpp_rngScope_gen;
258+
Rcpp::traits::input_parameter< DataFrame >::type data(dataSEXP);
259+
Rcpp::traits::input_parameter< ListOf<Symbol> >::type symbols(symbolsSEXP);
260+
rcpp_result_gen = Rcpp::wrap(grouped_indices_impl(data, symbols));
261+
return rcpp_result_gen;
262+
END_RCPP
263+
}
264+
// group_size_grouped_cpp
265+
IntegerVector group_size_grouped_cpp(GroupedDataFrame gdf);
266+
RcppExport SEXP dplyr_group_size_grouped_cpp(SEXP gdfSEXP) {
267+
BEGIN_RCPP
268+
Rcpp::RObject rcpp_result_gen;
269+
Rcpp::RNGScope rcpp_rngScope_gen;
270+
Rcpp::traits::input_parameter< GroupedDataFrame >::type gdf(gdfSEXP);
271+
rcpp_result_gen = Rcpp::wrap(group_size_grouped_cpp(gdf));
272+
return rcpp_result_gen;
273+
END_RCPP
274+
}
275275
// semi_join_impl
276276
DataFrame semi_join_impl(DataFrame x, DataFrame y, CharacterVector by_x, CharacterVector by_y);
277277
RcppExport SEXP dplyr_semi_join_impl(SEXP xSEXP, SEXP ySEXP, SEXP by_xSEXP, SEXP by_ySEXP) {

0 commit comments

Comments
 (0)