狠狠撸

狠狠撸Share a Scribd company logo
?
> me
$name
[1] "Takashi Kitano"
$twitter
[1] "@kashitan"
$work_in
[1] " "
?
?
好みの日本酒を呑みたい! ?さけのわデータで探す自分好みの酒??
好みの日本酒を呑みたい! ?さけのわデータで探す自分好みの酒??
##
charts <-
jsonlite::read_json("https://muro.sakenowa.com/sakenowa-data/api/flavor-charts",
simplifyVector = TRUE) %>%
purrr::pluck("flavorCharts")
↑ ↑ ↑ ↑ ↑ ↑
##
brands <-
jsonlite::read_json("https://muro.sakenowa.com/sakenowa-data/api/brands",
simplifyVector = TRUE) %>%
purrr::pluck("brands")
##
brands.dist.mat <-
charts %>%
#
tibble::remove_rownames() %>%
# ID
tibble::column_to_rownames(var = "brandId") %>%
#
proxy::dist(method = "cosine")
brands.dist.mat %>%
as.matrix() %>%
.[1:8, 1:8]
## data.frame
brands.dist.df <-
brands.dist.mat %>%
as.matrix() %>%
# tibble
tibble::as_tibble(rownames = NA) %>%
#
tibble::rownames_to_column(var = "brandId1") %>%
#
tidyr::pivot_longer(
cols = -brandId1,
names_to = "brandId2",
values_to = "dist") %>%
#
dplyr::filter(brandId1 != brandId2) %>%
# ID
dplyr::mutate_if(is.character, as.integer)
brands.dist.df %>%
#
dplyr::inner_join(brands,
by = c("brandId1" = "id")) %>%
dplyr::inner_join(brands,
by = c("brandId2" = "id")) %>%
#
dplyr::filter(name.x == " ") %>%
#
dplyr::arrange(dist) %>%
dplyr::select(name.y, dist)
好みの日本酒を呑みたい! ?さけのわデータで探す自分好みの酒??
brands.dist.df %>%
#
dplyr::inner_join(brands,
by = c("brandId1" = "id")) %>%
dplyr::inner_join(brands,
by = c("brandId2" = "id")) %>%
#
dplyr::filter(name.x == " ") %>%
#
dplyr::arrange(desc(dist)) %>%
dplyr::select(name.y, dist)
好みの日本酒を呑みたい! ?さけのわデータで探す自分好みの酒??
好みの日本酒を呑みたい! ?さけのわデータで探す自分好みの酒??
n <- 6 # ( 6 )
brands.cluster <-
brands.dist.mat %>%
#
hclust(method="ward.D2") %>%
#
cutree(n) %>%
# tibble
tibble::tibble(
brandId = as.integer(names(.)),
cluster = .
)
radars <-
brands.cluster %>%
#
dplyr::inner_join(charts, by = c("brandId" = "brandId")) %>%
#
dplyr::group_by(cluster) %>%
dplyr::summarise_at(dplyr::vars(dplyr::starts_with("f")), mean)
1
radars <-
radars %>%
#
dplyr::group_by(cluster) %>%
tidyr::nest() %>%
dplyr::mutate(fig = purrr::map2(data, cluster, function(x, y) {
plotly::plot_ly(
type = "scatterpolar", mode = "markers",
r = c(x$f1, x$f2, x$f3, x$f4, x$f5, x$f6, x$f1),
theta = c(" ", " ", " ", " ", " ", " ", " "),
fill = 'toself',
fillcolor = RColorBrewer::brewer.pal(n = n, name = "Accent")[y],
opacity = 0.5
) %>%
plotly::layout(polar = list(angularaxis = list(
rotation = 90,
direction = 'counterclockwise')))
}))
radars$fig[[1]]
radars$fig[[4]]
radars$fig[[2]]
radars$fig[[6]]
radars$fig[[3]]
radars$fig[[5]]
brands.mds <-
brands.dist.mat %>%
# (MDS)
cmdscale() %>%
`colnames<-`(c("x", "y")) %>%
tibble::as_tibble(rownames = NA) %>%
tibble::rownames_to_column(var = "brandId") %>%
dplyr::mutate(brandId = as.integer(brandId)) %>%
#
dplyr::inner_join(
brands.cluster,
by = c("brandId" = "brandId")
) %>%
#
dplyr::inner_join(
brands[, -3],
by = c("brandId" = "id")
) %>%
dplyr::mutate(cluster = forcats::as_factor(cluster))
1
##
rankings <-
jsonlite::read_json("https://muro.sakenowa.com/sakenowa-data/api/rankings",
simplifyVector = TRUE)
brands.mds %>%
#
dplyr::filter(brandId %in% rankings$overall$brandId) %>%
#
plotly::plot_ly(x = ~x, y = ~y) %>%
plotly::add_markers(
color = ~cluster,
text = ~name,
colors = RColorBrewer::brewer.pal(n = n, name = "Accent")) %>%
plotly::add_text(
text = ~name,
textposition = "top center"
) %>%
plotly::layout(showlegend = FALSE)
好みの日本酒を呑みたい! ?さけのわデータで探す自分好みの酒??
好みの日本酒を呑みたい! ?さけのわデータで探す自分好みの酒??
好みの日本酒を呑みたい! ?さけのわデータで探す自分好みの酒??
好みの日本酒を呑みたい! ?さけのわデータで探す自分好みの酒??
好みの日本酒を呑みたい! ?さけのわデータで探す自分好みの酒??
好みの日本酒を呑みたい! ?さけのわデータで探す自分好みの酒??
##
tags <-
jsonlite::read_json("https://muro.sakenowa.com/sakenowa-data/api/flavor-tags",
simplifyVector = TRUE) %>%
purrr::pluck("tags")
##
brand_tags <-
jsonlite::read_json(
"https://muro.sakenowa.com/sakenowa-data/api/brand-flavor-tags",
simplifyVector = TRUE
) %>%
purrr::pluck("flavorTags")
#
contingency.table <-
brand_tags %>%
tidyr::unnest(cols = tagIds) %>%
#
dplyr::inner_join(
brands.cluster,
by = c("brandId" = "brandId")
) %>%
#
dplyr::inner_join(
tags,
by = c("tagIds" = "id")
) %>%
dplyr::group_by(tagIds, tag, cluster) %>%
dplyr::count()
1
contingency.table <-
contingency.table %>%
#
tidyr::pivot_wider(
id_cols = tag,
names_from = cluster,
values_from = n,
values_fill = 0) %>%
#
tibble::column_to_rownames(var = "tag")
#
res.ca <-
FactoMineR::CA(contingency.table, graph = FALSE)
# tibble
tags.biplot <-
tibble::tibble(
type = "tag",
x = res.ca$row$coord[, 1],
y = res.ca$row$coord[, 2],
label = rownames(contingency.table)) %>%
dplyr::bind_rows(
tibble::tibble(
type = "cluster",
x = res.ca$col$coord[, 1],
y = res.ca$col$coord[, 2],
label = colnames(contingency.table))
)
tags.biplot %>%
plotly::plot_ly(x =~x, y =~y) %>%
plotly::add_markers(color = ~type,
colors = RColorBrewer::brewer.pal(3, "Set1")[1:2]) %>%
plotly::add_text(text = ~label, textposition = "top center") %>%
plotly::layout(showlegend = FALSE)
factoextra::fviz_ca_biplot(
res.ca,
font.family = "HiraKakuProN-W3"
)
好みの日本酒を呑みたい! ?さけのわデータで探す自分好みの酒??
好みの日本酒を呑みたい! ?さけのわデータで探す自分好みの酒??
wordclouds <-
brand_tags %>%
tidyr::unnest(cols = tagIds) %>%
dplyr::inner_join(
brands.cluster,
by = c("brandId" = "brandId")
) %>%
dplyr::inner_join(tags, by = c("tagIds" = "id")) %>%
#
dplyr::group_by(cluster, tag) %>%
dplyr::count() %>%
#
dplyr::group_by(cluster) %>%
dplyr::arrange(cluster, desc(n)) %>%
tidyr::nest() %>%
dplyr::mutate(fig = purrr::map(
data,
wordcloud2::wordcloud2, size = 0.8, minSize = 10
))
radars$fig[[1]] wordclouds$fig[[1]]
radars$fig[[4]] wordclouds$fig[[4]]
radars$fig[[2]] wordclouds$fig[[2]]
radars$fig[[6]] wordclouds$fig[[6]]
radars$fig[[3]] wordclouds$fig[[3]]
radars$fig[[5]] wordclouds$fig[[5]]
好みの日本酒を呑みたい! ?さけのわデータで探す自分好みの酒??
好みの日本酒を呑みたい! ?さけのわデータで探す自分好みの酒??
好みの日本酒を呑みたい! ?さけのわデータで探す自分好みの酒??

