Skip to content

Commit

Permalink
Add tribble to imported objects
Browse files Browse the repository at this point in the history
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`.
  • Loading branch information
chrmongeau authored and krlmlr committed Dec 21, 2016
1 parent 8c8ea30 commit 7bb5652
Show file tree
Hide file tree
Showing 6 changed files with 57 additions and 47 deletions.
2 changes: 2 additions & 0 deletions NAMESPACE
Original file line number Diff line number Diff line change
Expand Up @@ -530,6 +530,7 @@ export(translate_sql)
export(translate_sql_)
export(transmute)
export(transmute_)
export(tribble)
export(trunc_mat)
export(type_sum)
export(ungroup)
Expand All @@ -555,6 +556,7 @@ importFrom(tibble,glimpse)
importFrom(tibble,lst)
importFrom(tibble,lst_)
importFrom(tibble,tibble)
importFrom(tibble,tribble)
importFrom(tibble,trunc_mat)
importFrom(tibble,type_sum)
importFrom(utils,head)
Expand Down
2 changes: 2 additions & 0 deletions NEWS.md
Original file line number Diff line number Diff line change
Expand Up @@ -105,6 +105,8 @@

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

* `tribble()` is now imported from tibble (#2336, @chrMongeau).

# dplyr 0.5.0

## Breaking changes
Expand Down
24 changes: 12 additions & 12 deletions R/RcppExports.R
Original file line number Diff line number Diff line change
Expand Up @@ -86,18 +86,6 @@ filter_impl <- function(df, dots) {
.Call('dplyr_filter_impl', PACKAGE = 'dplyr', df, dots)
}

grouped_indices_grouped_df_impl <- function(gdf) {
.Call('dplyr_grouped_indices_grouped_df_impl', PACKAGE = 'dplyr', gdf)
}

grouped_indices_impl <- function(data, symbols) {
.Call('dplyr_grouped_indices_impl', PACKAGE = 'dplyr', data, symbols)
}

group_size_grouped_cpp <- function(gdf) {
.Call('dplyr_group_size_grouped_cpp', PACKAGE = 'dplyr', gdf)
}

resolve_vars <- function(new_groups, names) {
.Call('dplyr_resolve_vars', PACKAGE = 'dplyr', new_groups, names)
}
Expand All @@ -114,6 +102,18 @@ ungroup_grouped_df <- function(df) {
.Call('dplyr_ungroup_grouped_df', PACKAGE = 'dplyr', df)
}

grouped_indices_grouped_df_impl <- function(gdf) {
.Call('dplyr_grouped_indices_grouped_df_impl', PACKAGE = 'dplyr', gdf)
}

grouped_indices_impl <- function(data, symbols) {
.Call('dplyr_grouped_indices_impl', PACKAGE = 'dplyr', data, symbols)
}

group_size_grouped_cpp <- function(gdf) {
.Call('dplyr_group_size_grouped_cpp', PACKAGE = 'dplyr', gdf)
}

semi_join_impl <- function(x, y, by_x, by_y) {
.Call('dplyr_semi_join_impl', PACKAGE = 'dplyr', x, y, by_x, by_y)
}
Expand Down
4 changes: 4 additions & 0 deletions R/tibble-reexport.r
Original file line number Diff line number Diff line change
Expand Up @@ -42,6 +42,10 @@ tibble::glimpse
#' @export
tibble::frame_data

#' @importFrom tibble tribble
#' @export
tibble::tribble

#' @importFrom tibble tibble
#' @export
tibble::tibble
Expand Down
4 changes: 3 additions & 1 deletion man/reexports.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

68 changes: 34 additions & 34 deletions src/RcppExports.cpp
Original file line number Diff line number Diff line change
Expand Up @@ -191,40 +191,6 @@ BEGIN_RCPP
return rcpp_result_gen;
END_RCPP
}
// grouped_indices_grouped_df_impl
IntegerVector grouped_indices_grouped_df_impl(GroupedDataFrame gdf);
RcppExport SEXP dplyr_grouped_indices_grouped_df_impl(SEXP gdfSEXP) {
BEGIN_RCPP
Rcpp::RObject rcpp_result_gen;
Rcpp::RNGScope rcpp_rngScope_gen;
Rcpp::traits::input_parameter< GroupedDataFrame >::type gdf(gdfSEXP);
rcpp_result_gen = Rcpp::wrap(grouped_indices_grouped_df_impl(gdf));
return rcpp_result_gen;
END_RCPP
}
// grouped_indices_impl
IntegerVector grouped_indices_impl(DataFrame data, ListOf<Symbol> symbols);
RcppExport SEXP dplyr_grouped_indices_impl(SEXP dataSEXP, SEXP symbolsSEXP) {
BEGIN_RCPP
Rcpp::RObject rcpp_result_gen;
Rcpp::RNGScope rcpp_rngScope_gen;
Rcpp::traits::input_parameter< DataFrame >::type data(dataSEXP);
Rcpp::traits::input_parameter< ListOf<Symbol> >::type symbols(symbolsSEXP);
rcpp_result_gen = Rcpp::wrap(grouped_indices_impl(data, symbols));
return rcpp_result_gen;
END_RCPP
}
// group_size_grouped_cpp
IntegerVector group_size_grouped_cpp(GroupedDataFrame gdf);
RcppExport SEXP dplyr_group_size_grouped_cpp(SEXP gdfSEXP) {
BEGIN_RCPP
Rcpp::RObject rcpp_result_gen;
Rcpp::RNGScope rcpp_rngScope_gen;
Rcpp::traits::input_parameter< GroupedDataFrame >::type gdf(gdfSEXP);
rcpp_result_gen = Rcpp::wrap(group_size_grouped_cpp(gdf));
return rcpp_result_gen;
END_RCPP
}
// resolve_vars
SEXP resolve_vars(List new_groups, CharacterVector names);
RcppExport SEXP dplyr_resolve_vars(SEXP new_groupsSEXP, SEXP namesSEXP) {
Expand Down Expand Up @@ -272,6 +238,40 @@ BEGIN_RCPP
return rcpp_result_gen;
END_RCPP
}
// grouped_indices_grouped_df_impl
IntegerVector grouped_indices_grouped_df_impl(GroupedDataFrame gdf);
RcppExport SEXP dplyr_grouped_indices_grouped_df_impl(SEXP gdfSEXP) {
BEGIN_RCPP
Rcpp::RObject rcpp_result_gen;
Rcpp::RNGScope rcpp_rngScope_gen;
Rcpp::traits::input_parameter< GroupedDataFrame >::type gdf(gdfSEXP);
rcpp_result_gen = Rcpp::wrap(grouped_indices_grouped_df_impl(gdf));
return rcpp_result_gen;
END_RCPP
}
// grouped_indices_impl
IntegerVector grouped_indices_impl(DataFrame data, ListOf<Symbol> symbols);
RcppExport SEXP dplyr_grouped_indices_impl(SEXP dataSEXP, SEXP symbolsSEXP) {
BEGIN_RCPP
Rcpp::RObject rcpp_result_gen;
Rcpp::RNGScope rcpp_rngScope_gen;
Rcpp::traits::input_parameter< DataFrame >::type data(dataSEXP);
Rcpp::traits::input_parameter< ListOf<Symbol> >::type symbols(symbolsSEXP);
rcpp_result_gen = Rcpp::wrap(grouped_indices_impl(data, symbols));
return rcpp_result_gen;
END_RCPP
}
// group_size_grouped_cpp
IntegerVector group_size_grouped_cpp(GroupedDataFrame gdf);
RcppExport SEXP dplyr_group_size_grouped_cpp(SEXP gdfSEXP) {
BEGIN_RCPP
Rcpp::RObject rcpp_result_gen;
Rcpp::RNGScope rcpp_rngScope_gen;
Rcpp::traits::input_parameter< GroupedDataFrame >::type gdf(gdfSEXP);
rcpp_result_gen = Rcpp::wrap(group_size_grouped_cpp(gdf));
return rcpp_result_gen;
END_RCPP
}
// semi_join_impl
DataFrame semi_join_impl(DataFrame x, DataFrame y, CharacterVector by_x, CharacterVector by_y);
RcppExport SEXP dplyr_semi_join_impl(SEXP xSEXP, SEXP ySEXP, SEXP by_xSEXP, SEXP by_ySEXP) {
Expand Down

0 comments on commit 7bb5652

Please sign in to comment.