We read every piece of feedback, and take your input very seriously.
To see all available qualifiers, see our documentation.
There was an error while loading. Please reload this page.
1 parent 55741ca commit f8b37a9Copy full SHA for f8b37a9
NAMESPACE
@@ -16,5 +16,4 @@ importFrom(purrr,partial)
16
importFrom(purrr,pmap)
17
importFrom(purrr,pwalk)
18
importFrom(purrr,reduce)
19
-importFrom(tidyr,separate)
20
importFrom(utils,write.table)
R/nested.R
@@ -41,7 +41,6 @@ compute_parse_data_nested <- function(text) {
41
#' [utils::getParseData()] is used to obtain a flat parse table from `text`.
42
#' @param text A character vector.
43
#' @return A flat parse table
44
-#' @importFrom tidyr separate
45
tokenize <- function(text) {
46
parsed <- parse(text = text, keep.source = TRUE)
47
parse_data <- as_tibble(utils::getParseData(parsed, includeText = NA))
0 commit comments