Statisti <- c(68,85,74,88,63,78,90,80,58,63)
Math <- c(85,91,74,100,82,84,78,100,51,70)
color <- c("purple", 
            "pink")

plot(Statisti, Math,
     pch = 19,
     col = color)

hist(Math, 
     freq = FALSE,    
     main = "統計數學成績",
     xlab = "Math",
     col = "purple")

# Load ggplot2
library(ggplot2)

# Create data
data <- data.frame(
  name=c("娛樂休閒","知識閱讀","體育競技","科學創新","公益活動") ,  
  value=c(185,82,36,28,25)
  )

# Barplot
ggplot(data, aes(x=name, y=value)) + 
  geom_bar(stat = "identity") +
  coord_flip()

# Create Data
Prop <- c(185,82,36,28,25)

# Make the default Pie Plot
pie(Prop , labels = c("娛樂休閒","知識閱讀","體育競技","科學創新","公益活動"))

# Libraries
library(ggplot2)

# Create data

# Plot
ggplot(data, aes(x=name, y=value)) +
   geom_point( size=5, color="purple", fill=alpha("lightblue", 0.3), alpha=0.7, shape=21, stroke=2)  + 
  geom_segment( aes(x=name, xend=name, y=0
                    , yend=value))

library(readxl)

library(readr)

Data <- read.csv("D:/table1_1.csv")
Data
##      Name Statistic Math Japanese Management Accounting
## 1  張青松        68   85       84         89         86
## 2  王奕翔        85   91       63         76         66
## 3  田新雨        74   74       61         80         69
## 4  徐麗娜        88  100       49         71         66
## 5  張志傑        63   82       89         78         80
## 6  趙穎睿        78   84       51         60         60
## 7  王智強        90   78       59         72         66
## 8  宋媛婷        80  100       53         73         70
## 9  袁四方        58   51       79         91         85
## 10 張建國        63   70       91         85         82