RESEARCH SCENARIO 1

A restaurant sells three kinds of desserts: chocolate cake, vanilla cheesecake, and tiramisu. If all three desserts are selling equally, then the restaurant owner will keep all three desserts on the menu. However, if some desserts are less popular than others, she would like to remove those items so she can increase her profits. Analyze the data from the restaurant to determine if the actual distribution of the dessert preference matches the expected distribution.

Hypotheses

H0 (Null Hypotheses): The observed frequencies matches the expected frequencies. H1 (Alternate Hypotheses): The observed frequencies does not match the expected frequencies.

Result

A Chi-Square Goodness-of-Fit Test was conducted to determine whether dessert type preference (Cheesecake, ChocoCake, Tiramisu) was different from an equal distribution (33.33%, 33.33%, 33.33%) among 548 participants. There was a statistically significant difference in dessert type preferences, χ²(2, N = 548) = 9.67, p < .001.Participants preferred ChocoCake more than Cheesecake or tiramisu. The effect size was moderate (Cohen’s W = 0.31).

library(readxl)
datasetrq1 <- read_excel("C:/Users/kodal/Desktop/Assignment4/RQ1.xlsx")
observed <- table(datasetrq1$Dessert)
print(observed)
## 
## Cheesecake  ChocoCake   Tiramisu 
##        171        258        119
names(observed)
## [1] "Cheesecake" "ChocoCake"  "Tiramisu"
expected <- c(1/3, 1/3, 1/3)
chisq_gfit <- chisq.test(observed, p = expected)
print(chisq_gfit)
## 
##  Chi-squared test for given probabilities
## 
## data:  observed
## X-squared = 54.004, df = 2, p-value = 1.876e-12
 W <- sqrt(chisq_gfit$statistic / sum(observed))
 W
## X-squared 
## 0.3139217