Skip to content

Commit

Permalink
clean up Imports
Browse files Browse the repository at this point in the history
  • Loading branch information
kylebaron committed Jul 20, 2020
1 parent 0e9d2b4 commit af204f9
Show file tree
Hide file tree
Showing 2 changed files with 9 additions and 19 deletions.
7 changes: 1 addition & 6 deletions NAMESPACE
Original file line number Diff line number Diff line change
Expand Up @@ -215,12 +215,9 @@ exportMethods(zero.re)
import(methods)
importFrom(Rcpp,evalCpp)
importFrom(dplyr,arrange)
importFrom(dplyr,as_data_frame)
importFrom(dplyr,bind_rows)
importFrom(dplyr,data_frame)
importFrom(dplyr,distinct)
importFrom(dplyr,do)
importFrom(dplyr,everything)
importFrom(dplyr,filter)
importFrom(dplyr,first)
importFrom(dplyr,group_by)
Expand All @@ -235,8 +232,6 @@ importFrom(dplyr,n)
importFrom(dplyr,pull)
importFrom(dplyr,rename)
importFrom(dplyr,select)
importFrom(dplyr,select_vars)
importFrom(dplyr,select_vars_)
importFrom(dplyr,slice)
importFrom(dplyr,summarise)
importFrom(dplyr,summarise_at)
Expand All @@ -245,7 +240,6 @@ importFrom(dplyr,ungroup)
importFrom(glue,glue)
importFrom(lifecycle,deprecate_soft)
importFrom(magrittr,"%>%")
importFrom(magrittr,"%T>%")
importFrom(rlang,"!!!")
importFrom(rlang,"!!")
importFrom(rlang,as_label)
Expand All @@ -260,6 +254,7 @@ importFrom(stats,rnorm)
importFrom(stats,setNames)
importFrom(tibble,as_tibble)
importFrom(tibble,tibble)
importFrom(tidyselect,everything)
importFrom(tidyselect,vars_select)
importFrom(utils,.DollarNames)
importFrom(utils,assignInMyNamespace)
Expand Down
21 changes: 8 additions & 13 deletions R/Aaaa.R
Original file line number Diff line number Diff line change
Expand Up @@ -17,26 +17,21 @@

#' @import methods
#'
#' @importFrom utils capture.output example str type.convert
#' @importFrom utils capture.output example str type.convert .DollarNames
#' @importFrom utils packageVersion assignInMyNamespace read.table
#' @importFrom utils .DollarNames
#' @importFrom stats as.formula setNames rnorm
#' @importFrom dplyr filter
#' @importFrom dplyr mutate slice pull
#' @importFrom dplyr filter mutate mutate_at mutate_all distinct first
#' @importFrom dplyr bind_rows arrange summarise summarise_at
#' @importFrom dplyr intersect select rename slice distinct do
#' @importFrom dplyr distinct first select_vars_
#' @importFrom dplyr select_vars everything
#' @importFrom dplyr if_else mutate_at summarise_each is.tbl select
#' @importFrom dplyr mutate_all group_by ungroup n
#' @importFrom dplyr data_frame as_data_frame left_join
#' @importFrom tidyselect vars_select
#' @importFrom magrittr %>% %T>%
#' @importFrom Rcpp evalCpp
#' @importFrom dplyr intersect select rename do slice pull
#' @importFrom dplyr if_else summarise_each is.tbl select
#' @importFrom dplyr group_by ungroup n left_join
#' @importFrom tidyselect vars_select everything
#' @importFrom magrittr %>%
#' @importFrom tibble tibble as_tibble
#' @importFrom rlang quos enquo enquos quo_name syms !!! !! eval_tidy as_label
#' @importFrom lifecycle deprecate_soft
#' @importFrom glue glue
#' @importFrom Rcpp evalCpp
# @importFrom RcppArmadillo armadillo_version

#' @include Aaaa.R
Expand Down

0 comments on commit af204f9

Please sign in to comment.