source("getFreqDir.R")
tf <- getFreqDir("univ")
library(wordcloud)
## Loading required package: RColorBrewer
wordcloud(rownames(tf),tf[,1])
wordcloud(rownames(tf),tf[,4],min.freq=2,colors=rainbow(10))
comparison.cloud(tf[,1:2])
comparison.cloud(tf[,4:6],max.words=60)
colnames(tf)
## [1] "hiroshima" "kufs" "kyoto" "osaka1" "osaka2" "osaka3"
## [7] "tokyo" "waseda"
comparison.cloud(univ[,c(F,F,T,F,F,T,T,F)],max.words=60)
library(shiny)
shinyUI(bootstrapPage(
# Application title
headerPanel("Test Hoge"),
# Sidebar
sidebarPanel(
textInput("msg", "Please type your message:")
),
# Show a message
mainPanel(
textOutput("showMessage")
)
))
shinyServer(function(input, output) {
output$showMessage <- renderText({
input$msg
})
})
runApp("shiny_apps/app_hoge")
runApp("shiny_apps/app_freqBar")
runApp("shiny_apps/app_freqDist")
conditionalPanel(condition = "input.Zipf == true",uiOutput("controlK")),
getFreq <- memoise(function(currentUniv){
....
})
runApp("shiny_apps/app_freqBar2")
library(RColorBrewer)
brewer.pal.info[]
display.brewer.all()
brewer.pal.info[]
brewer.pal(5, "BrBG")
runApp("shiny_apps/app_freqBar3")
ui画面には以下のinput機能を搭載
1. 距離行列計算法の選択:"euclidean", "canberra", "manhattan"
2. クラスター間距離計算法の選択:"average", "complete", "ward"
3. 樹形図内長方形の数:2-7
出力画面例