Halo, para pembaca. Disini saya mencoba untuk menganalisis chat WA. Saya belajar disini.
Saya disini menggunakan chat grup apip. Apip sendiri adalah sekelompok mahasiswa nomaden yang kini sudah lulus. Berikut merupakan membernya.
Load Package
Pertama kita muat package yang dibutuhkan.
library(tidyverse)
library(emo)
library(ggalt)
library(lubridate)
Mendapatkan dataset dan memuat dataset
Dataset Chat WA dapat didapatkan dengan mengeksport chat tersebut pada aplikasi WA, data tersebut akan berbentuk .txt.
read raw data hasil eksport chat.
apipchats_raw<-
read_lines("apip.txt")
Berikut raw data tersebut.
glimpse(apipchats_raw)
## chr [1:23803] "07/09/18 11.25 - Pesan dan panggilan terenkripsi secara end-to-end. Tidak seorang pun di luar chat ini yang dap"| __truncated__ ...
head(apipchats_raw)
## [1] "07/09/18 11.25 - Pesan dan panggilan terenkripsi secara end-to-end. Tidak seorang pun di luar chat ini yang dapat membaca atau mendengarkannya, bahkan WhatsApp. Ketuk untuk info selengkapnya."
## [2] "07/09/18 11.25 - <U+200E>+62 857-7374-4605 telah membuat grup \"Apip\""
## [3] "07/09/18 11.31 - <U+200E>Mate Asep telah menambahkan Mate Hamdan dan Mate Icad"
## [4] "07/09/18 12.01 - Mate Icad: Anjay apa ini wkwk"
## [5] "07/09/18 17.17 - <U+200E>Mate Icad telah menambahkan Mate Jamil"
## [6] "07/09/18 17.20 - <U+200E>Mate Icad telah menambahkan Mate Irham"
Selanjutnya dari dirubah supaya berubah menjadi suatu dataframe.
# Merubah data menjadi berbentuk dataframe (baru menjadi satu kolom) ----
apipchats_raw %>%
enframe(name = NULL, value = "content")
## # A tibble: 23,803 x 1
## content
## <chr>
## 1 "07/09/18 11.25 - Pesan dan panggilan terenkripsi secara end-to-end. Tidak s~
## 2 "07/09/18 11.25 - <U+200E>+62 857-7374-4605 telah membuat grup \"Apip\""
## 3 "07/09/18 11.31 - <U+200E>Mate Asep telah menambahkan Mate Hamdan dan Mate Icad"
## 4 "07/09/18 12.01 - Mate Icad: Anjay apa ini wkwk"
## 5 "07/09/18 17.17 - <U+200E>Mate Icad telah menambahkan Mate Jamil"
## 6 "07/09/18 17.20 - <U+200E>Mate Icad telah menambahkan Mate Irham"
## 7 "07/09/18 18.00 - <U+200E>Mate Icad telah menambahkan +62 878-8179-3146"
## 8 "07/09/18 21.16 - <U+200E>+62 857-7374-4605 telah menambahkan Mate Odg"
## 9 "07/09/18 21.19 - <U+200E>+62 857-7374-4605 telah menambahkan Mate Rg"
## 10 "08/09/18 13.48 - Mate Odg: Di apip tinggaleun calana di keresekan"
## # ... with 23,793 more rows
# Memisah antara tanggal dan pesan ----
apipchats_raw %>%
enframe(name = NULL, value = "content")%>%
separate(
content,
into = c("datetime", "content"),
sep = "(?<=\\d{2}/\\d{2}/\\d{2} \\d{2}.\\d{2}) - ",
fill = "left"
)
## # A tibble: 23,803 x 2
## datetime content
## <chr> <chr>
## 1 07/09/18 11.~ "Pesan dan panggilan terenkripsi secara end-to-end. Tidak seor~
## 2 07/09/18 11.~ "<U+200E>+62 857-7374-4605 telah membuat grup \"Apip\""
## 3 07/09/18 11.~ "<U+200E>Mate Asep telah menambahkan Mate Hamdan dan Mate Icad"
## 4 07/09/18 12.~ "Mate Icad: Anjay apa ini wkwk"
## 5 07/09/18 17.~ "<U+200E>Mate Icad telah menambahkan Mate Jamil"
## 6 07/09/18 17.~ "<U+200E>Mate Icad telah menambahkan Mate Irham"
## 7 07/09/18 18.~ "<U+200E>Mate Icad telah menambahkan +62 878-8179-3146"
## 8 07/09/18 21.~ "<U+200E>+62 857-7374-4605 telah menambahkan Mate Odg"
## 9 07/09/18 21.~ "<U+200E>+62 857-7374-4605 telah menambahkan Mate Rg"
## 10 08/09/18 13.~ "Mate Odg: Di apip tinggaleun calana di keresekan"
## # ... with 23,793 more rows
# Menambah kolom banyaknya baris chat ----
apipchats_raw %>%
enframe(name = NULL, value = "content")%>%
separate(
content,
into = c("datetime", "content"),
sep = "(?<=\\d{2}/\\d{2}/\\d{2} \\d{2}.\\d{2}) - ",
fill = "left"
) %>%
mutate(
chatid = case_when(
!is.na(datetime) ~ row_number(),
TRUE ~ NA_integer_
)
) %>%
fill(chatid, datetime) %>%
group_by(chatid) %>%
summarise(
datetime = unique(datetime),
content = paste0(content, collapse = "\n"),
n_lines = n()
)
## `summarise()` ungrouping output (override with `.groups` argument)
## # A tibble: 22,168 x 4
## chatid datetime content n_lines
## <int> <chr> <chr> <int>
## 1 1 07/09/18 11~ "Pesan dan panggilan terenkripsi secara end-to-e~ 1
## 2 2 07/09/18 11~ "<U+200E>+62 857-7374-4605 telah membuat grup \"Apip\"" 1
## 3 3 07/09/18 11~ "<U+200E>Mate Asep telah menambahkan Mate Hamdan dan Ma~ 1
## 4 4 07/09/18 12~ "Mate Icad: Anjay apa ini wkwk" 1
## 5 5 07/09/18 17~ "<U+200E>Mate Icad telah menambahkan Mate Jamil" 1
## 6 6 07/09/18 17~ "<U+200E>Mate Icad telah menambahkan Mate Irham" 1
## 7 7 07/09/18 18~ "<U+200E>Mate Icad telah menambahkan +62 878-8179-3146" 1
## 8 8 07/09/18 21~ "<U+200E>+62 857-7374-4605 telah menambahkan Mate Odg" 1
## 9 9 07/09/18 21~ "<U+200E>+62 857-7374-4605 telah menambahkan Mate Rg" 1
## 10 10 08/09/18 13~ "Mate Odg: Di apip tinggaleun calana di kereseka~ 1
## # ... with 22,158 more rows
# Memisah antara pesan dan pengirimnya
apipchats_raw %>%
enframe(name = NULL, value = "content")%>%
separate(
content,
into = c("datetime", "content"),
sep = "(?<=\\d{2}/\\d{2}/\\d{2} \\d{2}.\\d{2}) - ",
fill = "left"
) %>%
mutate(
chatid = case_when(
!is.na(datetime) ~ row_number(),
TRUE ~ NA_integer_
)
) %>%
fill(chatid, datetime) %>%
group_by(chatid) %>%
summarise(
datetime = unique(datetime),
content = paste0(content, collapse = "\n"),
n_lines = n()
) %>%
ungroup() %>%
filter(str_detect(content, ":")) %>%
separate(
content,
into = c("author", "text"),
sep = ": ",
extra = "merge"
)
## `summarise()` ungrouping output (override with `.groups` argument)
## # A tibble: 22,117 x 5
## chatid datetime author text n_lines
## <int> <chr> <chr> <chr> <int>
## 1 4 07/09/18 12.~ Mate Icad Anjay apa ini wkwk 1
## 2 10 08/09/18 13.~ Mate Odg Di apip tinggaleun calana di keresek~ 1
## 3 11 08/09/18 13.~ Mate Odg Jngn dibuang ya 1
## 4 12 08/09/18 14.~ Mate Icad Euh udah dang 1
## 5 13 08/09/18 18.~ Mate Jamil Boys ada yg punya uang dlu ga? Ini t~ 1
## 6 14 08/09/18 18.~ Mate Jamil Bisa tolong beliin dlu 1
## 7 15 08/09/18 18.~ Mate Irham Pareum listrik meureun mil 1
## 8 16 08/09/18 18.~ Mate Irham Kumaha meuli toket teh saya teu apal~ 1
## 9 17 08/09/18 18.~ Mate Irham Sabarahaeun?? 1
## 10 18 08/09/18 18.~ Mate Jamil Beak token iyeumah bosq 1
## # ... with 22,107 more rows
# Merubah tanggal menjadi bntuk waktu (tanggal-blan-tahun jam:menit:detik)
apipchats_raw %>%
enframe(name = NULL, value = "content")%>%
separate(
content,
into = c("datetime", "content"),
sep = "(?<=\\d{2}/\\d{2}/\\d{2} \\d{2}.\\d{2}) - ",
fill = "left"
) %>%
mutate(
chatid = case_when(
!is.na(datetime) ~ row_number(),
TRUE ~ NA_integer_
)
) %>%
fill(chatid, datetime) %>%
group_by(chatid) %>%
summarise(
datetime = unique(datetime),
content = paste0(content, collapse = "\n"),
n_lines = n()
) %>%
ungroup() %>%
filter(str_detect(content, ":")) %>%
separate(
content,
into = c("author", "text"),
sep = ": ",
extra = "merge"
) %>%
mutate(
datetime = dmy_hm(datetime)
)
## `summarise()` ungrouping output (override with `.groups` argument)
## # A tibble: 22,117 x 5
## chatid datetime author text n_lines
## <int> <dttm> <chr> <chr> <int>
## 1 4 2018-09-07 12:01:00 Mate Icad Anjay apa ini wkwk 1
## 2 10 2018-09-08 13:48:00 Mate Odg Di apip tinggaleun calana di ke~ 1
## 3 11 2018-09-08 13:48:00 Mate Odg Jngn dibuang ya 1
## 4 12 2018-09-08 14:10:00 Mate Icad Euh udah dang 1
## 5 13 2018-09-08 18:30:00 Mate Jam~ Boys ada yg punya uang dlu ga? ~ 1
## 6 14 2018-09-08 18:30:00 Mate Jam~ Bisa tolong beliin dlu 1
## 7 15 2018-09-08 18:32:00 Mate Irh~ Pareum listrik meureun mil 1
## 8 16 2018-09-08 18:32:00 Mate Irh~ Kumaha meuli toket teh saya teu~ 1
## 9 17 2018-09-08 18:33:00 Mate Irh~ Sabarahaeun?? 1
## 10 18 2018-09-08 18:33:00 Mate Jam~ Beak token iyeumah bosq 1
## # ... with 22,107 more rows
apipwachats <-
apipchats_raw %>%
enframe(name = NULL, value = "content")%>%
separate(
content,
into = c("datetime", "content"),
sep = "(?<=\\d{2}/\\d{2}/\\d{2} \\d{2}.\\d{2}) - ",
fill = "left"
) %>%
mutate(
chatid = case_when(
!is.na(datetime) ~ row_number(),
TRUE ~ NA_integer_
)
) %>%
fill(chatid, datetime) %>%
group_by(chatid) %>%
summarise(
datetime = unique(datetime),
content = paste0(content, collapse = "\n"),
n_lines = n()
) %>%
ungroup() %>%
filter(str_detect(content, ":")) %>%
separate(
content,
into = c("author", "text"),
sep = ": ",
extra = "merge"
) %>%
mutate(
datetime = dmy_hm(datetime)
)
## `summarise()` ungrouping output (override with `.groups` argument)
glimpse(apipwachats)
## Rows: 22,117
## Columns: 5
## $ chatid <int> 4, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 24, 25,...
## $ datetime <dttm> 2018-09-07 12:01:00, 2018-09-08 13:48:00, 2018-09-08 13:4...
## $ author <chr> "Mate Icad", "Mate Odg", "Mate Odg", "Mate Icad", "Mate Ja...
## $ text <chr> "Anjay apa ini wkwk", "Di apip tinggaleun calana di kerese...
## $ n_lines <int> 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 3, 1, 1, 1, 1, 1, 1, 1...
Kemudian dari dataframe tersebut dibuat beberapa variabel penunjang lainnya. Seprtinya banyaknya karakter dll. Namun sebelumnya dibuat dulu fungsi untuk menghitung trsebut.
n_words <- textfeatures:::n_words
n_digits <- textfeatures:::n_digits
n_nonasciis <- textfeatures:::n_nonasciis
n_hashtags <- textfeatures:::n_hashtags
n_mentions <- textfeatures:::n_mentions
n_commas <- textfeatures:::n_commas
n_periods <- textfeatures:::n_periods
n_exclaims <- textfeatures:::n_exclaims
n_caps <- textfeatures:::n_caps
n_lowers <- textfeatures:::n_lowers
n_urls <- textfeatures:::n_urls
n_puncts <- textfeatures:::n_puncts
apipchats_features <-
apipwachats %>%
mutate(
year=year(datetime),
month= month(datetime),
tanggal = day(datetime),
hour = hour(datetime),
day = wday(datetime, week_start = 1),
any_media = str_detect(text, "<Media omitted>"),
any_emoji = emo::ji_detect(text),
emoji = emo::ji_extract_all(text),
n_emojis = emo::ji_count(text),
n_chars = nchar(text),
n_words = n_words(text),
n_nonasciis = n_nonasciis(text),
n_digits = n_digits(text),
n_hashtags = n_hashtags(text),
n_mentions = n_mentions(text),
n_commas = n_commas(text),
n_periods = n_periods(text),
n_exclaims = n_exclaims(text),
n_caps = n_caps(text),
n_lowers = n_lowers(text),
n_urls = n_urls(text),
n_puncts = n_puncts(text)
) %>%
relocate(n_lines, .before = n_emojis) %>%
mutate(
across(
starts_with("n_"),
~ if_else(text == "<Media omitted>", NA_integer_, .x)
)
)
glimpse(apipchats_features)
## Rows: 22,117
## Columns: 27
## $ chatid <int> 4, 10, 11, 12, 13, 14, 15, 16, 17, 18, 19, 20, 21, 24, ...
## $ datetime <dttm> 2018-09-07 12:01:00, 2018-09-08 13:48:00, 2018-09-08 1...
## $ author <chr> "Mate Icad", "Mate Odg", "Mate Odg", "Mate Icad", "Mate...
## $ text <chr> "Anjay apa ini wkwk", "Di apip tinggaleun calana di ker...
## $ year <dbl> 2018, 2018, 2018, 2018, 2018, 2018, 2018, 2018, 2018, 2...
## $ month <dbl> 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9, 9...
## $ tanggal <int> 7, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8, 8...
## $ hour <int> 12, 13, 13, 14, 18, 18, 18, 18, 18, 18, 18, 18, 18, 18,...
## $ day <dbl> 5, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6...
## $ any_media <lgl> FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE,...
## $ any_emoji <lgl> FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE, FALSE,...
## $ emoji <list> [<>, <>, <>, <>, <>, <>, <>, <>, <>, <>, <>, <>, <>, <...
## $ n_lines <int> 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 3, 1, 1, 1, 1, 1, 1...
## $ n_emojis <int> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0...
## $ n_chars <int> 18, 38, 15, 13, 45, 22, 26, 40, 13, 23, 9, 20, 53, 24, ...
## $ n_words <int> 4, 6, 3, 3, 10, 4, 4, 8, 1, 4, 2, 5, 10, 3, 8, 3, 6, 4,...
## $ n_nonasciis <int> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0...
## $ n_digits <int> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 2, 0, 0, 0, 0, 0, 0, 0, 0...
## $ n_hashtags <int> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0...
## $ n_mentions <int> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0...
## $ n_commas <int> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0...
## $ n_periods <int> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0...
## $ n_exclaims <int> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0...
## $ n_caps <int> 1, 1, 1, 1, 2, 1, 1, 1, 1, 1, 1, 1, 2, 1, 1, 1, 1, 1, 1...
## $ n_lowers <int> 14, 32, 12, 10, 33, 18, 22, 32, 10, 19, 4, 15, 40, 19, ...
## $ n_urls <int> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0...
## $ n_puncts <int> 0, 0, 0, 0, 1, 0, 0, 0, 2, 0, 0, 0, 0, 2, 0, 0, 0, 0, 0...
Berikut visualisasi banyaknya chat WA grup apip dari hari ke hari.
apipchats_features %>%
group_by(year)%>%
count(
date = as.Date(datetime)
)%>%
ggplot(aes(x = date, y = n)) +
geom_line(aes(colour = year))+
labs(title = "Banyaknya Chat Grup Apip\nBerdasarkan Waktu per hari",
subtitle = "alima55555",
caption = "By : Arwan Zhagi")+
xlab("Datetime")+
ylab("Banyaknya Percakapan")+
theme(plot.title =
element_text(color = "blue",
size = 22,
face = "bold", hjust = 0.5),
plot.subtitle =
element_text(size = 10,
face = "bold")
) +
facet_grid(. ~ year, scales = "free_x", switch = "x") +
scale_x_date(date_labels = "%b", position = "bottom")
Pada Grafik tersebut terlihat sesuatu yang cukup menarik, yaitu hari dimana intensitas komunikasi (chat) di grup apip sedang sangat tinggi.
Berikut tabel dari urutan banyaknya chat apip (berdasarkan tahun):
apipchats_features %>%
group_by(year) %>%
count(date = as.Date(datetime)) %>%
arrange(desc(n)) %>%
group_split()
## <list_of<
## tbl_df<
## year: double
## date: date
## n : integer
## >
## >[4]>
## [[1]]
## # A tibble: 113 x 3
## year date n
## <dbl> <date> <int>
## 1 2018 2018-12-20 329
## 2 2018 2018-10-21 134
## 3 2018 2018-11-15 125
## 4 2018 2018-11-19 123
## 5 2018 2018-10-28 89
## 6 2018 2018-12-22 84
## 7 2018 2018-12-24 70
## 8 2018 2018-12-31 69
## 9 2018 2018-11-26 55
## 10 2018 2018-12-12 54
## # ... with 103 more rows
##
## [[2]]
## # A tibble: 269 x 3
## year date n
## <dbl> <date> <int>
## 1 2019 2019-05-04 211
## 2 2019 2019-06-09 188
## 3 2019 2019-08-18 179
## 4 2019 2019-08-16 165
## 5 2019 2019-04-17 164
## 6 2019 2019-06-05 155
## 7 2019 2019-06-13 142
## 8 2019 2019-09-13 141
## 9 2019 2019-06-20 130
## 10 2019 2019-11-09 129
## # ... with 259 more rows
##
## [[3]]
## # A tibble: 227 x 3
## year date n
## <dbl> <date> <int>
## 1 2020 2020-02-25 288
## 2 2020 2020-02-23 286
## 3 2020 2020-03-24 259
## 4 2020 2020-02-02 256
## 5 2020 2020-03-11 247
## 6 2020 2020-02-22 195
## 7 2020 2020-01-30 181
## 8 2020 2020-05-19 169
## 9 2020 2020-03-23 154
## 10 2020 2020-06-26 150
## # ... with 217 more rows
##
## [[4]]
## # A tibble: 13 x 3
## year date n
## <dbl> <date> <int>
## 1 2021 2021-03-07 39
## 2 2021 2021-01-06 36
## 3 2021 2021-03-15 29
## 4 2021 2021-01-10 13
## 5 2021 2021-03-13 12
## 6 2021 2021-02-09 8
## 7 2021 2021-01-08 7
## 8 2021 2021-03-23 6
## 9 2021 2021-03-03 4
## 10 2021 2021-03-04 3
## 11 2021 2021-01-05 1
## 12 2021 2021-01-31 1
## 13 2021 2021-03-05 1
Pada tahun 2018 terlihat intensitas chat sangat tinggi pada 2018-12-20 dengan banayaknya percakapan sebanyak 329 kali. Kita lihat siapa saja yang aktif pada saat itu.
apipchats_features %>%
filter( year == 2018 , month == 12 , tanggal == 20) %>%
count(author) %>%
arrange(desc(n))
## # A tibble: 12 x 2
## author n
## <chr> <int>
## 1 Mate Hamdan 99
## 2 Mate Icad 80
## 3 Mate AB 54
## 4 Mate Mpur 37
## 5 Mate Adi 24
## 6 Mate Jamil 9
## 7 Mate Acul 7
## 8 Arwan Zhagi 6
## 9 Mate Fajar 4
## 10 Mate Odg 4
## 11 Mate Santo 4
## 12 Mate Asep 1
Kita lihat intensitas percakapan pada tanggal tersebut setiap jamnya. Berikur visualisasinya.
apipchats_features %>%
filter( year == 2018 , month == 12 , tanggal == 20) %>%
select(datetime,author, text) %>%
mutate(datetime = as.POSIXct(datetime))%>%
ggplot(aes(x = datetime)) +
geom_freqpoly(binwidth = 3600)+
scale_x_datetime(date_breaks = "1 hours", date_labels = "%H ")+
labs(title = "Banyaknya Chat Grup Apip\nPada 20 Desember 2018",
subtitle = "Berdasarkan jam",
caption = "By : Arwan Zhagi")+
xlab("Waktu (dalam Jam)")+
ylab("N")+
theme(plot.title =
element_text(color = "blue",
size = 22,
face = "bold", hjust = 0.5),
plot.subtitle =
element_text(size = 10,
face = "bold")
)
Ternyata Hampir dari keseluruhan percakapan terjadi pada rentang 22:00 - 00:00.
Berikut merupakan beberapa chat tersebut :
chat_2018 <- apipchats_features %>%
filter( year == 2018 , month == 12 , tanggal == 20)%>%
select(datetime,author, text)
chat_2018[22:27,]
## # A tibble: 6 x 3
## datetime author text
## <dttm> <chr> <chr>
## 1 2018-12-20 22:29:00 Mate AB Liburan atuh yu apip :(
## 2 2018-12-20 22:29:00 Mate Mpur Ga punya uang be
## 3 2018-12-20 22:29:00 Mate AB Yg murah murah :(
## 4 2018-12-20 22:30:00 Mate Odg Hayu
## 5 2018-12-20 22:30:00 Mate AB Ke ciwidey lagi kerumah acul hehehe
## 6 2018-12-20 22:30:00 Mate AB Kan murmer tuuuh
chat_2018[c(55,56,58:65),]
## # A tibble: 10 x 3
## datetime author text
## <dttm> <chr> <chr>
## 1 2018-12-20 22:39:00 Mate AB Idih kapan pur :(
## 2 2018-12-20 22:39:00 Mate Icad males ih maksa
## 3 2018-12-20 22:39:00 Mate Mpur Ai eta apdet story iy
## 4 2018-12-20 22:39:00 Mate Mpur Ig
## 5 2018-12-20 22:39:00 Mate Icad I Y WKWKWKKW
## 6 2018-12-20 22:39:00 Mate AB Makan eta mah pur bukan jaln jalan :(
## 7 2018-12-20 22:39:00 Mate AB Lah
## 8 2018-12-20 22:40:00 Mate Icad pan sia teh jalan heula meureun sateuacan tuan~
## 9 2018-12-20 22:40:00 Mate Mpur Suka emosu
## 10 2018-12-20 22:40:00 Mate AB Ah bhay
chat_2018[68:84,]
## # A tibble: 17 x 3
## datetime author text
## <dttm> <chr> <chr>
## 1 2018-12-20 22:41:00 Mate Icad kuy daks ah liburan ke gunungggg
## 2 2018-12-20 22:41:00 Mate Hamdan Kuy
## 3 2018-12-20 22:41:00 Mate Icad guntur ah
## 4 2018-12-20 22:41:00 Mate Mpur Hayu jalan jalan ke gunung
## 5 2018-12-20 22:41:00 Mate Mpur Cus atuh
## 6 2018-12-20 22:41:00 Mate Hamdan Tapi can pernah euy
## 7 2018-12-20 22:41:00 Mate Hamdan Mendaki
## 8 2018-12-20 22:41:00 Mate Icad 23 24 25 fix libur panjang
## 9 2018-12-20 22:41:00 Mate Hamdan Gasss
## 10 2018-12-20 22:41:00 Mate AB Jangan gunung atuh
## 11 2018-12-20 22:42:00 Mate Hamdan Ada bukit yg bagus di ciwidey
## 12 2018-12-20 22:42:00 Mate AB Aku ntar ga diajak lagi :(
## 13 2018-12-20 22:42:00 Mate Icad eh gajadi dan ah asa carape ketang
## 14 2018-12-20 22:42:00 Mate Icad mau uas juga
## 15 2018-12-20 22:42:00 Mate Hamdan Oiya
## 16 2018-12-20 22:42:00 Mate AB Pesan ini telah dihapus
## 17 2018-12-20 22:42:00 Mate Mpur Dan mau sidang spm
chat_2018[94:107,]
## # A tibble: 14 x 3
## datetime author text
## <dttm> <chr> <chr>
## 1 2018-12-20 22:43:00 Mate Hamdan Pantai?
## 2 2018-12-20 22:43:00 Mate Icad kuy ah
## 3 2018-12-20 22:43:00 Mate Mpur Ciwidey ?
## 4 2018-12-20 22:43:00 Mate Mpur Garut ?
## 5 2018-12-20 22:43:00 Mate Icad 23 24 25 pantai aja
## 6 2018-12-20 22:43:00 Mate Icad garuddd
## 7 2018-12-20 22:43:00 Mate Icad fix yaaak
## 8 2018-12-20 22:43:00 Mate Hamdan Klo pantai mau ga
## 9 2018-12-20 22:43:00 Mate AB Kuyyyys
## 10 2018-12-20 22:43:00 Mate Hamdan Pur
## 11 2018-12-20 22:43:00 Mate Mpur Hayu dan
## 12 2018-12-20 22:43:00 Mate Icad eh lupa ada uas tanggal 26 nya
## 13 2018-12-20 22:43:00 Mate Mpur Eh tapi ada varkom dan
## 14 2018-12-20 22:43:00 Mate Icad terus asa carape juga ketang
Pokok na mah tuluy lah kos kitu, pusing aya loba.
chat_2018[216:217,]
## # A tibble: 2 x 3
## datetime author text
## <dttm> <chr> <chr>
## 1 2018-12-20 22:56:00 Mate Ham~ "List yang ikut :\n1. Icad\n2. Hamdan koor\n3. ~
## 2 2018-12-20 22:57:00 Mate AB "Hayuu"
chat_2018[270:286,]
## # A tibble: 17 x 3
## datetime author text
## <dttm> <chr> <chr>
## 1 2018-12-20 23:01:00 Mate Hamdan Fix ga ikut be??
## 2 2018-12-20 23:01:00 Mate AB Ikut
## 3 2018-12-20 23:01:00 Mate Hamdan Jag?
## 4 2018-12-20 23:02:00 Mate Hamdan MAIN AJA SANA JAUH-JAUH
## 5 2018-12-20 23:02:00 Mate Icad MAIN AJA SANA JAUH-JAUH
## 6 2018-12-20 23:02:00 Mate Mpur MAIN AJA SANA JAUH JAUH
## 7 2018-12-20 23:02:00 Mate Jamil MAIN AJA SANA JAUH JAUH
## 8 2018-12-20 23:02:00 Mate Odg Berisik
## 9 2018-12-20 23:02:00 Mate Hamdan Wahahahahahahahahhahahahaha
## 10 2018-12-20 23:02:00 Mate AB Pasti
## 11 2018-12-20 23:02:00 Mate Icad MAIN AJA SANA JAUH-JAUH
## 12 2018-12-20 23:02:00 Mate Hamdan Hiyahiyahiya
## 13 2018-12-20 23:02:00 Mate Santo Wehehehehe
## 14 2018-12-20 23:03:00 Mate Hamdan Waen we cing jauh be sorangan
## 15 2018-12-20 23:03:00 Mate Icad ih daripada chat ga puguh gini
## 16 2018-12-20 23:03:00 Mate Icad mending main yuk ah
## 17 2018-12-20 23:03:00 Mate Hamdan Terimakasih kawan2 :)
Pokokna mah chat apip loba mun ngabahas liburan, ngan mun 2019 chat na loba oge mun ngabahas percaian.