More Related Content

What's hot (20)

ようやく分かった!最尤推定とベイズ推定
ようやく分かった!最尤推定とベイズ推定ようやく分かった!最尤推定とベイズ推定
ようやく分かった!最尤推定とベイズ推定
Akira Masuda
?
渡辺澄夫著「ベイズ統計の理論と方法」5.1 マルコフ連鎖モンテカルロ法
渡辺澄夫著「ベイズ統計の理論と方法」5.1 マルコフ連鎖モンテカルロ法渡辺澄夫著「ベイズ統計の理論と方法」5.1 マルコフ連鎖モンテカルロ法
渡辺澄夫著「ベイズ統計の理論と方法」5.1 マルコフ連鎖モンテカルロ法
Kenichi Hironaka
?
R Markdownによるドキュメント生成と バージョン管理入門
R Markdownによるドキュメント生成と バージョン管理入門R Markdownによるドキュメント生成と バージョン管理入門
R Markdownによるドキュメント生成と バージョン管理入門
nocchi_airport
?
厂迟补苍コードの书き方 中级编
厂迟补苍コードの书き方 中级编厂迟补苍コードの书き方 中级编
厂迟补苍コードの书き方 中级编
Hiroshi Shimizu
?
正準相関分析
正準相関分析正準相関分析
正準相関分析
Akisato Kimura
?
「3.1.2最小二乗法の幾何学」PRML勉強会4 @筑波大学 #prml学ぼう
「3.1.2最小二乗法の幾何学」PRML勉強会4 @筑波大学 #prml学ぼう 「3.1.2最小二乗法の幾何学」PRML勉強会4 @筑波大学 #prml学ぼう
「3.1.2最小二乗法の幾何学」PRML勉強会4 @筑波大学 #prml学ぼう
Junpei Tsuji
?
変分推论法(変分ベイズ法)(笔搁惭尝第10章)
変分推论法(変分ベイズ法)(笔搁惭尝第10章)変分推论法(変分ベイズ法)(笔搁惭尝第10章)
変分推论法(変分ベイズ法)(笔搁惭尝第10章)
Takao Yamanaka
?
厂迟补苍超初心者入门
厂迟补苍超初心者入门厂迟补苍超初心者入门
厂迟补苍超初心者入门
Hiroshi Shimizu
?
机械学习のためのベイズ最适化入门
机械学习のためのベイズ最适化入门机械学习のためのベイズ最适化入门
机械学习のためのベイズ最适化入门
hoxo_m
?
『予测にいかす统计モデリングの基本』の売上データの分析をトレースしてみた
『予测にいかす统计モデリングの基本』の売上データの分析をトレースしてみた『予测にいかす统计モデリングの基本』の売上データの分析をトレースしてみた
『予测にいかす统计モデリングの基本』の売上データの分析をトレースしてみた
. .
?
统计的学习の基础冲3章
统计的学习の基础冲3章统计的学习の基础冲3章
统计的学习の基础冲3章
Shoichi Taguchi
?
负の二项分布について
负の二项分布について负の二项分布について
负の二项分布について
Hiroshi Shimizu
?
パターン認識と機械学習 §6.2 カーネル関数の構成
パターン認識と機械学習 §6.2 カーネル関数の構成パターン認識と機械学習 §6.2 カーネル関数の構成
パターン認識と機械学習 §6.2 カーネル関数の構成
Prunus 1350
?
基礎からのベイズ統計学 輪読会資料 第4章 メトロポリス?ヘイスティングス法
基礎からのベイズ統計学 輪読会資料 第4章 メトロポリス?ヘイスティングス法基礎からのベイズ統計学 輪読会資料 第4章 メトロポリス?ヘイスティングス法
基礎からのベイズ統計学 輪読会資料 第4章 メトロポリス?ヘイスティングス法
Ken'ichi Matsui
?
劣微分
劣微分劣微分
劣微分
ShintaUrakami
?
笔颁滨でプレプリでレジレポの件について
笔颁滨でプレプリでレジレポの件について笔颁滨でプレプリでレジレポの件について
笔颁滨でプレプリでレジレポの件について
Yuki Yamada
?
クラシックな機械学習の入門 3. 線形回帰および識別
クラシックな機械学習の入門 3. 線形回帰および識別クラシックな機械学習の入門 3. 線形回帰および識別
クラシックな機械学習の入門 3. 線形回帰および識別
Hiroshi Nakagawa
?
搁で计量时系列分析~颁搁础狈パッケージ総ざらい~
搁で计量时系列分析~颁搁础狈パッケージ総ざらい~ 搁で计量时系列分析~颁搁础狈パッケージ総ざらい~
搁で计量时系列分析~颁搁础狈パッケージ総ざらい~
Takashi J OZAKI
?
3分でわかる多项分布とディリクレ分布
3分でわかる多项分布とディリクレ分布3分でわかる多项分布とディリクレ分布
3分でわかる多项分布とディリクレ分布
Junya Saito
?
統計的学習の基礎 第2章後半
統計的学習の基礎 第2章後半統計的学習の基礎 第2章後半
統計的学習の基礎 第2章後半
Prunus 1350
?
ようやく分かった!最尤推定とベイズ推定
ようやく分かった!最尤推定とベイズ推定ようやく分かった!最尤推定とベイズ推定
ようやく分かった!最尤推定とベイズ推定
Akira Masuda
?
渡辺澄夫著「ベイズ統計の理論と方法」5.1 マルコフ連鎖モンテカルロ法
渡辺澄夫著「ベイズ統計の理論と方法」5.1 マルコフ連鎖モンテカルロ法渡辺澄夫著「ベイズ統計の理論と方法」5.1 マルコフ連鎖モンテカルロ法
渡辺澄夫著「ベイズ統計の理論と方法」5.1 マルコフ連鎖モンテカルロ法
Kenichi Hironaka
?
R Markdownによるドキュメント生成と バージョン管理入門
R Markdownによるドキュメント生成と バージョン管理入門R Markdownによるドキュメント生成と バージョン管理入門
R Markdownによるドキュメント生成と バージョン管理入門
nocchi_airport
?
厂迟补苍コードの书き方 中级编
厂迟补苍コードの书き方 中级编厂迟补苍コードの书き方 中级编
厂迟补苍コードの书き方 中级编
Hiroshi Shimizu
?
「3.1.2最小二乗法の幾何学」PRML勉強会4 @筑波大学 #prml学ぼう
「3.1.2最小二乗法の幾何学」PRML勉強会4 @筑波大学 #prml学ぼう 「3.1.2最小二乗法の幾何学」PRML勉強会4 @筑波大学 #prml学ぼう
「3.1.2最小二乗法の幾何学」PRML勉強会4 @筑波大学 #prml学ぼう
Junpei Tsuji
?
変分推论法(変分ベイズ法)(笔搁惭尝第10章)
変分推论法(変分ベイズ法)(笔搁惭尝第10章)変分推论法(変分ベイズ法)(笔搁惭尝第10章)
変分推论法(変分ベイズ法)(笔搁惭尝第10章)
Takao Yamanaka
?
厂迟补苍超初心者入门
厂迟补苍超初心者入门厂迟补苍超初心者入门
厂迟补苍超初心者入门
Hiroshi Shimizu
?
机械学习のためのベイズ最适化入门
机械学习のためのベイズ最适化入门机械学习のためのベイズ最适化入门
机械学习のためのベイズ最适化入门
hoxo_m
?
『予测にいかす统计モデリングの基本』の売上データの分析をトレースしてみた
『予测にいかす统计モデリングの基本』の売上データの分析をトレースしてみた『予测にいかす统计モデリングの基本』の売上データの分析をトレースしてみた
『予测にいかす统计モデリングの基本』の売上データの分析をトレースしてみた
. .
?
统计的学习の基础冲3章
统计的学习の基础冲3章统计的学习の基础冲3章
统计的学习の基础冲3章
Shoichi Taguchi
?
负の二项分布について
负の二项分布について负の二项分布について
负の二项分布について
Hiroshi Shimizu
?
パターン認識と機械学習 §6.2 カーネル関数の構成
パターン認識と機械学習 §6.2 カーネル関数の構成パターン認識と機械学習 §6.2 カーネル関数の構成
パターン認識と機械学習 §6.2 カーネル関数の構成
Prunus 1350
?
基礎からのベイズ統計学 輪読会資料 第4章 メトロポリス?ヘイスティングス法
基礎からのベイズ統計学 輪読会資料 第4章 メトロポリス?ヘイスティングス法基礎からのベイズ統計学 輪読会資料 第4章 メトロポリス?ヘイスティングス法
基礎からのベイズ統計学 輪読会資料 第4章 メトロポリス?ヘイスティングス法
Ken'ichi Matsui
?
笔颁滨でプレプリでレジレポの件について
笔颁滨でプレプリでレジレポの件について笔颁滨でプレプリでレジレポの件について
笔颁滨でプレプリでレジレポの件について
Yuki Yamada
?
クラシックな機械学習の入門 3. 線形回帰および識別
クラシックな機械学習の入門 3. 線形回帰および識別クラシックな機械学習の入門 3. 線形回帰および識別
クラシックな機械学習の入門 3. 線形回帰および識別
Hiroshi Nakagawa
?
搁で计量时系列分析~颁搁础狈パッケージ総ざらい~
搁で计量时系列分析~颁搁础狈パッケージ総ざらい~ 搁で计量时系列分析~颁搁础狈パッケージ総ざらい~
搁で计量时系列分析~颁搁础狈パッケージ総ざらい~
Takashi J OZAKI
?
3分でわかる多项分布とディリクレ分布
3分でわかる多项分布とディリクレ分布3分でわかる多项分布とディリクレ分布
3分でわかる多项分布とディリクレ分布
Junya Saito
?
統計的学習の基礎 第2章後半
統計的学習の基礎 第2章後半統計的学習の基礎 第2章後半
統計的学習の基礎 第2章後半
Prunus 1350
?

