Skip to content

Commit

Permalink
export
Browse files Browse the repository at this point in the history
  • Loading branch information
krlmlr committed Jan 27, 2017
1 parent db49cec commit f3d7fb8
Show file tree
Hide file tree
Showing 4 changed files with 32 additions and 30 deletions.
1 change: 1 addition & 0 deletions NAMESPACE
Original file line number Diff line number Diff line change
Expand Up @@ -385,6 +385,7 @@ export(group_by_prepare)
export(group_indices)
export(group_indices_)
export(group_size)
export(group_vars)
export(grouped_df)
export(groups)
export(has_lahman)
Expand Down
16 changes: 8 additions & 8 deletions R/RcppExports.R
Original file line number Diff line number Diff line change
Expand Up @@ -86,14 +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)
}

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 @@ -110,6 +102,14 @@ 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)
}

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
1 change: 1 addition & 0 deletions R/group-by.r
Original file line number Diff line number Diff line change
Expand Up @@ -121,6 +121,7 @@ groups <- function(x) {
#' @rdname group_by
#' @description \code{group_vars()} returns the current grouping
#' as a character vector.
#' @export
group_vars <- function(x) {
UseMethod("group_vars")
}
Expand Down
44 changes: 22 additions & 22 deletions src/RcppExports.cpp
Original file line number Diff line number Diff line change
Expand Up @@ -191,28 +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
}
// 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 @@ -260,6 +238,28 @@ 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
}
// 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 f3d7fb8

Please sign in to comment.