tests/testthat/test-as.dictionary.R

test_that("as.dictionary works for data.frame", {
    df <- data.frame(
        word = letters[1:6],
        sentiment = c("neg", "neg", "neutral", "neutral", "pos", "pos"),
        lexicon = rep("madeup", 6),
        stringsAsFactors = FALSE
    )
    expect_equal(
        dictionary(list(neg = c("a", "b"), 
                        neutral = c("c", "d"), 
                        pos = c("e", "f"))),
        as.dictionary(df, format = "tidytext")
    )
    df <- data.frame(
        word = letters[1:6],
        sentiment = c("neg", "neg", "neutral", "neutral", "pos", "pos"),
        lexicon = rep("madeup", 6),
        stringsAsFactors = TRUE
    )
    expect_equal(
        dictionary(list(neg = c("a", "b"), 
                        neutral = c("c", "d"), pos = c("e", "f"))),
        as.dictionary(df, format = "tidytext")
    )
})

test_that("as.dictionary warnings and errors", {
    df <- data.frame(
        word = letters[1:6],
        sentiment2 = c("neg", "neg", "neutral", "neutral", "pos", "pos"),
        lexicon = rep("madeup", 6)
    )
    expect_error(
        as.dictionary(df, format = "tidytext"),
        "data\\.frame must contain word and sentiment columns"
    )
    df <- data.frame(
        word = letters[1:6],
        sentiment = c("neg", "neg", "neutral", "neutral", "pos", "pos"),
        lexicon = c(rep("madeup", 3), rep("other", 3))
    )
    expect_warning(
        as.dictionary(df, format = "tidytext"),
        "you may be mixing different dictionaries"
    )
    df <- data.frame(
        word = letters[1:6],
        sentiment = NA,
        lexicon = "madeup"
    )
    expect_error(
        as.dictionary(df, format = "tidytext"),
        "sentiment values are missing"
    )
})


test_that("as.dictionary function works for tidytext sentiment", {
    skip_if_not_installed("tidytext")
    data(sentiments, package = "tidytext")
    expect_true(
        is.dictionary(as.dictionary(sentiments))
    )
})


test_that("as.dictionary function passes additional arguments to dictionary", {
    df <- data.frame(
        word = c("A", "B"),
        sentiment = c("pos", "neg")
    )
    
    dict <- as.dictionary(df, tolower = FALSE)
    
    expect_equal(
        dict[["pos"]], "A"
    )
})

test_that("options for tidytext only currently supported", {
    df <- data.frame(
        word = c("A", "B"),
        sentiment = c("pos", "neg")
    )
    expect_error(
        as.dictionary(df, format = "koRpus"),
        "'arg' should be (one of )*[“\"]tidytext[”\"]"
    )
})

Try the quanteda package in your browser

Any scripts or data that you put into this service are public.

quanteda documentation built on May 31, 2023, 8:28 p.m.