# create dummy data
data <- data.frame(
  name=c("小蔡","小徐","小陳","小高","小朱") ,  
  value=c(89,77,81,75,83)
  )

# Uniform color
barplot(height=data$value, names=data$name, 
        col=rgb(0.7,0.7,0.8,0.8),
        xlab="name", 
        ylab="score", 
        main="English Quiz", 
        ylim=c(0,100)
        )

# Create data for the graph.
x <- c(35, 25, 15, 15)
labels <- c("cat", "dog", "mouse", "rabbit")

# Plot the chart.
pie(x,labels)

# Library
library(tidyverse)
## ── Attaching core tidyverse packages ──────────────────────── tidyverse 2.0.0 ──
## ✔ dplyr     1.1.4     ✔ readr     2.1.5
## ✔ forcats   1.0.0     ✔ stringr   1.5.1
## ✔ ggplot2   3.5.2     ✔ tibble    3.2.1
## ✔ lubridate 1.9.4     ✔ tidyr     1.3.1
## ✔ purrr     1.0.4     
## ── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
## ✖ dplyr::filter() masks stats::filter()
## ✖ dplyr::lag()    masks stats::lag()
## ℹ Use the conflicted package (<http://conflicted.r-lib.org/>) to force all conflicts to become errors
# Create data
data <- data.frame(
  x=LETTERS[1:26],
  y=abs(rnorm(26))
)
 
# plot
ggplot(data, aes(x=x, y=y)) +
  geom_segment( aes(x=x, xend=x, y=0, yend=y)) +
  geom_point( size=5, color="red", fill=alpha("orange", 0.3), alpha=0.7, shape=21, stroke=2) 

we <- c(50,40,70,65,55)
hist(we,
     col= "lightblue",
     main ="班上的體重與身高",
     xlab ="體重",
     ylab ="次數")