Skip to content

Commit

Permalink
Create package Rd file (#1577)
Browse files Browse the repository at this point in the history
  • Loading branch information
IndrajeetPatil authored Sep 30, 2022
1 parent 7e6671e commit 799a643
Show file tree
Hide file tree
Showing 8 changed files with 28 additions and 24 deletions.
1 change: 1 addition & 0 deletions DESCRIPTION
Original file line number Diff line number Diff line change
Expand Up @@ -106,6 +106,7 @@ Collate:
'lint.R'
'linter_tag_docs.R'
'linter_tags.R'
'lintr-package.R'
'literal_coercion_linter.R'
'make_linter_from_regex.R'
'methods.R'
Expand Down
8 changes: 0 additions & 8 deletions R/aaa.R
Original file line number Diff line number Diff line change
@@ -1,12 +1,4 @@
#' @import rex
#' @importFrom utils tail
#' @include utils.R
#' @rawNamespace
#' if (getRversion() >= "4.0.0") {
#' importFrom(tools, R_user_dir)
#' } else {
#' importFrom(backports, R_user_dir)
#' }
NULL

#' Available linters
Expand Down
1 change: 0 additions & 1 deletion R/commas_linter.R
Original file line number Diff line number Diff line change
Expand Up @@ -6,7 +6,6 @@
#' @seealso
#' [linters] for a complete list of linters available in lintr. \cr
#' <https://style.tidyverse.org/syntax.html#commas>
#' @importFrom utils head
#' @export
commas_linter <- function() {
# conditions are in carefully-chosen order for performance --
Expand Down
1 change: 0 additions & 1 deletion R/cyclocomp_linter.R
Original file line number Diff line number Diff line change
Expand Up @@ -6,7 +6,6 @@
#' than this are linted. See [cyclocomp::cyclocomp()].
#' @evalRd rd_tags("cyclocomp_linter")
#' @seealso [linters] for a complete list of linters available in lintr.
#' @importFrom cyclocomp cyclocomp
#' @export
cyclocomp_linter <- function(complexity_limit = 15L) {
Linter(function(source_expression) {
Expand Down
10 changes: 0 additions & 10 deletions R/lint.R
Original file line number Diff line number Diff line change
@@ -1,13 +1,3 @@
#' Lintr
#'
#' Checks adherence to a given style, syntax errors and possible semantic issues.
#' Supports on the fly checking of R code edited with Emacs, Vim and Sublime Text.
#' @seealso [lint()], [lint_package()], [lint_dir()], [linters]
#' @importFrom stats na.omit
#' @importFrom utils capture.output getParseData relist
#' @keywords internal
"_PACKAGE"

#' Lint a file, directory, or package
#'
#' * `lint()` lints a single file.
Expand Down
24 changes: 24 additions & 0 deletions R/lintr-package.R
Original file line number Diff line number Diff line change
@@ -0,0 +1,24 @@
#' Lintr
#'
#' Checks adherence to a given style, syntax errors, and possible semantic issues.
#' Supports on the fly checking of R code edited with Emacs, Vim, and Sublime Text.
#'
#' @seealso [lint()], [lint_package()], [lint_dir()], [linters]
#' @keywords internal
"_PACKAGE"

## lintr namespace: start
#' @import rex
#' @importFrom stats na.omit
#' @importFrom utils capture.output head getParseData relist
#' @importFrom xml2 xml_find_all as_list
#' @importFrom cyclocomp cyclocomp
#' @importFrom utils tail
#' @rawNamespace
#' if (getRversion() >= "4.0.0") {
#' importFrom(tools, R_user_dir)
#' } else {
#' importFrom(backports, R_user_dir)
#' }
## lintr namespace: end
NULL
1 change: 0 additions & 1 deletion R/pipe_continuation_linter.R
Original file line number Diff line number Diff line change
Expand Up @@ -6,7 +6,6 @@
#' @seealso
#' [linters] for a complete list of linters available in lintr. \cr
#' <https://style.tidyverse.org/pipes.html#long-lines-2>
#' @importFrom xml2 xml_find_all as_list
#' @export
pipe_continuation_linter <- function() {
# For pipelines, either the whole expression should fit on a single line, or,
Expand Down
6 changes: 3 additions & 3 deletions man/lintr-package.Rd

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

0 comments on commit 799a643

Please sign in to comment.