Similar to 好みの日本酒を呑みたい! ?さけのわデータで探す自分好みの酒?? (20)

令和から本気出す
令和から本気出す令和から本気出す
令和から本気出す
Takashi Kitano
?
Your Custom WordPress Admin Pages Suck
Your Custom WordPress Admin Pages SuckYour Custom WordPress Admin Pages Suck
Your Custom WordPress Admin Pages Suck
Anthony Montalbano
?
RubyBarCamp “Полезные gems и plugins”
RubyBarCamp “Полезные gems и plugins”RubyBarCamp “Полезные gems и plugins”
RubyBarCamp “Полезные gems и plugins”
apostlion
?
Getting started with Rails (4), Season 2
Getting started with Rails (4), Season 2Getting started with Rails (4), Season 2
Getting started with Rails (4), Season 2
RORLAB
?
Юрий Буянов ?Squeryl — ORM с человеческим лицом?
Юрий Буянов ?Squeryl — ORM с человеческим лицом?Юрий Буянов ?Squeryl — ORM с человеческим лицом?
Юрий Буянов ?Squeryl — ORM с человеческим лицом?
e-Legion
?
Sass Essentials
Sass EssentialsSass Essentials
Sass Essentials
romiguelangel
?
Action View Form Helpers - 1, Season 2
Action View Form Helpers - 1, Season 2Action View Form Helpers - 1, Season 2
Action View Form Helpers - 1, Season 2
RORLAB
?
Dart : one language to rule them all - MixIT 2013
Dart : one language to rule them all - MixIT 2013Dart : one language to rule them all - MixIT 2013
Dart : one language to rule them all - MixIT 2013
Sébastien Deleuze
?
AngularJS vs. Ember.js vs. Backbone.js
AngularJS vs. Ember.js vs. Backbone.jsAngularJS vs. Ember.js vs. Backbone.js
AngularJS vs. Ember.js vs. Backbone.js
Mark
?
JQuery In Rails
JQuery In RailsJQuery In Rails
JQuery In Rails
Louie Zhao
?
Intro to Rails ActiveRecord
Intro to Rails ActiveRecordIntro to Rails ActiveRecord
Intro to Rails ActiveRecord
Mark Menard
?
Produce nice outputs for graphical, tabular and textual reporting in R-Report...
Produce nice outputs for graphical, tabular and textual reporting in R-Report...Produce nice outputs for graphical, tabular and textual reporting in R-Report...
Produce nice outputs for graphical, tabular and textual reporting in R-Report...
Dr. Volkan OBAN
?
Engines: Team Development on Rails (2005)
Engines: Team Development on Rails (2005)Engines: Team Development on Rails (2005)
Engines: Team Development on Rails (2005)
lazyatom
?
2019 WIA - Data-Driven Product Improvements
2019 WIA - Data-Driven Product Improvements2019 WIA - Data-Driven Product Improvements
2019 WIA - Data-Driven Product Improvements
Women in Analytics Conference
?
Improving state of M2 front-end - Magento 2 Community Project
Improving state of M2 front-end - Magento 2 Community ProjectImproving state of M2 front-end - Magento 2 Community Project
Improving state of M2 front-end - Magento 2 Community Project
Bartek Igielski
?
Lectuer html2
Lectuer  html2Lectuer  html2
Lectuer html2
Nawal Alragawi
?
Twitter bootstrap on rails
Twitter bootstrap on railsTwitter bootstrap on rails
Twitter bootstrap on rails
Masakuni Kato
?
Jquery presentation
Jquery presentationJquery presentation
Jquery presentation
guest5d87aa6
?
Making Templatetags Suck Less
Making Templatetags Suck LessMaking Templatetags Suck Less
Making Templatetags Suck Less
Alex Gaynor
?
Tags
TagsTags
Tags
Zecran Francis
?
Your Custom WordPress Admin Pages Suck
Your Custom WordPress Admin Pages SuckYour Custom WordPress Admin Pages Suck
Your Custom WordPress Admin Pages Suck
Anthony Montalbano
?
RubyBarCamp “Полезные gems и plugins”
RubyBarCamp “Полезные gems и plugins”RubyBarCamp “Полезные gems и plugins”
RubyBarCamp “Полезные gems и plugins”
apostlion
?
Getting started with Rails (4), Season 2
Getting started with Rails (4), Season 2Getting started with Rails (4), Season 2
Getting started with Rails (4), Season 2
RORLAB
?
Юрий Буянов ?Squeryl — ORM с человеческим лицом?
Юрий Буянов ?Squeryl — ORM с человеческим лицом?Юрий Буянов ?Squeryl — ORM с человеческим лицом?
Юрий Буянов ?Squeryl — ORM с человеческим лицом?
e-Legion
?
Action View Form Helpers - 1, Season 2
Action View Form Helpers - 1, Season 2Action View Form Helpers - 1, Season 2
Action View Form Helpers - 1, Season 2
RORLAB
?
Dart : one language to rule them all - MixIT 2013
Dart : one language to rule them all - MixIT 2013Dart : one language to rule them all - MixIT 2013
Dart : one language to rule them all - MixIT 2013
Sébastien Deleuze
?
AngularJS vs. Ember.js vs. Backbone.js
AngularJS vs. Ember.js vs. Backbone.jsAngularJS vs. Ember.js vs. Backbone.js
AngularJS vs. Ember.js vs. Backbone.js
Mark
?
Intro to Rails ActiveRecord
Intro to Rails ActiveRecordIntro to Rails ActiveRecord
Intro to Rails ActiveRecord
Mark Menard
?
Produce nice outputs for graphical, tabular and textual reporting in R-Report...
Produce nice outputs for graphical, tabular and textual reporting in R-Report...Produce nice outputs for graphical, tabular and textual reporting in R-Report...
Produce nice outputs for graphical, tabular and textual reporting in R-Report...
Dr. Volkan OBAN
?
Engines: Team Development on Rails (2005)
Engines: Team Development on Rails (2005)Engines: Team Development on Rails (2005)
Engines: Team Development on Rails (2005)
lazyatom
?
Improving state of M2 front-end - Magento 2 Community Project
Improving state of M2 front-end - Magento 2 Community ProjectImproving state of M2 front-end - Magento 2 Community Project
Improving state of M2 front-end - Magento 2 Community Project
Bartek Igielski
?
Twitter bootstrap on rails
Twitter bootstrap on railsTwitter bootstrap on rails
Twitter bootstrap on rails
Masakuni Kato
?
Making Templatetags Suck Less
Making Templatetags Suck LessMaking Templatetags Suck Less
Making Templatetags Suck Less
Alex Gaynor
?

