Statistic<- c(68,85,74,88,63,78,90,80,58,63)
Math <- c(85,91,74,100,82,84,78,100,51,70)
plot(Statistic, Math,
pch = 19,
col = "#1AFD9C")

hist(Statistic,
col= "#FF95CA",
main = "班上的統計成績",
Xlab = "統計成績",
ylab = "次數")
## Warning in plot.window(xlim, ylim, log, ...): "Xlab" is not a graphical
## parameter
## Warning in title(main = main, sub = sub, xlab = xlab, ylab = ylab, ...): "Xlab"
## is not a graphical parameter
## Warning in axis(1, ...): "Xlab" is not a graphical parameter
## Warning in axis(2, at = yt, ...): "Xlab" is not a graphical parameter

categories <- c("公益活動", "科學創新", "體育競技", "知識閱讀", "娛樂休閒")
counts <- c(1, 2, 3, 4, 5)
barplot(counts,
names.arg = categories,
main = "長條圖",
col = "#2894FF",
ylab = "次數")

data <- data.frame(社團類型 = c("知識閱讀", "娛樂休閒", "體育競技", "公益活動", "科學創新"),
次數 = c(36, 82, 185, 25, 28))
my_colors <- c("#CCFF80", "#FF5151", "#0072E3", "#81C0C0", "#A6FFFF")
pie(data$次數,labels = data$社團類型,main = "社團類型次數分配圓餅圖",col = my_colors)

plot(counts, type="h", lwd=11, col="#9999CC",
main="棒棒糖圖",
xlab="類別", ylab="頻數")
points(counts, pch=18, col="#743A3A")
axis(1, at=1:length(categories), labels=categories)

data <- read.csv("table1_1.csv")
japanese_data <- data$Japanese
mean(japanese_data)
## [1] 67.9
median(japanese_data)
## [1] 62
sd(japanese_data)
## [1] 16.25115
var(japanese_data)
## [1] 264.1
quantile(japanese_data, 0.25)
## 25%
## 54.5