Skip to content

Commit 4f47e25

Browse files
committed
Fix typo
1 parent 8dad103 commit 4f47e25

File tree

2 files changed

+5
-5
lines changed

2 files changed

+5
-5
lines changed

R/parse.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -129,7 +129,7 @@ add_id_and_short <- function(pd) {
129129
#' @keywords internal
130130
ensure_correct_str_txt <- function(pd, text) {
131131
ensure_valid_pd(pd)
132-
is_problematic_string <- identify_insufficiently_parsed_stings(pd, text)
132+
is_problematic_string <- identify_insufficiently_parsed_strings(pd, text)
133133
problematic_strings <- pd[is_problematic_string, ]
134134
is_parent_of_problematic_string <-
135135
pd$id %in% problematic_strings$parent
@@ -205,7 +205,7 @@ ensure_valid_pd <- function(pd) {
205205
#' @param pd A parse table.
206206
#' @param text The initial code to style.
207207
#' @keywords internal
208-
identify_insufficiently_parsed_stings <- function(pd, text) {
208+
identify_insufficiently_parsed_strings <- function(pd, text) {
209209
is_problematic_string <- pd$token == "STR_CONST"
210210
candidate_substring <- substr(
211211
pd$text[is_problematic_string], 1, 1

man/identify_insufficiently_parsed_stings.Rd

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

0 commit comments

Comments
 (0)