Skip to content

Commit

Permalink
Fix MAN
Browse files Browse the repository at this point in the history
  • Loading branch information
koheiw committed Jan 9, 2025
1 parent 871aa74 commit 18a47ef
Show file tree
Hide file tree
Showing 5 changed files with 13 additions and 12 deletions.
4 changes: 2 additions & 2 deletions R/textstat.R
Original file line number Diff line number Diff line change
Expand Up @@ -13,12 +13,12 @@
#' considered as collocations.
#' @param remove_pattern if `TRUE`, keywords do not contain target words.
#' @inheritParams quanteda::tokens_ngrams
#' @param ... additional arguments passed to [textstat_keyness()].
#' @param ... additional arguments passed to [quanteda.textstats::textstat_keyness()].
#' @importFrom quanteda.textstats textstat_keyness
#' @importFrom quanteda is.tokens tokens_remove tokens_select tokens_ngrams dfm
#' dfm_trim dfm_match featnames as.dfm dfm_remove
#' @export
#' @seealso [tokens_select()] and [textstat_keyness()]
#' @seealso [quanteda.textstats::textstat_keyness()]
textstat_context <- function(x, pattern, valuetype = c("glob", "regex", "fixed"),
case_insensitive = TRUE, window = 10, min_count = 10,
remove_pattern = TRUE, n = 1, skip = 0, ...) {
Expand Down
9 changes: 5 additions & 4 deletions R/utils.R
Original file line number Diff line number Diff line change
@@ -1,6 +1,6 @@
#' Identify noisy documents in a corpus
#' @param x character or [corpus] object whose texts will be diagnosed.
#' @param ... extra arguments passed to `tokens`.
#' @param x character or [quanteda::corpus()] object whose texts will be diagnosed.
#' @param ... extra arguments passed to [quanteda::tokens()].
#' @keywords internal
#' @export
#' @importFrom quanteda corpus tokens texts
Expand All @@ -17,7 +17,7 @@ diagnosys.character <- function(x, ...) {
#' @importFrom quanteda dictionary ntoken dfm convert dfm_lookup
diagnosys.corpus <- function(x, ...) {

.Deprecated("quanteda.textstats::textstat_summary")
.Deprecated("quanteda.textstats::textstat_summary()")
dict <- dictionary(list(
"number" = "\\p{N}",
"punct" = "\\p{P}",
Expand Down Expand Up @@ -126,8 +126,9 @@ seedwords <- function(type) {
}


#' Smooth predicted polarity scores by local polynomial regression
#' Smooth predicted polarity scores
#'
#' Smooth predicted polarity scores by local polynomial regression.
#' @param x a [data.frame] containing polarity scores and dates.
#' @param lss_var the name of the column in `x` for polarity scores.
#' @param date_var the name of the column in `x` for dates.
Expand Down
4 changes: 2 additions & 2 deletions man/diagnosys.Rd

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

4 changes: 2 additions & 2 deletions man/smooth_lss.Rd

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

4 changes: 2 additions & 2 deletions man/textstat_context.Rd

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

0 comments on commit 18a47ef

Please sign in to comment.