The following code chunks and examples show the functionality of the textTinyR package. The textTinyR package consists of the following classes (based on the R6 package) and functions:
big_tokenize_transform | sparse_term_matrix | token_stats |
---|---|---|
big_text_splitter() | Term_Matrix() | path_2vector() |
big_text_parser() | Term_Matrix_Adjust() | freq_distribution() |
big_text_tokenizer() | term_associations() | print_frequency() |
vocabulary_accumulator() | most_frequent_terms() | count_character() |
print_count_character() | ||
collocation_words() | ||
print_collocations() | ||
string_dissimilarity_matrix() | ||
look_up_table() | ||
print_words_lookup_tbl() |
sparse_matrices | tokenization | utilities |
---|---|---|
dense_2sparse() | tokenize_transform_text() | bytes_converter() |
load_sparse_binary() | tokenize_transform_vec_docs() | cosine_distance() |
matrix_sparsity() | dice_distance() | |
save_sparse_binary() | levenshtein_distance() | |
sparse_Means() | read_characters() | |
sparse_Sums() | read_rows() | |
text_file_parser() | ||
utf_locale() | ||
vocabulary_parser() |
The big_tokenize_transform class can be utilized to process big data files and I’ll illustrate this using the english wikipedia pages and articles. The size of the file (after downloading and extracting locally) is aproximalely 59.4 GB and it’s of type .xml (to reproduce the results one needs to have free hard drive space of approx. 200 GB).
Xml files have a tree structure and one should use queries to acquire specific information. First, I’ll observe the structure of the .xml file by using the utility function read_rows(). The read_rows() function takes a file as input and by specifying the rows argument it returns a subset of the file. It doesn’t load the entire file in memory, but it just opens the file and reads the specific number of rows,
library(textTinyR)
= 'enwiki-latest-pages-articles.xml'
PATH
= read_rows(input_file = PATH, read_delimiter = "\n",
subset
rows = 100,
write_2file = "/subs_output.txt")
# data subset : subs_output.txt
<mediawiki xmlns="http://www.mediawiki.org/xml/export-0.10/" xmlns:xsi="http://www.w3.org/2001/XMLSchema-instance" xsi:schemaLocation="http://www.mediawiki.org/xml/export-0.10/ http://www.mediawiki.org/xml/export-0.10.xsd" version="0.10" xml:lang="en">
<siteinfo>
<sitename>Wikipedia</sitename>
<dbname>enwiki</dbname>
<base>https://en.wikipedia.org/wiki/Main_Page</base>
<generator>MediaWiki 1.28.0-wmf.23</generator>
<case>first-letter</case>
<namespaces>
<namespace key="-2" case="first-letter">Media</namespace>
<namespace key="-1" case="first-letter">Special</namespace>
<namespace key="0" case="first-letter" />
<namespace key="1" case="first-letter">Talk</namespace>
<namespace key="2" case="first-letter">User</namespace>
<namespace key="3" case="first-letter">User talk</namespace>
<namespace key="4" case="first-letter">Wikipedia</namespace>
<namespace key="5" case="first-letter">Wikipedia talk</namespace>
<namespace key="6" case="first-letter">File</namespace>
<namespace key="7" case="first-letter">File talk</namespace>
<namespace key="8" case="first-letter">MediaWiki</namespace>
.
.
.</namespaces>
</siteinfo>
<page>
<title>AccessibleComputing</title>
<ns>0</ns>
<id>10</id>
<redirect title="Computer accessibility" />
<revision>
<id>631144794</id>
<parentid>381202555</parentid>
<timestamp>2014-10-26T04:50:23Z</timestamp>
<contributor>
<username>Paine Ellsworth</username>
<id>9092818</id>
</contributor>
<comment>add [[WP:RCAT|rcat]]s</comment>
<model>wikitext</model>
<format>text/x-wiki</format>
<text xml:space="preserve">#REDIRECT [[Computer accessibility]]
|move|from CamelCase|up}}</text>
{{Redr<sha1>4ro7vvppa5kmm0o1egfjztzcwd0vabw</sha1>
</revision>
</page>
<page>
<title>Anarchism</title>
<ns>0</ns>
<id>12</id>
<revision>
<id>746687538</id>
<parentid>744318951</parentid>
<timestamp>2016-10-28T22:43:19Z</timestamp>
<contributor>
<username>Eduen</username>
<id>7527773</id>
</contributor>
<minor />
<comment>/* Free love */</comment>
<model>wikitext</model>
<format>text/x-wiki</format>
<text xml:space="preserve">{{Redirect2|Anarchist|Anarchists|the fictional character|Anarchist (comics)|other uses|Anarchists (disambiguation)}}
-move-indef}}
{{pp
.
. .
In that way one has a picture of the .xml tree structure and can continue by performing queries. The initial data file is too big to fit in the memory of a PC, thus it has to be split in smaller files, pre-processed and then returned as a single file. The main aim of the big_text_splitter() method is to split the data in smaller files of (approx.) equal size by either using the batches parameter or if the file has a structure by adding the end_query parameter too. Here I’ll take advantage of both the batches and the end_query parameters for this task, because I’ll use queries to extract the text tree-elements, so I don’t want that the file is split arbitrarily. Each sub-element in the file begins and ends with the same key-word, i.e. text,
= big_tokenize_transform$new(verbose = TRUE)
btt
$big_text_splitter(input_path_file = PATH, # path to the enwiki data file
btt
output_path_folder = "/enwiki_spl_data/", # folder to save the files
end_query = '</text>', # splits the file taking into account the key-word
batches = 40, # split file in 40 batches (files)
trimmed_line = FALSE) # the lines will be trimmed
10 % of data pre-processed
approx. 20 % of data pre-processed
approx. 30 % of data pre-processed
approx. 40 % of data pre-processed
approx. 50 % of data pre-processed
approx. 60 % of data pre-processed
approx. 70 % of data pre-processed
approx. 80 % of data pre-processed
approx. 90 % of data pre-processed
approx. 100 % of data pre-processed
approx.
42.7098 minutes to complete the splitting It took
After the data is split and saved in the output_path_folder (“/ewiki_spl_data/”) the next step is to extract the text tree-elements from the batches by using the big_text_parser() method. The latter takes as arguments the previously created input_path_folder, an output_path_folder to save the resulted text files, a start_query, an end_query, the min_lines (only subsets of text with more than or equal to this minimum will be kept) and the trimmed_line ( specifying if each line is already trimmed both-sides ),
$big_text_parser(input_path_folder = "/enwiki_spl_data/", # the previously created folder
btt
output_path_folder = "/enwiki_parse/", # folder to save the parsed files
start_query = "<text xml:space=\"preserve\">", # starts to extract text
end_query = "</text>", # stop to extract once here
min_lines = 1,
trimmed_line = TRUE)
====================
1 begins ...
batch ====================
10 % of data pre-processed
approx. 20 % of data pre-processed
approx. 30 % of data pre-processed
approx. 40 % of data pre-processed
approx. 50 % of data pre-processed
approx. 60 % of data pre-processed
approx. 70 % of data pre-processed
approx. 80 % of data pre-processed
approx. 90 % of data pre-processed
approx. 100 % of data pre-processed
approx.
0.296151 minutes to complete the preprocessing
It took
0.0525948 minutes to save the pre-processed data
It took
.
.
.
.
====================
40 begins ...
batch ====================
10 % of data pre-processed
approx. 20 % of data pre-processed
approx. 30 % of data pre-processed
approx. 40 % of data pre-processed
approx. 50 % of data pre-processed
approx. 60 % of data pre-processed
approx. 70 % of data pre-processed
approx. 80 % of data pre-processed
approx. 90 % of data pre-processed
approx. 100 % of data pre-processed
approx.
1.04127 minutes to complete the preprocessing
It took
0.0448579 minutes to save the pre-processed data
It took
40.9034 minutes to complete the parsing It took
Here, it’s worth mentioning that the big_text_parser is more efficient if it extracts big chunks of text, rather than one-liners. In case of one-line text queries it has to check line by line the whole file, which is inefficient especially for files equal to the enwiki size.
By extracting the text chunks from the data the .xml file size reduces to (approx.) 48.9 GB. One can now continue utilizing the big_text_tokenizer() method in order to tokenize and transform the data. This method takes the following parameters:
batches (each file can be further split in batches during tokenization), to_lower (convert to lower case), to_upper (convert to upper case), utf_locale (change utf locale depending on the language), remove_char (remove specific characters from the text), remove_punctuation_string (remove punctuation before the data is split), remove_punctuation_vector (remove punctuation after the data is split), remove_numbers (remove numbers from the data), trim_token (trim the tokens both-sides), split_string (split the string), split_separator (token split seprator where multiple delimiters can be used), remove_stopwords (remove stopwords using one of the available languages or by providing a user defined vector of words), language (the language of use), min_num_char (the minimum number of characters to keep), max_num_char (the maximum number of characters to keep), stemmer (stemming of the words using either the porter_2steemer or n-gram stemming – those two methods will be explained in the tokenization function), min_n_gram (minimum n-grams), max_n_gram (maximum n-grams), skip_n_gram (skip n-gram), skip_distance (skip distance for n-grams), n_gram_delimiter (n-gram delimiter), concat_delimiter (concatenation of the data in case that one wants to save the file), path_2folder (specified folder to save the data), stemmer_ngram (in case of n-gram stemming the n-grams), stemmer_gamma (in case of n-gram stemming the gamma parameter), stemmer_truncate (in case of n-gram stemming the truncation parameter), stemmer_batches (in case of n-gram stemming the batches parameter ), threads (the number of cores to use in parallel ), save_2single_file (should the output data be saved in a single file), increment_batch_nr (the enumeration of the output files will start from this number), vocabulary_path_file (should a vocabulary be saved in a separate file).
More information about those parameters can be found in the package documentation.
In this vignette I’ll continue using the following transformations:
Each initial file will be split in additional batches to limit the memory usage during the tokenization and transformation phase,
$big_text_tokenizer(input_path_folder = "/enwiki_parse/", # the previously parsed data
btt
batches = 4, # each single file will be split further in 4 batches
to_lower = TRUE, trim_token = TRUE,
split_string=TRUE, max_num_char = 100,
split_separator = " \r\n\t.,;:()?!//",
remove_punctuation_vector = TRUE,
remove_numbers = TRUE,
remove_stopwords = TRUE,
threads = 4,
save_2single_file = TRUE, # save to a single file
vocabulary_path_folder = "/enwiki_vocab/", # path to vocabulary folder
path_2folder="/enwiki_token/") # folder to save the transformed data
====================================
1 starts ...
transformation of file ====================================
-------------------
1 begins ...
batch -------------------
input of the data starts ...
conversion to lower case starts ...
removal of numeric values starts ...-trim starts ...
the stringin the vector starts ...
the split of the character string and simultaneously the removal of the punctuation
stop words of the english language will be used-words starts ...
the removal of stop1 and less than 100 characters will be kept ...
character strings with more than or equal to in: /enwiki_vocab/batch1.txt
the vocabulary counts will be saved -processed data will be saved in a single file in: /enwiki_token/
the pre
-------------------
2 begins ...
batch -------------------
input of the data starts ...
conversion to lower case starts ...
removal of numeric values starts ...-trim starts ...
the stringin the vector starts ...
the split of the character string and simultaneously the removal of the punctuation
stop words of the english language will be used-words starts ...
the removal of stop1 and less than 100 characters will be kept ...
character strings with more than or equal to in: /enwiki_vocab/batch1.txt
the vocabulary counts will be saved -processed data will be saved in a single file in: /enwiki_token/
the pre
.
.
.
.
====================================
40 starts ...
transformation of file ====================================
-------------------
1 begins ...
batch -------------------
input of the data starts ...
conversion to lower case starts ...
removal of numeric values starts ...-trim starts ...
the stringin the vector starts ...
the split of the character string and simultaneously the removal of the punctuation
stop words of the english language will be used-words starts ...
the removal of stop1 and less than 100 characters will be kept ...
character strings with more than or equal to in: /enwiki_vocab/batch40.txt
the vocabulary counts will be saved -processed data will be saved in a single file in: /enwiki_token/
the pre
-------------------
2 begins ...
batch -------------------
input of the data starts ...
conversion to lower case starts ...
removal of numeric values starts ...-trim starts ...
the stringin the vector starts ...
the split of the character string and simultaneously the removal of the punctuation
stop words of the english language will be used-words starts ...
the removal of stop1 and less than 100 characters will be kept ...
character strings with more than or equal to in: /enwiki_vocab/batch40.txt
the vocabulary counts will be saved -processed data will be saved in a single file in: /enwiki_token/
the pre
.
.
.
.
111.689 minutes to complete tokenization It took
In total, it took approx. 195 minutes (or 3.25 hours) to pre-process (including tokenization, transformation and vocabulary extraction) the 59.4 GB of the enwiki data.
Having a clean single text file of all the wikipedia pages and articles one can perform many tasks. For instance, one can build a wordcloud (using the wordcloud package) from the accumulated words (a word of caution : the memory consumption when running the vocabulary_accumulator method for this kind of data size can exceed the 10 GB),
$vocabulary_accumulator(input_path_folder = "/enwiki_vocab/",
init
vocabulary_path_file = "/VOCAB.txt",
max_num_chars = 50)
40 will.be.merged ... minutes.to.merge.sort.batches: 4.57273
vocabulary.of.batch
: 0.48584 minutes.to.save.data
The following table shows the first rows of the vocabulary counts,
terms | frequency |
---|---|
lt | 111408435 |
refgt | 49197149 |
quot | 48688082 |
gt | 47466149 |
user | 32042007 |
category | 30619748 |
www | 25358252 |
http | 23008243 |
before plotting the wordcloud, I’ll limit the vocabulary to the first 200 words,
= textTinyR::read_rows(input_file = "/VOCAB.txt", read_delimiter = "\n",
rdr_vocab
rows = 200,
write_2file = "/vocab_subset_200terms.txt")
# read the reduced data
<- readr::read_delim("/vocab_subset_200terms.txt", "\t",
vocab_sbs
escape_double = FALSE, col_names = FALSE,
trim_ws = TRUE)
# create the wordcloud
<- RColorBrewer::brewer.pal(8, "Dark2")
pal2
::wordcloud(words = vocab_sbs$X1, freq = vocab_sbs$X2,
wordcloud
scale = c(4.5, 0.8), random.order = FALSE,
rot.per = .15, colors = pal2)
UPDATE 11-04-2019: There is an updated version of the fastText R package which includes all the features of the ported fasttext library. Therefore the old fastTextR repository is archived. See also the corresponding blog-post.
I’m currently also interested in word vectors and that’s why I also made R-wrappers for the GloVe and the fastText word representation algorithms. The latter two reside in my Github account as separate repositories (GloveR and fastTextR) and can be installed using the install_github function of the devtools package (devtools::install_github(‘mlampros/GloveR’), devtools::install_github(‘mlampros/fastTextR’)).
“A word representation is a mathematical object associated with each word, often a vector. Each dimension’s value corresponds to a feature and might even have a semantic or grammatical interpretation, so we call it a word feature. Conventionally, supervised lexicalized NLP approaches take a word and convert it to a symbolic ID, which is then transformed into a feature vector using a one-hot representation: The feature vector has the same length as the size of the vocabulary, and only one dimension is on.”
Currently, there are many resources on the web on how to use pre-trained word vectors (embeddings) as input to neural networks.
In this vignette I’ll use only the fastTextR word representation algorithm, however detailed documentation and system requirements on how to use either the GloveR or the fastTextR can be found in the corresponding repository. If I would train the whole data file (32.2 GB) using the fastTextR wrapper, it would take (approx.) 15 hours,
library(fastTextR)
= skipgram_cbow(input_path = "/output_token_single_file.txt", thread = 4, dim = 50,
skp
output_path = "/model", method = "skipgram", verbose = 2)
Read 4018M words: 12827221
Number of words: 0
Number of labels: 0.2% words/sec/thread: 89664 lr: 0.099841 loss: 1.055581 eta: 15h32m 14m Progress
thus, just for illustration purposes I’ll limit the train data to approx. 1 GB of the output file,
= read_characters(input_file = "/output_token_single_file.txt",
reduced_data
characters = 1000000000, # approx. 1 GB of the data
write_2file = "/reduced_single_file.txt")
= skipgram_cbow(input_path = "/reduced_single_file.txt", # reduced data set
skp
output_path = "/model", # saves model and word vectors
dim = 50, # 50-dimensional word vectors
method = "skipgram", # method = 'skipgram'
thread = 4, verbose = 2)
Read 124M words: 5029370
Number of words: 0
Number of labels: 100.0% words/sec/thread: 94027 lr: 0.000000 loss: 0.186674 eta: 0h0m
Progress
: 33.53577 mins time to complete
the following vector-subset is the example output of the “model.vec” file, which includes the 50-dimensional word vectors,
0.12207 0.16117 0.4641 0.73876 0.43968 0.63911 -0.53747 0.1398 .....
lt -0.0038898 -0.13976 0.26077 0.7775 0.2228 0.28169 -0.48306 .....
refgt 0.7295 -0.12472 0.32131 0.46965 0.45363 0.85022 -0.051471 .....
quot 0.41287 0.26584 0.6612 0.78185 0.46692 0.74092 -0.23816 .....
gt 0.037943 0.095684 0.62832 0.93794 0.19776 0.44592 -0.21641 .....
cite -0.31855 0.42268 0.3875 1.5457 -0.23804 0.34022 -0.051849 .....
www 0.45236 -0.21766 0.6341 0.76392 0.53734 0.66976 -0.23162 .....
ref -0.42692 0.48637 0.28622 1.7019 -0.25739 0.25948 -0.026582 .....
http 0.56828 -0.30782 0.45707 0.78346 0.53727 0.62445 .....
namequot - -0.010281 0.25528 0.04708 0.49679 0.043934 0.33733 -0.42706 .....
0.06308 0.11968 0.11885 0.67699 -0.11448 0.25183 -0.48789 .....
amp -1.5705 -0.40638 0.61064 2.5691 -0.52987 0.68096 .....
category -0.85743 0.071625 -0.43393 0.17157 -0.32874 1.771 .....
county -0.26974 0.76983 0.57599 1.5939 -0.1706 0.21937 -0.44645 .....
org -0.40973 -0.48528 0.092905 0.011603 -0.035727 0.52807 .....
states -0.25079 -0.49813 0.070942 0.16762 0.069961 0.56868 .....
united -0.066578 0.14837 0.23088 1.2919 -0.252 0.31441 -0.3799 .....
web -0.29033 -0.73695 0.35474 -0.5237 -0.15206 1.7089 .....
census
.
. .
The sparse_term_matrix class includes methods for building a document-term or a term-document matrix and extracting information from those matrices (it relies on RcppArmadillo and can handle large sparse matrices too). I’ll explain all the different methods using a toy text file downloaded from wikipedia,
in the Solar System can be seen with the naked eye. These were regarded by many early cultures as divine, or as emissaries of deities. As scientific knowledge advanced, human perception of the planets changed, incorporating a number of disparate objects. In 2006, the International Astronomical Union (IAU) officially adopted a resolution defining planets within the Solar System. This definition is controversial because it excludes many objects of planetary mass based on where or what they orbit.
The term planet is ancient, with ties to history, astrology, science, mythology, and religion. Several planets 1950 remain planets under the modern definition, some celestial bodies, such as Ceres, Pallas, Juno and Vesta (each an object in the solar asteroid belt), and Pluto (the first trans-Neptunian object discovered), that were once considered planets by the scientific community, are no longer viewed as such.
Although eight of the planetary bodies discovered before in deferent and epicycle motions. Although the idea that the planets orbited the Sun had been suggested many times, it was not until the 17th century that this view was supported by evidence from the first telescopic astronomical observations, performed by Galileo Galilei.
The planets were thought by Ptolemy to orbit Earth -telescopic observation data collected by Tycho Brahe, Johannes Kepler found the planets orbits were not circular but elliptical. As observational tools improved, astronomers saw that, like Earth, the planets rotated around tilted axes, and some shared such features as ice caps and seasons. Since the dawn of the Space Age, close observation by space probes has found that Earth and the other planets share characteristics such as volcanism, hurricanes, tectonics, and even hydrology.
At about the same time, by careful analysis of pre: large low-density giant planets, and smaller rocky terrestrials. Under IAU definitions, there are eight planets in the Solar System. In order of increasing distance from the Sun, they are the four terrestrials, Mercury, Venus, Earth, and Mars, then the four giant planets, Jupiter, Saturn, Uranus, and Neptune. Six of the planets are orbited by one or more natural satellites. Planets are generally divided into two main types
The sparse_term_matrix class can be initialized using either a vector of documents or a text file. Assuming the downloaded file is saved as “planets.txt”, then a document-term-matrix can be created in the following way,
= sparse_term_matrix$new(vector_data = NULL, # in case of vector of documents
init
file_data = "/planets.txt", # input the .txt data
document_term_matrix = TRUE) # document term matrix as output
= init$Term_Matrix(sort_terms = TRUE, # initial terms are sorted
tm
to_lower = TRUE, # convert to lower case
trim_token = TRUE, # trim token
split_string = TRUE, # split string
tf_idf = TRUE, # tf-idf will be returned
verbose = TRUE)
: 0.00001 total.time: 0.00001
minutes.to.tokenize.transform.data
:
Warning messagein the column names they will be replaced with proper characters
empty character strings present
5 x 212 sparse Matrix of class "dgCMatrix"
91 column names 'X', 'X17th', 'X1950' ... ]]
[[ suppressing
1,] -0.001939591 . . 0.009747774 0.01949555 ......
[2,] -0.003255742 . 0.01636233 . . ......
[3,] -0.003440029 0.0172885 . . . ......
[4,] -0.002196645 . . . . ......
[5,] -0.002681199 . . . . . ......
[
1,] 0.007121603 . 0.009747774 . 0.005434315 . ......
[2,] 0.007969413 0.01636233 . . . . ......
[3,] . . . . 0.009638219 . ......
[4,] 0.008065430 . . 0.01103965 . ......
[5,] . . . . . ......
[
1,] -0.001939591 0.009747774 . . . ......
[2,] -0.003255742 . . . 0.01636233 ......
[3,] -0.010320088 . . . . ......
[4,] -0.006589936 . 0.01103965 0.01103965 . ......
[5,] -0.002681199 . . . . ......
[
.
. .
The Term_Matrix method takes almost the same parameters as the ( already explained ) big_text_tokenizer() method. The only differences are:
Details about the parameters of the Term_Matrix method can be found in the package documentation.
To adjust the sparsity of the output matrix one can take advantage of the Term_Matrix_Adjust method, (by adjusting the sparsity_thresh towards 0.0 a proportion of the sparse terms will be removed)
= init$Term_Matrix_Adjust(sparsity_thresh = 0.6) res_adj
res_adj
5 x 9 sparse Matrix of class "dgCMatrix"
planets by X solar and as ...... 1,] -0.005818773 -0.001939591 -0.001939591 0.004747735 -0.001939591 0.007121603 ......
[2,] -0.006511484 -0.003255742 -0.003255742 0.003984706 -0.006511484 0.007969413 ......
[3,] -0.006880059 -0.010320088 -0.003440029 . -0.003440029 . ......
[4,] -0.006589936 -0.006589936 -0.002196645 . -0.008786581 0.008065430 ......
[5,] -0.013405997 -0.002681199 -0.002681199 0.003281523 -0.008043598 . ...... [
The term_associations method returns the correlation of specific terms (Terms) with all the other terms in the output matrix. The dimensions of the output matrix can vary depending on which one of the Term_Matrix, Term_Matrix_Adjust is run previously. In the previous step I adjusted the initial sparse matrix using a sparsity_thresh of 0.6, thus the new dimensions will be,
dim(res_adj)
1] 5 9 [
and the resulted terms,
$term_associations(Terms = c('planets', 'by', 'INVALID'), keep_terms = NULL, verbose = TRUE) init
' INVALID ' term does not exist in the terms vector
the
: 2 minutes.to.complete: 0.00000
total.number.variables.processed
$planets
term correlation1: as 0.65943196
2: and 0.48252671
3: X 0.07521813
4: by -0.26301349
5: of NaN
6: solar -0.11887462
7: were NaN
8: the -0.15500900
9: in. NaN
10: that 0.44307617
11: earth -0.24226093
$by
term correlation1: solar 0.9092777
2: X 0.5010034
3: planets -0.2630135
4: of NaN
5: were NaN
6: the 0.7838436
7: as 0.3698239
8: and -0.0594149
9: in. NaN
10: earth -0.6952757
11: that -0.9338884
Lastly, the most_frequent_terms method gives the frequency of the terms in the corpus. However, the function returns only if the normalize parameter is NULL and the tf_idf parameter is FALSE ( the latter two parameters belong to the init$Term_Matrix() method ),
= sparse_term_matrix$new(file_data = PATH, document_term_matrix = TRUE)
init
= init$Term_Matrix(sort_terms = TRUE,
tm
to_lower = TRUE,
trim_token = TRUE,
split_string = TRUE,
tf_idf = FALSE, # disable tf-idf
verbose = TRUE)
$most_frequent_terms(keep_terms = 10, threads = 1, verbose = TRUE) init
: 0.00000
minutes.to.complete
term frequency1: the 28
2: planets 15
3: and 11
4: of 9
5: by 9
6: as 8
7: in. 6
8: X 5
9: are 5
10: that 5
More information about the sparse_term_matrix class can be found in the package documentation.
The token_stats class can be utilized to output corpus statistics. Each of the following methods can take either a vector of terms, a text file or a folder of files as input:
= token_stats$new(path_2file = "/planets.txt") # input the 'planets.txt' file
init
= init$path_2vector() vec
1] "The term planet is ancient, with ties to history, astrology, science, mythology, and religion. Several planets in the Solar System can be seen with the naked eye. These were regarded by many early cultures as divine, or as emissaries of deities. As scientific knowledge advanced, human perception of the planets changed, incorporating a number of disparate objects" ....
[
2] "Although eight of the planetary bodies discovered before 1950 remain" ....
[
. .
# assuming the following 'freq_vocab.txt'
the
term
planet
is
ancient
with
ties
to
history
astrology
science
mythology
and
religion
several
planetsin
the
solar
system
can
be
seen
with
the
naked
eye
these were
this method would return,
= token_stats$new(path_2file = 'freq_vocab.txt')
init
$freq_distribution()
init
$print_frequency(subset = NULL) init
words freq1: the 3
2: with 2
3: ancient 1
4: and 1
5: astrology 1
6: be 1
7: can 1
8: eye 1
9: history 1
10: in 1
11: is 1
12: mythology 1
13: naked 1
14: planet 1
15: planets 1
16: religion 1
17: science 1
18: seen 1
19: several 1
20: solar 1
21: system 1
22: term 1
23: these 1
24: ties 1
25: to 1
26: were 1
words freq
for the previously mentioned ‘freq_vocab.txt’ it would output,
= token_stats$new(path_2file = 'freq_vocab.txt')
init
= init$count_character()
vec_tmp
$print_count_character(number = 3) init
# words with number of characters equal to 3
1] "the" "and" "the" "can" "the" "eye" [
# the data needs to be n-grams thus first tokenize and build the n-grams using
# the 'tokenize_transform_text' function ( the "planets.txt" file as input )
= tokenize_transform_text("planets.txt",
tok
to_lower = T,
split_string = T,
min_n_gram = 3,
max_n_gram = 3,
n_gram_delimiter = "_")
= token_stats$new(x_vec = tok$token) # vector data as input
init
= init$collocation_words() vec_tmp
the example output of the vec_tmp vector is,
1] "" "17th" "1950" "2006" "a" "about" "adopted" "advanced"
[9] "age" "although" ....
[
.
. .
and the print_collocations method returns the coolocations for the example word ancient,
= init$print_collocations(word = "ancient") res
is with ties planet 0.333 0.333 0.167 0.167
For illustration purposes I’ll use the previously mentioned ‘freq_vocab.txt’ file, but first I have to convert the text file to a character vector,
# first initialization of token_stats
= token_stats$new(path_2file = 'freq_vocab.txt')
init
= init$path_2vector() # convert to vector
tmp_vec
# second initialization to compute the dissimilarity matrix
= token_stats$new(x_vec = tmp_vec)
init_tok
= init_tok$string_dissimilarity_matrix(dice_n_gram = 2, method = "dice",
res
split_separator = " ", dice_thresh = 1.0,
upper = TRUE, diagonal = TRUE, threads = 1)
the term planet is ancient with ties to history ....0.0000000 0.6000000 1.00000000 1 1.0000000 1.0000000 0.6000000 1 1.0000000 ....
the 0.6000000 0.0000000 1.00000000 1 1.0000000 1.0000000 0.6666667 1 1.0000000 ....
term 1.0000000 1.0000000 0.00000000 1 0.8181818 1.0000000 1.0000000 1 1.0000000 ....
planet 1.0000000 1.0000000 1.00000000 0 1.0000000 1.0000000 1.0000000 0 1.0000000 ....
is 1.0000000 1.0000000 0.81818182 1 0.0000000 1.0000000 0.7777778 1 1.0000000 ....
ancient 1.0000000 1.0000000 1.00000000 1 1.0000000 0.0000000 1.0000000 1 1.0000000 ....
with 0.6000000 0.6666667 1.00000000 1 0.7777778 1.0000000 0.0000000 1 1.0000000 ....
ties 1.0000000 1.0000000 1.00000000 0 1.0000000 1.0000000 1.0000000 0 1.0000000 ....
to 1.0000000 1.0000000 1.00000000 1 1.0000000 1.0000000 1.0000000 1 0.0000000 ....
history 1.0000000 1.0000000 1.00000000 1 0.8571429 1.0000000 1.0000000 1 0.8571429 ....
astrology 1.0000000 1.0000000 1.00000000 1 0.3333333 1.0000000 0.7777778 1 1.0000000 ....
science
.
. .
here by adjusting (reducing ) the dice_thresh parameter we can force values close to 1.0 to become 1.0,
the term planet is ancient with ties to history astrology science ....0.0000000 1 1.00000000 1 1.0000000 1 1 1 1 1 1.0000000 ....
the 1.0000000 0 1.00000000 1 1.0000000 1 1 1 1 1 1.0000000 ....
term 1.0000000 1 0.00000000 1 1.0000000 1 1 1 1 1 1.0000000 ....
planet 1.0000000 1 1.00000000 0 1.0000000 1 1 0 1 1 1.0000000 ....
is 1.0000000 1 1.00000000 1 0.0000000 1 1 1 1 1 0.3333333 ....
ancient 1.0000000 1 1.00000000 1 1.0000000 0 1 1 1 1 1.0000000 ....
with 1.0000000 1 1.00000000 1 1.0000000 1 0 1 1 1 1.0000000 ....
ties 1.0000000 1 1.00000000 0 1.0000000 1 1 0 1 1 1.0000000 ....
to 1.0000000 1 1.00000000 1 1.0000000 1 1 1 0 1 1.0000000 ....
history 1.0000000 1 1.00000000 1 1.0000000 1 1 1 1 0 1.0000000 ....
astrology 1.0000000 1 1.00000000 1 0.3333333 1 1 1 1 1 0.0000000 ....
science
.
. .
# first initialization of token_stats
= token_stats$new(path_2file = 'freq_vocab.txt')
init
= init$path_2vector() # convert to vector
tmp_vec
# second initialization to compute the look-up-table
= token_stats$new(x_vec = tmp_vec)
init_lk
= init_lk$look_up_table(n_grams = 3) is_vec
# example output for the 'is_vec' vector
1] "" "ake" "_an" "anc" "ane" "_as" "ast" "cie" "eli" "enc" "era" "eve" .....
[29] "net" "ola" "olo" "_pl" "pla" "_re" "rel" "rol" "_sc" "sci" "_se" "see" .....
[57] "tro" "ver" "_we" "wer" "_wi" "wit" "yst" "yth" [
then retrieve words with same n-grams,
$print_words_lookup_tbl(n_gram = "log") init_lk
"_astrology_" "_mythology_"
the underscores are necessary to distinguish the begin and end of each word when computing the n-grams.
More information about the token_stats class can be found in the package documentation.
The purpose of creating those functions is because I observed that they return faster in comparison to other R packages. The following code chunks explain each one of the functions,
#---------------------------------
# conversion from dense to sparse
#---------------------------------
library(textTinyR)
## Loading required package: Matrix
set.seed(1)
= matrix(sample(0:1, 100, replace = T), 10, 10)
dsm
= dense_2sparse(dsm)
res_sp
res_sp
## 10 x 10 sparse Matrix of class "dgCMatrix"
##
## [1,] . . . 1 1 1 . 1 1 .
## [2,] 1 . . 1 1 . 1 1 1 .
## [3,] . . . . . 1 1 . . 1
## [4,] . . . 1 1 1 1 . . 1
## [5,] 1 . . . 1 . 1 . . .
## [6,] . 1 . . 1 . 1 1 1 .
## [7,] . 1 1 1 1 1 1 1 . .
## [8,] . 1 . . 1 1 . . 1 1
## [9,] 1 1 . 1 . 1 1 . . 1
## [10,] 1 . 1 1 . . 1 1 1 .
#---------------------
# row- or column- sums
#---------------------
= sparse_Sums(res_sp, rowSums = FALSE) # column-sums
sm_cols
sm_cols
## [1] 4 4 2 6 7 6 8 5 5 4
= sparse_Sums(res_sp, rowSums = TRUE) # row-sums
sm_rows
sm_rows
## [1] 5 6 3 5 3 5 7 5 6 6
#----------------------
# row- or column- means
#----------------------
= sparse_Means(res_sp, rowMeans = FALSE) # column-means
mn_cols
mn_cols
## [1] 0.4 0.4 0.2 0.6 0.7 0.6 0.8 0.5 0.5 0.4
= sparse_Means(res_sp, rowMeans = TRUE) # row-means
mn_rows
mn_rows
## [1] 0.5 0.6 0.3 0.5 0.3 0.5 0.7 0.5 0.6 0.6
#-------------------------------------
# sparsity of a matrix (as percentage)
#-------------------------------------
matrix_sparsity(res_sp)
## 49 %
#------------------------------------------------------
# saving and loading sparse matrices (in binary format)
#------------------------------------------------------
= save_sparse_binary(res_sp, file_name = "save_sparse.mat")
save_sp
= load_sparse_binary(file_name = "save_sparse.mat") load_sp
More information about the helper functions for sparse matrices can be found in the package documentation.
The tokenize_transform_text() function applies tokenization and transformation in a similar way to the big_text_tokenizer() method, however for small to medium data sets. The input can be either a character string (text data) or a path to a file. This method takes as input a single character string (character-string == one line). The parameters for the tokenize_transform_text() function are the same to the (already explained) big_text_tokenizer() method with the only exception being the input data type.
The tokenize_transform_vec_docs() function works in the same way to the Term_Matrix() method and it targets small to medium data sets. It takes as input a vector of documents and retains their order after tokenization and transformation has taken place. Both the tokenize_transform_text() and tokenize_transform_vec_docs() share the same parameters, with the following two exceptions,
The following code chunks give an overview of the mentioned functions,
#------------------------
# tokenize_transform_text
#------------------------
# example input : "planets.txt"
= tokenize_transform_text(object = "/planets.txt",
res_txt
to_lower = TRUE,
utf_locale = "",
trim_token = TRUE,
split_string = TRUE,
remove_stopwords = TRUE,
language = "english",
stemmer = "ngram_sequential",
stemmer_ngram = 3,
threads = 1)
the output is a vector of tokens after the english stopwords were removed and the terms were stemmed (ngram_sequential of length 3),
# example output :
$token
1] "ter" "planet" "anci" "ties" "hist" ...
[
16] "early" "cultu" "divi" "emissar" "deit" ....
[
31] "object" "2006" "internatio" "astro" "union" ...
[
46] "exclu" "object" "planet" "mass" "based"" ....
[.
.
.
attr(,"class")
[1] "tokenization and transformation"
#----------------------------
# tokenize_transform_vec_docs
#----------------------------
# the input should be a vector of documents
= token_stats$new(path_2file = "/planets.txt")
init
= init$path_2vector() # convert text file to character vector
inp
# run the function using the input-vector
= tokenize_transform_vec_docs(object = inp,
res_dct
as_token = FALSE, # return character vector of documents
to_lower = TRUE,
utf_locale = "",
trim_token = TRUE,
split_string = TRUE,
remove_stopwords = TRUE,
language = "english",
stemmer = "porter2_stemmer",
threads = 1)
the output is a vector of transformed documents after the english stopwords were removed and the terms were stemmed (porter2-stemming),
$token
1] "term planet ancient tie histori astrolog scienc mytholog religion planet solar ....."
[
2] "planetari bodi discov 1950 remain planet modern definit celesti bodi cere palla ....."
[
3] "planet thought ptolemi orbit earth defer epicycl motion idea planet orbit sun ....."
[
4] "time care analysi pre-telescop observ data collect tycho brahe johann kepler ....."
[
5] "planet general divid main type larg lowdens giant planet smaller rocki terrestri ....."
[
attr(,"class")
1] "tokenization and transformation" [
The documents can be returned as a list of character vectors by specifying, as_token = TRUE,
# run the function using the input-vector
= tokenize_transform_vec_docs(object = inp,
res_dct_tok
as_token = TRUE,
to_lower = TRUE,
utf_locale = "",
trim_token = TRUE,
split_string = TRUE,
remove_stopwords = TRUE,
language = "english",
stemmer = "porter2_stemmer",
threads = 1)
$token
$token[[1]]
1] "term" "planet" "ancient" "tie" "histori" .....
[
$token[[2]]
1] "planetari" "bodi" "discov" "1950" "remain" .....
[
$token[[3]]
1] "planet" "thought" "ptolemi" "orbit" "earth" .....
[
attr(,"class")
1] "tokenization and transformation" [
A few words about the utf_locale, remove_stopwords and stemmer parameters.
The following code chunks illustrate the utility functions of the package (besides the read_characters() and read_rows() which used in the previous code chunks),
#---------------------------------------
# cosine distance between word sentences
#---------------------------------------
= 'sentence with two words'
s1
= 'sentence with three words'
s2
= " "
sep
cosine_distance(s1, s2, split_separator = sep)
## [1] 0.75
#------------------------------------------------------------------------
# dice distance between two words (using n-grams -- the lower the better)
#------------------------------------------------------------------------
= 'word_one'
w1
= 'word_two'
w2
= 2
n
dice_distance(w1, w2, n_grams = n)
## [1] 0.4117647
#---------------------------------------
# levenshtein distance between two words
#---------------------------------------
= 'word_two'
w1
= 'word_one'
w2
levenshtein_distance(w1, w2)
## [1] 3
#---------------------------------------------
# bytes converter (returns the size of a file)
#---------------------------------------------
= "/planets.txt"
PATH
bytes_converter(input_path_file = PATH, unit = "KB" )
## [1] 2.213867
#---------------------------------------------------
# returns the utf-locale for the available languages
#---------------------------------------------------
utf_locale(language = "english")
## [1] "en.UTF-8"
#-----------------
# text file parser
#-----------------
# The text file should have a structure (such as an xml-structure), so that
# subsets can be extracted using the "start_query" and "end_query" parameters.
# (it works similarly to the big_text_parser() method, however for small to medium sized files)
# example input "example_file.xml" file :
<?xml version="1.0"?>
<sked>
<version>2</version>
<flight>
<carrier>BA</carrier>
<number>4001</number>
<date>2011-07-21</date>
</flight>
<flight cancelled="true">
<carrier>BA</carrier>
<number>4002</number>
<date>2011-07-21</date>
</flight>
</sked>
= text_file_parser(input_path_file = "example_file.xml",
fp
output_path_file = "/output_folder/example_output_file.txt",
start_query = '<number>', end_query = '</number>',
min_lines = 1, trimmed_line = FALSE)
"example_output_file.txt" :
4001
4002
#------------------
# vocabulary parser
#------------------
# the 'vocabulary_parser' function extracts a vocabulary from a structured text (such as
# an .xml file) and works in the exact same way as the 'big_tokenize_transform' class,
# however for small to medium sized data files
= vocabulary_parser(input_path_file = '/folder/input_data.txt',
pars_dat
start_query = 'start_word', end_query = 'end_word',
vocabulary_path_file = '/folder/vocab.txt',
to_lower = TRUE, split_string = TRUE,
remove_stopwords = TRUE)