如何在查找ngrams时将Term Document Matrix的稀疏度和最大术语长度存储在R中的单独变量中?
library(tm)
library(RWeka)
#stdout <- vector('character')
#con <- textConnection('stdout','wr',local = TRUE)
#reading the csv file
worklog <- read.csv("To_Kamal_WorkLogs.csv");
#removing the unwanted columns
cols <- c("A","B","C","D","E","F");
colnames(worklog)<-cols;
worklog2 <- worklog[c("F")]
#removing non-ASCII characters
z=iconv(worklog2, "latin1", "ASCII", sub="")
#cleaning the data Removing Date and Time
worklog2$F=gsub("[0-9]+/[0-9]+/[0-9]+ [0-9]+:[0-9]+:[0-9]+ [A,P][M]","",worklog2$F);
#loading the vector Data to corpus
a <- Corpus(VectorSource(worklog2$F))
#cleaning the data
a <- tm_map(a,removeNumbers)
a <- tm_map(a,removePunctuation)
a <- tm_map(a,stripWhitespace)
a <- tm_map(a,tolower)
a <- tm_map(a, PlainTextDocument)
a <- tm_map(a,removeWords,stopwords("english"))
a <- tm_map(a,stemDocument,language = "english")
#removing custom stopwords
stopwords="open";
if(!is.null(stopwords)) a <- tm_map(a, removeWords, words=as.character(stopwords))
#finding 2,3,4 grams
bigramTokenizer <- function(x) NGramTokenizer(x, Weka_control(min = 2, max = 2))
tdm2 <- TermDocumentMatrix(a, control = list(tokenize = bigramTokenizer))
tdm2 <- removeSparseTerms(tdm2, 0.75)
#output
> tdm2
<<TermDocumentMatrix (terms: 27, documents: 8747)>>
Non-/sparse entries: 87804/148365
Sparsity : 63%
Maximal term length: 20
Weighting : term frequency (tf)
如何在单独的变量中存储上述稀疏度,最大术语长度,加权,非/稀疏条目。
答案 0 :(得分:0)
这将返回您需要的统计数据。你的问题没有说明你想要的格式,所以在这里我使用了一个命名列表。 (这可以很容易地作为data.frame返回。)
我从tm包源代码文件Matrix.R中获取了这个,其中定义了TermDocumentMatrix对象的print方法。
getTDMstats <- function(x) {
# where x is a TermDocumentMatrix
list(sparsity = ifelse(!prod(dim(x)), 100, round((1 - length(x$v)/prod(dim(x))) * 100)) / 100,
maxtermlength = max(nchar(Terms(x), type = "chars"), 0),
weightingLong = attr(x, "weighting")[1],
weightingShort = attr(x, "weighting")[2],
nonsparse = length(x$v),
sparse = prod(dim(x)) - length(x$v))
}
data(crude)
tdm2 <- TermDocumentMatrix(crude)
tdm2
## <<TermDocumentMatrix (terms: 1266, documents: 20)>>
## Non-/sparse entries: 2255/23065
## Sparsity : 91%
## Maximal term length: 17
## Weighting : term frequency (tf)
getTDMstats(tdm2)
## $sparsity
## [1] 0.91
##
## $maxtermlength
## [1] 17
##
## $weightingLong
## [1] "term frequency"
##
## $weightingShort
## [1] "tf"
##
## $nonsparse
## [1] 2255
##
## $sparse
## [1] 23065