Email: sofianicklaus21@gmail.com
RPubs: https://rpubs.com/sofia3484
Dalam proyek ini saya memberikan anda dataset insurance.csv, informasi lanjut mengenai data ini dapat anda baca di Kaggle.
Tugas kalian adalah sebagai berikut:
Jawaban
## Warning: package 'readxl' was built under R version 3.6.3
## Warning: package 'dplyr' was built under R version 3.6.3
##
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
##
## filter, lag
## The following objects are masked from 'package:base':
##
## intersect, setdiff, setequal, union
## Warning: package 'ggplot2' was built under R version 3.6.3
## Warning: package 'plotly' was built under R version 3.6.3
##
## Attaching package: 'plotly'
## The following object is masked from 'package:ggplot2':
##
## last_plot
## The following object is masked from 'package:stats':
##
## filter
## The following object is masked from 'package:graphics':
##
## layout
## Warning: package 'hrbrthemes' was built under R version 3.6.3
## NOTE: Either Arial Narrow or Roboto Condensed fonts are required to use these themes.
## Please use hrbrthemes::import_roboto_condensed() to install Roboto Condensed and
## if Arial Narrow is not on your system, please see https://bit.ly/arialnarrow
## Warning: package 'corrplot' was built under R version 3.6.3
## corrplot 0.84 loaded
## Warning: package 'DT' was built under R version 3.6.3
## Warning: package 'Metrics' was built under R version 3.6.3
Variabel dari asuransi:
usia: Usia penerima premi
Jenis kelamin: Jenis kelamin penerima asuransi, yaitu, perempuan dan laki-laki
bmi: Indeks massa tubuh
anak-anak: Jumlah anak yang dilindungi oleh asuransi kesehatan / Jumlah tanggungan
perokok: merokok
Wilayah: wilayah pemukiman penerima asuransi di AS, timur laut, tenggara, barat daya, barat laut.
Biaya: Biaya medis individu yang ditagih oleh asuransi kesehatan
## 'data.frame': 1338 obs. of 7 variables:
## $ age : int 19 18 28 33 32 31 46 37 37 60 ...
## $ sex : Factor w/ 2 levels "female","male": 1 2 2 2 2 1 1 1 2 1 ...
## $ bmi : num 27.9 33.8 33 22.7 28.9 ...
## $ children: int 0 1 3 0 0 0 1 3 2 0 ...
## $ smoker : Factor w/ 2 levels "no","yes": 2 1 1 1 1 1 1 1 1 1 ...
## $ region : Factor w/ 4 levels "northeast","northwest",..: 4 3 3 2 2 3 3 2 1 2 ...
## $ charges : num 16885 1726 4449 21984 3867 ...
Hasil data frame menghasilkan bahwa data age merupakan integer, sex merupakan tipe faktor, bmi merupakan tipe data numerik, children merupakan tipe data integer, smoker merupakan tipe data faktor, region merupakan tipe data faktor, dan charges merupakan tipe data number.
## age sex bmi children smoker region charges
## 0 0 0 0 0 0 0
Tidak ada data yang hilang
age <- select(insurance,age)
sex <- as.numeric(insurance$sex)
bmi <- select(insurance, bmi)
children <- as.numeric(insurance$children)
smoker <- as.numeric(insurance$smoker)
region <- as.character(insurance$region)
charges <- select(insurance, charges)
new_ins <- data.frame(age, sex, bmi, children, smoker, region, charges)Tipe data sex, children dan smoker diubah menjadi tipe data numerik.
Pada data sex:
* 1 = Wanita (Female)
* 2 = Pria (Male)
Pada data smoker:
1 = Tidak merokok (No)
2 = Merokok (yes)
## `summarise()` ungrouping output (override with `.groups` argument)
## # A tibble: 6 x 2
## age total
## <int> <int>
## 1 18 69
## 2 19 68
## 3 20 29
## 4 21 28
## 5 22 28
## 6 23 28
g1 <- ggplot(insurance, aes(age))+ geom_histogram(fill = "#56B4E9",colour="blue",alpha = 0.5, binwidth = 4)+ggtitle("Histogram of Age")
g1 + theme(plot.background = element_rect(fill = "#BFD5E3"))+ theme(panel.background = element_rect(fill = "white"))Dari histogram di atas, banyaknya individu yang ditagih oleh asuransi kesehatan berumur 18-19 tahun.
## `summarise()` ungrouping output (override with `.groups` argument)
## # A tibble: 2 x 2
## sex total
## <fct> <int>
## 1 female 662
## 2 male 676
Gender wanita yang ditagih oleh asuransi kesehatan ada sebanyak 662 orang dan gender pria ada sebanyak 676 orang.
# Presentase Sex
group_sex <- group_sex %>%
mutate(prop = total / sum(group_sex$total))
group_sex$label <- c("50.5%","49.5%")
mycols <- c("#D291BC", "#FEC8D8")
ggplot(group_sex , aes(x="", y = prop, fill = sex))+
geom_bar(stat="identity", color="white")+
coord_polar(theta="y", start=0)+
geom_text(aes(y = cumsum(prop) - prop/2, label=label), color="white")+
scale_fill_manual(values = mycols) +
theme_void() +
ggtitle("Pie Chart Sex")Dari pie chart di atas, didapatkan bahwa proporsi wanita yang ditagih oleh asuransi kesehatan ada 49.5%. Sedangkan, proporsi pria ada sebanyak 50.5%.
## `summarise()` ungrouping output (override with `.groups` argument)
## # A tibble: 4 x 3
## region total prop
## <fct> <int> <dbl>
## 1 northeast 324 24.2
## 2 northwest 325 24.3
## 3 southeast 364 27.2
## 4 southwest 325 24.3
Individu yang ditagih oleh asuransi kesehatan yang berasal dari northeast sebanyak 324 orang, northwest sebanyak 325 orang, southeast sebanyak 364 orang, dan southwest sebanyak 325 orang.
group_region$label <- c("24.290%","27.205%","24.290%","24.215%")
mycols <- c("#0073C2FF", "#EFC000FF", "#868686FF", "#CD534CFF")
ggplot(group_region , aes(x="", y = prop, fill = region))+
geom_bar(stat="identity", color="white")+
coord_polar(theta="y", start=0)+
geom_text_repel(aes(y = cumsum(prop) - prop/2, label=label), color="white")+
scale_fill_manual(values = mycols) +
theme_void()+
ggtitle("Pie Chart Region")Dari pie chart di atas, individu yang ditagih oleh asuransi kesehatan yang berasal dari northeast ada sebanyak 24.215%, northwest ada sebanyak 24.29%, southeast ada sebanyak 27.20478%, dan southwest ada sebanyak 24,289%. Terlihat distribusi di atas hampir rata.
Pada kali ini, data bmi akan dikategorikan menjadi tiga, yaitu:
< 18,5 = Underweight
18.5 - 24.8 = Normal Weight
24.9 - 29.8 = Overweight
lebih dari sama dengan 29.9 = Obese
new_ins_bmi <- mutate(insurance, Weight_Status = ifelse(insurance$bmi < 18.5, "Underweight", ifelse(insurance$bmi< 24.9,"Normal Weight", ifelse(insurance$bmi< 29.9,"Overweight","Obese"))))
new_ins_bmi <- new_ins_bmi %>%
group_by(Weight_Status)%>%
summarise(total=n())## `summarise()` ungrouping output (override with `.groups` argument)
## # A tibble: 4 x 2
## Weight_Status total
## <chr> <int>
## 1 Normal Weight 222
## 2 Obese 719
## 3 Overweight 377
## 4 Underweight 20
BMI dari individu yang ditagih oleh asuransi kesehatan yaitu normal weight ada sebanyak 222 orang, obese ada sebanyak 719 orang, overweight ada sebanyak 377 orang, dan underweight ada sebanyak 20 orang.
new_ins_bmi <- new_ins_bmi %>%
mutate(prop = total / sum(new_ins_bmi$total)) %>%
arrange(desc(Weight_Status))new_ins_bmi$label <- scales::percent(new_ins_bmi$prop)
mycols <- c("#770f05", "#35455D", "#F1C5AE", "#ff6961")
ggplot(new_ins_bmi , aes(x="", y = prop, fill = Weight_Status))+
geom_bar(stat="identity", color="white")+
coord_polar(theta="y", start=0)+
geom_text_repel(aes(y = cumsum(prop) - prop/2, label=label), color="white")+
scale_fill_manual(values = mycols) +
theme_void()+
ggtitle("Pie Chart of Status of Weight")Dari pie chart di atas, bmi dari individu yang ditagih oleh asuransi kesehatan yang underweight ada sebanyak 1%, normal weight ada sebanyak 17%, overweight ada sebanyak 28%, dan obese ada sebanyak 54%.
## `summarise()` ungrouping output (override with `.groups` argument)
## # A tibble: 2 x 2
## smoker total
## <fct> <int>
## 1 no 1064
## 2 yes 274
Individu yang ditagih oleh asuransi kesehatan yang tidak merokok ada sebanyak 1064 orang dan yang merokok ada sebanyak 274 orang.
group_smoker <- group_smoker %>%
mutate(prop = total / sum(group_smoker$total)) %>%
arrange(desc(smoker))
group_smoker$label <- scales::percent(group_smoker$prop)
mycols <- c("#D291BC", "#FEC8D8")
ggplot(group_smoker , aes(x="", y = prop, fill = smoker))+
geom_bar(stat="identity", color="white")+
coord_polar(theta="y", start=0)+
geom_text(aes(y = cumsum(prop) - prop/2, label=label), color="white")+
scale_fill_manual(values = mycols) +
theme_void()+
ggtitle("Pie Chart of Smoker")DAri pie chart di atas, individu yang ditagih oleh asuransi kesehatan yang tidak merokok ada sebesar 80% dan yang merokok ada sebesar 20%.
## `summarise()` ungrouping output (override with `.groups` argument)
## # A tibble: 6 x 2
## children total
## <int> <int>
## 1 0 574
## 2 1 324
## 3 2 240
## 4 3 157
## 5 4 25
## 6 5 18
Individu yang yang ditanggung asuransi kesehatan memiliki lima anak ada sebanyak 18 orang, empat anak 25 orang, tiga anak sebanyak 157 anak, 2 anak sebanyak 240 orang, satu nanak sebanyak 324 orang, dan tidak mempunyai anak sebanyak 574 orang.
group_child <- group_child %>%
mutate(prop = total / sum(group_child$total)) %>%
arrange(desc(children))
group_child$label <- scales::percent(group_child$prop)
group_child$children <-as.factor(group_child$children)
mycols <- c("#770f05", "#35455D", "#F1C5AE", "#ff6961","#064F40","#A67E05")
ggplot(group_child , aes(x="", y = prop, fill = children))+
geom_bar(stat="identity", color="white")+
coord_polar(theta="y", start=0)+
geom_text_repel(aes(y = cumsum(prop) - prop/2, label=label), color="white")+
scale_fill_manual(values = mycols) +
theme_void()+
ggtitle("Pie Chart of How Many Children They Have")Dari pie chart, individu yang yang ditanggung asuransi kesehatan memiliki lima anak sebesar 1.35%, empat anak sebesar 1.87%, tiga anak sebesar 11.73%, dua anak sebesar 17.94%, satu anak sebesar 24.22%, tidak mempunyai anak sebesar 42.90%.
Selain itu , kami juga akan mengkategorikan biaya menjadi dua bagian yaitu:
lebih dari rata-rata biaya = High Charges
< rata-rata biaya = Low Charges
new_ins_charges <- mutate(insurance, Type_Charges = ifelse(insurance$charges > mean(insurance$charges), "High Charges", "Low Charges"))
new_ins_charges <- new_ins_charges %>%
group_by(Type_Charges) %>%
summarise(total=n())## `summarise()` ungrouping output (override with `.groups` argument)
## # A tibble: 2 x 2
## Type_Charges total
## <chr> <int>
## 1 High Charges 420
## 2 Low Charges 918
Individu yang ditanggung oleh asuransi kesehatan yang memiliki tipe high charges ada sebanyak 420 orang dan yang memiliki tipe low charges ada sebanyak 918 orang.
new_ins_charges <- new_ins_charges %>%
mutate(prop = total / sum(new_ins_charges$total)) %>%
arrange(desc(Type_Charges))
new_ins_charges$label <- scales::percent(new_ins_charges$prop)
mycols <- c("#D291BC", "#4D342A")
ggplot(new_ins_charges , aes(x="", y = prop, fill = Type_Charges))+
geom_bar(stat="identity", color="white")+
coord_polar(theta="y", start=0)+
geom_text_repel(aes(y = cumsum(prop) - prop/2, label=label), color="white")+
scale_fill_manual(values = mycols) +
theme_void()+
ggtitle("Pie Chart of Type of Charges")Dari pie chart di atas, individu yang ditanggung oleh asuransi kesehatan yang memiliki tipe high charges ada sebesar 31% dan yang memiliki tipe low charges ada sebesar 69% .
Korelasi menggunakan data new_ins dan tidak menggunakan variabel region dikarenakan pada visualisasi pie chart terlihat distribusi region hampir rata.
Dari korelasi di atas didapatkan bahwa terdapat ikatan kuat antara smoker dan charges sehingga dapat disimpukan bahwa faktor smoker atau faktor apakah orang itu merokok atau tidak , age, dan bmiberpengaruh terhadap biaya premi asuransi konsumen. Faktor sexdan children tidak memiliki pengaruh terhadap variabel charges karena hasilnya hanya 0.06 dan 0.07.
d_age <-ggplot(insurance, aes(x = charges,fill = age, group=age)) + geom_density(alpha = 0.5, adjust=1.5)+theme_ipsum()+ggtitle("Density of Age")
d_age <-d_age + theme(plot.background = element_rect(fill = "#FEF8DD"))+ theme(panel.background = element_rect(fill = "white"))
ggplotly(d_age)## Warning: `group_by_()` is deprecated as of dplyr 0.7.0.
## Please use `group_by()` instead.
## See vignette('programming') for more help
## This warning is displayed once every 8 hours.
## Call `lifecycle::last_warnings()` to see where this warning was generated.
Density di atas memberikan kita informasi bahwa ada perbedaan dalam densitas umur, maka variabel age mempengaruhi variabel charges.
d_sex <-ggplot(insurance, aes(x = charges,fill = sex, group=sex)) + geom_density(alpha = 0.5, adjust=1.5)+theme_ipsum()+ggtitle("Density of Sex")
d_sex <-d_sex + theme(plot.background = element_rect(fill = "#FFE7C7"))+ theme(panel.background = element_rect(fill = "white"))
ggplotly(d_sex)Density di atas memberikan kita informasi bahwa tidak terlalu terlihat adanya perbedaan dalam densitas sex, maka variabel sex tidak mempengaruhi variabel charges.
d_bmi <- ggplot(insurance, aes(x = charges,fill = bmi, group=bmi)) + geom_density(alpha = 0.5, adjust=1.5)+theme_ipsum()+ggtitle("Density of BMI")
d_bmi <- d_bmi + theme(plot.background = element_rect(fill = "#B7FFBF"))+ theme(panel.background = element_rect(fill = "white"))
ggplotly(d_bmi)## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.
## Warning: Groups with fewer than two data points have been dropped.