More from Takashi Kitano (11)

调蝉丑颈苍测皑と调濒别补蹿濒别迟皑による地図アプリ开発罢颈辫蝉
调蝉丑颈苍测皑と调濒别补蹿濒别迟皑による地図アプリ开発罢颈辫蝉调蝉丑颈苍测皑と调濒别补蹿濒别迟皑による地図アプリ开発罢颈辫蝉
调蝉丑颈苍测皑と调濒别补蹿濒别迟皑による地図アプリ开発罢颈辫蝉
Takashi Kitano
?
20170923 excelユーサ?ーのためのr入門
20170923 excelユーサ?ーのためのr入門20170923 excelユーサ?ーのためのr入門
20170923 excelユーサ?ーのためのr入門
Takashi Kitano
?
尘虫苍别迟で顽张る深层学习
尘虫苍别迟で顽张る深层学习尘虫苍别迟で顽张る深层学习
尘虫苍别迟で顽张る深层学习
Takashi Kitano
?
可視化周辺の進化がヤヴァイ ?2016?
可視化周辺の進化がヤヴァイ ?2016?可視化周辺の進化がヤヴァイ ?2016?
可視化周辺の進化がヤヴァイ ?2016?
Takashi Kitano
?
搁によるウイスキー分析
搁によるウイスキー分析搁によるウイスキー分析
搁によるウイスキー分析
Takashi Kitano
?
20160311 基礎からのヘ?イス?統計学輪読会第6章 公開ver
20160311 基礎からのヘ?イス?統計学輪読会第6章 公開ver20160311 基礎からのヘ?イス?統計学輪読会第6章 公開ver
20160311 基礎からのヘ?イス?統計学輪読会第6章 公開ver
Takashi Kitano
?
20140625 rて?のテ?ータ分析(仮) for_tokyor
20140625 rて?のテ?ータ分析(仮) for_tokyor20140625 rて?のテ?ータ分析(仮) for_tokyor
20140625 rて?のテ?ータ分析(仮) for_tokyor
Takashi Kitano
?
濒耻产谤颈诲补迟别パッケージ入门
濒耻产谤颈诲补迟别パッケージ入门濒耻产谤颈诲补迟别パッケージ入门
濒耻产谤颈诲补迟别パッケージ入门
Takashi Kitano
?
20150329 tokyo r47
20150329 tokyo r4720150329 tokyo r47
20150329 tokyo r47
Takashi Kitano
?
20140920 tokyo r43
20140920 tokyo r4320140920 tokyo r43
20140920 tokyo r43
Takashi Kitano
?
Google's r style guideのすゝめ
Google's r style guideのすゝめGoogle's r style guideのすゝめ
Google's r style guideのすゝめ
Takashi Kitano
?
调蝉丑颈苍测皑と调濒别补蹿濒别迟皑による地図アプリ开発罢颈辫蝉
调蝉丑颈苍测皑と调濒别补蹿濒别迟皑による地図アプリ开発罢颈辫蝉调蝉丑颈苍测皑と调濒别补蹿濒别迟皑による地図アプリ开発罢颈辫蝉
调蝉丑颈苍测皑と调濒别补蹿濒别迟皑による地図アプリ开発罢颈辫蝉
Takashi Kitano
?
20170923 excelユーサ?ーのためのr入門
20170923 excelユーサ?ーのためのr入門20170923 excelユーサ?ーのためのr入門
20170923 excelユーサ?ーのためのr入門
Takashi Kitano
?
尘虫苍别迟で顽张る深层学习
尘虫苍别迟で顽张る深层学习尘虫苍别迟で顽张る深层学习
尘虫苍别迟で顽张る深层学习
Takashi Kitano
?
可視化周辺の進化がヤヴァイ ?2016?
可視化周辺の進化がヤヴァイ ?2016?可視化周辺の進化がヤヴァイ ?2016?
可視化周辺の進化がヤヴァイ ?2016?
Takashi Kitano
?
搁によるウイスキー分析
搁によるウイスキー分析搁によるウイスキー分析
搁によるウイスキー分析
Takashi Kitano
?
20160311 基礎からのヘ?イス?統計学輪読会第6章 公開ver
20160311 基礎からのヘ?イス?統計学輪読会第6章 公開ver20160311 基礎からのヘ?イス?統計学輪読会第6章 公開ver
20160311 基礎からのヘ?イス?統計学輪読会第6章 公開ver
Takashi Kitano
?
20140625 rて?のテ?ータ分析(仮) for_tokyor
20140625 rて?のテ?ータ分析(仮) for_tokyor20140625 rて?のテ?ータ分析(仮) for_tokyor
20140625 rて?のテ?ータ分析(仮) for_tokyor
Takashi Kitano
?
濒耻产谤颈诲补迟别パッケージ入门
濒耻产谤颈诲补迟别パッケージ入门濒耻产谤颈诲补迟别パッケージ入门
濒耻产谤颈诲补迟别パッケージ入门
Takashi Kitano
?
Google's r style guideのすゝめ
Google's r style guideのすゝめGoogle's r style guideのすゝめ
Google's r style guideのすゝめ
Takashi Kitano
?

