ab %>% select(ana_heb,ana_e_w, ana_latin) %>% gt
ana_heb | ana_e_w | ana_latin |
---|---|---|
אַנָּ |
We beg You | Ana |
בְּכֹחַ |
with power | BeKoach |
גְּדֻלַּת |
with the greatness | gedullat |
יְמִינְךָ |
Of Your right hand | yemincha |
תַּתִּיר |
Release | tattir |
צְרוּרָה |
the bundle (of sins) | tzerurah |
קַבֵּל |
Accept | Kabbel |
רִנַּת |
the song | rinnat |
עַמְּךָ |
of your people | ammecha |
שַׂגְּבֵנוּ |
Elevate us | Saggevenu |
טַהֲרֵנוּ |
purify us | taharenu |
נוֹרָא |
oh awesome One | nora |
נָא |
Please | Na |
גִּבּוֹר |
mighty One, | gibbor |
דּוֹרְשֵׁי |
the seekers | doreshei |
יִחוּדְךָ |
of Your unity, | yichudecha |
כְּבַבַּת |
like an eye pupil | kevabbat |
שָׁמְרֵם |
guard them. | shamerem |
בָּרְכֶם |
Bless them | Barechem |
טַהֲרֵם |
purify them | taharem |
רַחֲמֵי |
show them compassion. | rachamei |
צִדְקָתְךָ |
Your righteousness | Tzidkatecha |
תָּמִיד |
should always | tamid |
גָּמְלֵם |
reward them. | gamelem |
חָסִין |
Powerful One | Chasin |
קָדוֹשׁ |
holy One, | kadosh |
בְּרוֹב |
in Your abundant | berov |
טוּבְךָ |
goodness, | tuvecha |
נָהֵל |
guide | nahel |
עֲדָתֵךָ |
Your community. | adatecha |
יָחִיד |
Unique and | Yachid |
גֵּאֶה |
pround One, | ge'eh |
לְעַמְּךָ |
to Your people | Le'ammecha |
פְּנֵה |
face them, | peneh |
זוֹכְרֵי |
those who remember | zocherei |
קְדֻשֶּׁתֶּךָ |
your holiness. | kedushettecha |
שַׁוְעָתֵנוּ |
Our cries | Shav'atenu |
קַבֵּל |
accept | kabbel |
וְשָׁמַע |
and listen to | veshama |
צַעֲקָתֵנוּ |
our screams, | tza'akatenu |
יוֹדֵעַ |
knower | yodea |
תַּעֲלֻמוֹת |
of mysteries. | ta'alumot |
ab %>% distinct(ana_eng, .keep_all = TRUE) %>% pull(ana_eng) %>% as.character()
## [1] "We beg you! With the strength and greatness of your right arm, untie our bundled sins."
## [2] "Accept your nation's song; elevate and purify us, O Awesome One."
## [3] "Please, O Heroic One, those who foster your Oneness, guard them like the pupil of an eye."
## [4] "Bless them, purify them, pity them. May Your righteousness always reward them."
## [5] "Powerful Holy One, in much goodness guide Your congregation.\t"
## [6] "Unique and Exalted One, turn to Your nation which proclaims Your holiness.\t"
## [7] "Accept our entreaty and hear our screams, O Knower of Mysteries."
ab %>% pull(ana_latin) %>% as.character()
## [1] "Ana" "BeKoach" "gedullat" "yemincha"
## [5] "tattir" "tzerurah" "Kabbel" "rinnat"
## [9] "ammecha" "Saggevenu" "taharenu" "nora"
## [13] "Na" "gibbor" "doreshei" "yichudecha"
## [17] "kevabbat" "shamerem" "Barechem" "taharem"
## [21] "rachamei" "Tzidkatecha" "tamid" "gamelem"
## [25] "Chasin" "kadosh" "berov" "tuvecha"
## [29] "nahel" "adatecha" "Yachid" "ge'eh"
## [33] "Le'ammecha" "peneh" "zocherei" "kedushettecha"
## [37] "Shav'atenu" "kabbel" "veshama" "tza'akatenu"
## [41] "yodea" "ta'alumot"
ab %>% pull(ana_heb)
## [1] "אַנָּ" "בְּכֹחַ" "גְּדֻלַּת" "יְמִינְךָ" "תַּתִּיר" "צְרוּרָה" "קַבֵּל" "רִנַּת"
## [9] "עַמְּךָ" "שַׂגְּבֵנוּ" "טַהֲרֵנוּ" "נוֹרָא" "נָא" "גִּבּוֹר" "דּוֹרְשֵׁי" "יִחוּדְךָ"
## [17] "כְּבַבַּת" " שָׁמְרֵם" "בָּרְכֶם" "טַהֲרֵם" "רַחֲמֵי" "צִדְקָתְךָ" "תָּמִיד" "גָּמְלֵם"
## [25] "חָסִין" "קָדוֹשׁ" "בְּרוֹב" "טוּבְךָ" "נָהֵל" "עֲדָתֵךָ" "יָחִיד" "גֵּאֶה"
## [33] "לְעַמְּךָ" "פְּנֵה" "זוֹכְרֵי" "קְדֻשֶּׁתֶּךָ" "שַׁוְעָתֵנוּ" "קַבֵּל" "וְשָׁמַע" "צַעֲקָתֵנוּ"
## [41] "יוֹדֵעַ" "תַּעֲלֻמוֹת"
## attr(,"format.spss")
## [1] "A300"
## attr(,"display_width")
## [1] 12
ab %>% pull(ana_heb) %>% as.character()
## [1] "אַנָּ" "בְּכֹחַ" "גְּדֻלַּת" "יְמִינְךָ" "תַּתִּיר" "צְרוּרָה" "קַבֵּל" "רִנַּת"
## [9] "עַמְּךָ" "שַׂגְּבֵנוּ" "טַהֲרֵנוּ" "נוֹרָא" "נָא" "גִּבּוֹר" "דּוֹרְשֵׁי" "יִחוּדְךָ"
## [17] "כְּבַבַּת" " שָׁמְרֵם" "בָּרְכֶם" "טַהֲרֵם" "רַחֲמֵי" "צִדְקָתְךָ" "תָּמִיד" "גָּמְלֵם"
## [25] "חָסִין" "קָדוֹשׁ" "בְּרוֹב" "טוּבְךָ" "נָהֵל" "עֲדָתֵךָ" "יָחִיד" "גֵּאֶה"
## [33] "לְעַמְּךָ" "פְּנֵה" "זוֹכְרֵי" "קְדֻשֶּׁתֶּךָ" "שַׁוְעָתֵנוּ" "קַבֵּל" "וְשָׁמַע" "צַעֲקָתֵנוּ"
## [41] "יוֹדֵעַ" "תַּעֲלֻמוֹת"
ab %>% pull(day_heb) %>% as.character()
## [1] "חסד" "חסד" "חסד" "חסד" "חסד" "חסד" "גבורה" "גבורה"
## [9] "גבורה" "גבורה" "גבורה" "גבורה" "תפארת" "תפארת" "תפארת" "תפארת"
## [17] "תפארת" "תפארת" "נצח\n" "נצח\n" "נצח\n" "נצח\n" "נצח\n" "נצח\n"
## [25] "הוד\n" "הוד\n" "הוד\n" "הוד\n" "הוד\n" "הוד\n" "יסוד\n" "יסוד\n"
## [33] "יסוד\n" "יסוד\n" "יסוד\n" "יסוד\n" "מלכות" "מלכות" "מלכות" "מלכות"
## [41] "מלכות" "מלכות"
go to … home. # WordClouds
ana_eng_ly <- ab %>%
select(ana_e_w)
ana_text_.corpus <- ana_eng_ly %>%
tm::VectorSource() %>%
tm::VCorpus()
toSpace = content_transformer(function (x , pattern )
gsub(pattern, " ", x))
ana_text_.corpus = ana_text_.corpus %>%
tm_map(toSpace, "/") %>%
tm_map(toSpace, " ") %>%
tm_map(toSpace, "\\|")
ana_text_.corpus = ana_text_.corpus %>%
tm_map(FUN = content_transformer(tolower)) %>% # Convert the text to lower case
tm_map(FUN = removeNumbers) %>% # Remove numbers
tm_map(removeWords, stopwords("english")) %>% # Remove english common stopwords
tm_map(removeWords, c("your", "o")) %>% # Remove words
tm_map(removePunctuation) %>% # Remove punctuations
tm_map(stripWhitespace) #
ana_text_.corpus <- ana_text_.corpus %>%
tm::TermDocumentMatrix(control = list(removeNumbers = TRUE,
stopwords = TRUE,
stemming = TRUE)) %>%
as.matrix() %>% as.data.frame() %>%
tibble::rownames_to_column() %>%
dplyr::rename(word = 1, freq = 2) %>%
dplyr::arrange(desc(freq))
ggplot(data = ana_text_.corpus,
aes(label = word, size = freq, col = as.character(freq))) +
geom_text_wordcloud(rm_outside = TRUE, max_steps = 1,
grid_size = 1, eccentricity = .9)+
scale_size_area(max_size = 20)+
scale_color_brewer(palette = "Paired", direction = -1)+
theme_void()