如何从tm存储术语文档矩阵的稀疏性和最大术语长度 [英] How to store Sparsity and Maximum term length of a Term document matrix from tm

查看:135
本文介绍了如何从tm存储术语文档矩阵的稀疏性和最大术语长度的处理方法,对大家解决问题具有一定的参考价值,需要的朋友们下面随着小编来一起学习吧!

问题描述

查找ngram时如何在R的单独变量中存储术语文档矩阵的稀疏性和最大术语长度?

how to store the sparsity and maximum term length of Term Document Matrix in separate variable in R while finding ngrams ?

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)

如何在单独的变量中存储上述稀疏性,最大期限长度,权重,非稀疏项.

how to store the above Sparsity, Maximal term length, Weighting, Non-/sparse entries in separate variables.

推荐答案

这将返回您需要的统计信息.您的问题未指定所需的格式,因此在这里我使用了一个命名列表. (这很容易作为data.frame返回.)

This will return the stats you need. Your question did not specify what format you desired, so here I have used a named list. (This could easily be returned as a data.frame.)

我从tm包源代码Matrix.R中获取了此文件,其中定义了TermDocumentMatrix对象的打印方法.

I took this from the tm package source code, file Matrix.R, where the print method for TermDocumentMatrix objects is defined.

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

这篇关于如何从tm存储术语文档矩阵的稀疏性和最大术语长度的文章就介绍到这了,希望我们推荐的答案对大家有所帮助,也希望大家多多支持IT屋!

查看全文
登录 关闭
扫码关注1秒登录
发送“验证码”获取 | 15天全站免登陆