As most of you know, today is my last working day. I am taking a break to pursue my personal interests and upskill my knowledge. I will strike again in this space whenever i am fully ready and in par with the future generations(especially millennials and Generation Z) in this space.
I want to take a moment to thank all of you for the support, learning experiences, hard work and friendship that you have given me over the years.As I???m sure you know, today is my last day at at this amazing organization. There are so many exceptionally talented people here who have positively affected my life over 7+ years and who continue to inspire me that it would take an enormous amount of time to list.
Finally this is how my world is in HSBC. The workstreams/processes/people form different teams i have been involved with.
# Install
# Load
library("tm")
## Loading required package: NLP
library("SnowballC")
library("wordcloud")
## Loading required package: RColorBrewer
library("RColorBrewer")
## Set the working directory to where the text file is
setwd('J:\\ISB Business Analytics\\officewordcloud')
## Input file read
input <- read.csv("New Microsoft Excel Worksheet.csv",header=FALSE)
docs <- Corpus(VectorSource(input))
inspect(docs)
## <<VCorpus>>
## Metadata: corpus specific: 0, document level (indexed): 0
## Content: documents: 1
##
## $V1
## <<PlainTextDocument>>
## Metadata: 7
## Content: chars: 23424
dtm <- TermDocumentMatrix(docs)
m <- as.matrix(dtm)
v <- sort(rowSums(m),decreasing=TRUE)
d <- data.frame(word = names(v),freq=v)
head(d, 10)
## word freq
## hcb hcb 150
## accountvalue accountvalue 94
## hlm hlm 69
## ohfx ohfx 69
## bulkinput bulkinput 68
## salesandmarketing salesandmarketing 63
## performancetuning performancetuning 59
## accountmaintanence accountmaintanence 58
## operationalaccts operationalaccts 54
## statementsandadvices statementsandadvices 53
#set.seed(1234)
wordcloud(words = d$word, freq = d$freq, min.freq = 1,
max.words=200, random.order=FALSE, rot.per=0.45,
colors=brewer.pal(8, "Dark2"))
## Warning in wordcloud(words = d$word, freq = d$freq, min.freq = 1, max.words
## = 200, : currencyconversion could not be fit on page. It will not be
## plotted.
You can also embed plots, for example:
Note that the echo = FALSE parameter was added to the code chunk to prevent printing of the R code that generated the plot.