Recently uploaded (20)

Optimizing Common Table Expressions in Apache Hive with Calcite
Optimizing Common Table Expressions in Apache Hive with CalciteOptimizing Common Table Expressions in Apache Hive with Calcite
Optimizing Common Table Expressions in Apache Hive with Calcite
Stamatis Zampetakis
?
Plant Disease Prediction with Image Classification using CNN.pdf
Plant Disease Prediction with Image Classification using CNN.pdfPlant Disease Prediction with Image Classification using CNN.pdf
Plant Disease Prediction with Image Classification using CNN.pdf
Theekshana Wanniarachchi
?
19th Edition Of International Research Data Analysis Excellence Awards
19th Edition Of International Research Data Analysis Excellence Awards19th Edition Of International Research Data Analysis Excellence Awards
19th Edition Of International Research Data Analysis Excellence Awards
dataanalysisconferen
?
Valkey 101 - SCaLE 22x March 2025 Stokes.pdf
Valkey 101 - SCaLE 22x March 2025 Stokes.pdfValkey 101 - SCaLE 22x March 2025 Stokes.pdf
Valkey 101 - SCaLE 22x March 2025 Stokes.pdf
Dave Stokes
?
?????__Cubase Pro Crack Full Activativated 2025
?????__Cubase Pro Crack Full Activativated 2025?????__Cubase Pro Crack Full Activativated 2025
?????__Cubase Pro Crack Full Activativated 2025
abrishhayat858
?
狠狠撸 perkenalan dengan dasar MongoDB-query
狠狠撸 perkenalan dengan dasar MongoDB-query狠狠撸 perkenalan dengan dasar MongoDB-query
狠狠撸 perkenalan dengan dasar MongoDB-query
amazaza49
?
MTC Supply Chain Management Strategy.pptx
MTC Supply Chain Management Strategy.pptxMTC Supply Chain Management Strategy.pptx
MTC Supply Chain Management Strategy.pptx
Rakshit Porwal
?
Cost sheet. with basics and formats of sheet
Cost sheet. with basics and formats of sheetCost sheet. with basics and formats of sheet
Cost sheet. with basics and formats of sheet
supreetk82004
?
Lesson 6- Data Visualization and Reporting.pptx
Lesson 6- Data Visualization and Reporting.pptxLesson 6- Data Visualization and Reporting.pptx
Lesson 6- Data Visualization and Reporting.pptx
1045858
?
Updated Willow 2025 Media Deck_280225 Updated.pdf
Updated Willow 2025 Media Deck_280225 Updated.pdfUpdated Willow 2025 Media Deck_280225 Updated.pdf
Updated Willow 2025 Media Deck_280225 Updated.pdf
tangramcommunication
?
netapp storage se pres RAID-TEC-v2.2.pptx
netapp storage se pres RAID-TEC-v2.2.pptxnetapp storage se pres RAID-TEC-v2.2.pptx
netapp storage se pres RAID-TEC-v2.2.pptx
yonggiseo1
?
Data Privacy presentation for companies.pptx
Data Privacy presentation for companies.pptxData Privacy presentation for companies.pptx
Data Privacy presentation for companies.pptx
harmardir
?
Episode_10_-_The_Art_of_Rhetoric (1).pptx
Episode_10_-_The_Art_of_Rhetoric (1).pptxEpisode_10_-_The_Art_of_Rhetoric (1).pptx
Episode_10_-_The_Art_of_Rhetoric (1).pptx
addelynngue5115
?
HIRE MUYERN TRUST HACKER FOR AUTHENTIC CYBER SERVICES
HIRE MUYERN TRUST HACKER FOR AUTHENTIC CYBER SERVICESHIRE MUYERN TRUST HACKER FOR AUTHENTIC CYBER SERVICES
HIRE MUYERN TRUST HACKER FOR AUTHENTIC CYBER SERVICES
anastasiapenova16
?
Enhanced_Industry_4.0_in_Infrastructure (2).pptx
Enhanced_Industry_4.0_in_Infrastructure (2).pptxEnhanced_Industry_4.0_in_Infrastructure (2).pptx
Enhanced_Industry_4.0_in_Infrastructure (2).pptx
axtonmartin10
?
Herding behavior Experimental Studies --AlisonLo
Herding behavior Experimental Studies --AlisonLoHerding behavior Experimental Studies --AlisonLo
Herding behavior Experimental Studies --AlisonLo
AlisonKL
?
The Marketability of Rice Straw Yarn Among Selected Customers of Gantsilyo Guru
The Marketability of Rice Straw Yarn Among Selected Customers of Gantsilyo GuruThe Marketability of Rice Straw Yarn Among Selected Customers of Gantsilyo Guru
The Marketability of Rice Straw Yarn Among Selected Customers of Gantsilyo Guru
kenyoncenteno12
?
vnptloveeeeeeeeeeeeeeeeeeeeeeeeeeee.pptx
vnptloveeeeeeeeeeeeeeeeeeeeeeeeeeee.pptxvnptloveeeeeeeeeeeeeeeeeeeeeeeeeeee.pptx
vnptloveeeeeeeeeeeeeeeeeeeeeeeeeeee.pptx
deomom129
?
2024 Archive - Zsolt Nemeth web archivum
2024 Archive - Zsolt Nemeth web archivum2024 Archive - Zsolt Nemeth web archivum
2024 Archive - Zsolt Nemeth web archivum
Zsolt Nemeth
?
When Models Meet Data: From ancient science to todays Artificial Intelligence...
When Models Meet Data: From ancient science to todays Artificial Intelligence...When Models Meet Data: From ancient science to todays Artificial Intelligence...
When Models Meet Data: From ancient science to todays Artificial Intelligence...
ssuserbbbef4
?
Optimizing Common Table Expressions in Apache Hive with Calcite
Optimizing Common Table Expressions in Apache Hive with CalciteOptimizing Common Table Expressions in Apache Hive with Calcite
Optimizing Common Table Expressions in Apache Hive with Calcite
Stamatis Zampetakis
?
Plant Disease Prediction with Image Classification using CNN.pdf
Plant Disease Prediction with Image Classification using CNN.pdfPlant Disease Prediction with Image Classification using CNN.pdf
Plant Disease Prediction with Image Classification using CNN.pdf
Theekshana Wanniarachchi
?
19th Edition Of International Research Data Analysis Excellence Awards
19th Edition Of International Research Data Analysis Excellence Awards19th Edition Of International Research Data Analysis Excellence Awards
19th Edition Of International Research Data Analysis Excellence Awards
dataanalysisconferen
?
Valkey 101 - SCaLE 22x March 2025 Stokes.pdf
Valkey 101 - SCaLE 22x March 2025 Stokes.pdfValkey 101 - SCaLE 22x March 2025 Stokes.pdf
Valkey 101 - SCaLE 22x March 2025 Stokes.pdf
Dave Stokes
?
?????__Cubase Pro Crack Full Activativated 2025
?????__Cubase Pro Crack Full Activativated 2025?????__Cubase Pro Crack Full Activativated 2025
?????__Cubase Pro Crack Full Activativated 2025
abrishhayat858
?
狠狠撸 perkenalan dengan dasar MongoDB-query
狠狠撸 perkenalan dengan dasar MongoDB-query狠狠撸 perkenalan dengan dasar MongoDB-query
狠狠撸 perkenalan dengan dasar MongoDB-query
amazaza49
?
MTC Supply Chain Management Strategy.pptx
MTC Supply Chain Management Strategy.pptxMTC Supply Chain Management Strategy.pptx
MTC Supply Chain Management Strategy.pptx
Rakshit Porwal
?
Cost sheet. with basics and formats of sheet
Cost sheet. with basics and formats of sheetCost sheet. with basics and formats of sheet
Cost sheet. with basics and formats of sheet
supreetk82004
?
Lesson 6- Data Visualization and Reporting.pptx
Lesson 6- Data Visualization and Reporting.pptxLesson 6- Data Visualization and Reporting.pptx
Lesson 6- Data Visualization and Reporting.pptx
1045858
?
Updated Willow 2025 Media Deck_280225 Updated.pdf
Updated Willow 2025 Media Deck_280225 Updated.pdfUpdated Willow 2025 Media Deck_280225 Updated.pdf
Updated Willow 2025 Media Deck_280225 Updated.pdf
tangramcommunication
?
netapp storage se pres RAID-TEC-v2.2.pptx
netapp storage se pres RAID-TEC-v2.2.pptxnetapp storage se pres RAID-TEC-v2.2.pptx
netapp storage se pres RAID-TEC-v2.2.pptx
yonggiseo1
?
Data Privacy presentation for companies.pptx
Data Privacy presentation for companies.pptxData Privacy presentation for companies.pptx
Data Privacy presentation for companies.pptx
harmardir
?
Episode_10_-_The_Art_of_Rhetoric (1).pptx
Episode_10_-_The_Art_of_Rhetoric (1).pptxEpisode_10_-_The_Art_of_Rhetoric (1).pptx
Episode_10_-_The_Art_of_Rhetoric (1).pptx
addelynngue5115
?
HIRE MUYERN TRUST HACKER FOR AUTHENTIC CYBER SERVICES
HIRE MUYERN TRUST HACKER FOR AUTHENTIC CYBER SERVICESHIRE MUYERN TRUST HACKER FOR AUTHENTIC CYBER SERVICES
HIRE MUYERN TRUST HACKER FOR AUTHENTIC CYBER SERVICES
anastasiapenova16
?
Enhanced_Industry_4.0_in_Infrastructure (2).pptx
Enhanced_Industry_4.0_in_Infrastructure (2).pptxEnhanced_Industry_4.0_in_Infrastructure (2).pptx
Enhanced_Industry_4.0_in_Infrastructure (2).pptx
axtonmartin10
?
Herding behavior Experimental Studies --AlisonLo
Herding behavior Experimental Studies --AlisonLoHerding behavior Experimental Studies --AlisonLo
Herding behavior Experimental Studies --AlisonLo
AlisonKL
?
The Marketability of Rice Straw Yarn Among Selected Customers of Gantsilyo Guru
The Marketability of Rice Straw Yarn Among Selected Customers of Gantsilyo GuruThe Marketability of Rice Straw Yarn Among Selected Customers of Gantsilyo Guru
The Marketability of Rice Straw Yarn Among Selected Customers of Gantsilyo Guru
kenyoncenteno12
?
vnptloveeeeeeeeeeeeeeeeeeeeeeeeeeee.pptx
vnptloveeeeeeeeeeeeeeeeeeeeeeeeeeee.pptxvnptloveeeeeeeeeeeeeeeeeeeeeeeeeeee.pptx
vnptloveeeeeeeeeeeeeeeeeeeeeeeeeeee.pptx
deomom129
?
2024 Archive - Zsolt Nemeth web archivum
2024 Archive - Zsolt Nemeth web archivum2024 Archive - Zsolt Nemeth web archivum
2024 Archive - Zsolt Nemeth web archivum
Zsolt Nemeth
?
When Models Meet Data: From ancient science to todays Artificial Intelligence...
When Models Meet Data: From ancient science to todays Artificial Intelligence...When Models Meet Data: From ancient science to todays Artificial Intelligence...
When Models Meet Data: From ancient science to todays Artificial Intelligence...
ssuserbbbef4
?

好みの日本酒を呑みたい! ?さけのわデータで探す自分好みの酒??