Skip to content

Commit 790bbcc

Browse files
fix windevel warnings
1 parent afdf5d2 commit 790bbcc

File tree

4 files changed

+9
-4
lines changed

4 files changed

+9
-4
lines changed

R/parse.R

Lines changed: 0 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -182,7 +182,6 @@ ensure_correct_txt <- function(pd, text) {
182182
#' changes from "all strings" to "all problematic strings", is partly
183183
#' misleading and this approach was chosen for performance reasons only.
184184
#' @param pd A parse table.
185-
#' @param text The initial code to style.
186185
#' @keywords internal
187186
is_insufficiently_parsed_string <- function(pd) {
188187
grepl("^\\[", pd$text) & pd$token == "STR_CONST"

R/rules-line-breaks.R

Lines changed: 3 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -282,7 +282,9 @@ set_line_break_after_assignment <- function(pd) {
282282
NULL
283283

284284
#' Sets line break after opening parenthesis
285-
#'
285+
#' @param pd The parse table.
286+
#' @param except_token_after,except_token_before The tokens before or after the
287+
#' token that cause an exception.
286288
#' @details
287289
#' In general, every call that is multi-line has a line break after the opening
288290
#' parenthesis. Exceptions:

man/is_insufficiently_parsed_string.Rd

Lines changed: 0 additions & 2 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/set_line_break_after_opening_if_call_is_multi_line.Rd

Lines changed: 6 additions & 0 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)