# Load packages
library(ggplot2)
library(reshape2)
# Prepare data
Year <- c(2012, 2013, 2014, 2015, 2016, 2017, 2018, 2019)
HemorrhagicGastricUlcer <- c(41.5, 39.6, 37.1, 37.0, 32.4, 31.0, 28.9, 27.9)
HemorrhagicDuodenalUlcer <- c(11.1, 10.7, 10.4, 9.8, 9.5, 10.0, 10.1, 9.8)
EsophagealVaricealBleeding <- c(5.6, 5.5, 5.3, 4.7, 4.5, 4.6, 4.7, 3.7)
ColonicDiverticularBleeding <- c(15.1, 18.6, 22.7, 25.9, 26.1, 31.1, 34.0, 34.0)
IschemicColitis <- c(20.8, 24.5, 27.4, 28.0, 31.9, 31.3, 32.7, 34.9)
RectalUlcer <- c(2.1, 2.5, 2.0, 2.3, 2.8, 2.9, 2.3, 2.6)
df <- data.frame(Year, HemorrhagicGastricUlcer, HemorrhagicDuodenalUlcer, EsophagealVaricealBleeding,
ColonicDiverticularBleeding, IschemicColitis, RectalUlcer)
# Melt data to long format
df_melted <- melt(df, id.vars = "Year", variable.name = "Disorder", value.name = "Rate_per_100k")
# Translation for labels
label_translation <- c("HemorrhagicGastricUlcer" = "Hemorrhagic gastric ulcer",
"HemorrhagicDuodenalUlcer" = "Hemorrhagic duodenal ulcer",
"EsophagealVaricealBleeding" = "Esophageal variceal bleeding",
"ColonicDiverticularBleeding" = "Colonic diverticular bleeding",
"IschemicColitis" = "Ischemic colitis",
"RectalUlcer" = "Rectal ulcer")
# Visualization
ggplot(df_melted, aes(x = Year, y = Rate_per_100k, color = Disorder)) +
geom_line() +
geom_point() +
scale_color_manual(name = "Disease",
values = c("HemorrhagicGastricUlcer" = "#377eb8",
"HemorrhagicDuodenalUlcer" = "#ff7f00",
"EsophagealVaricealBleeding" = "#4daf4a",
"ColonicDiverticularBleeding" = "#f781bf",
"IschemicColitis" = "#a65628",
"RectalUlcer" = "#984ea3"),
labels = label_translation) +
scale_x_continuous(breaks = seq(min(df$Year), max(df$Year), by = 1)) +
labs(x = "Year",
y = "Hospitalization rate per 100,000 population") +
theme_minimal()
library(tidyr)
##
## 次のパッケージを付け加えます: 'tidyr'
## 以下のオブジェクトは 'package:reshape2' からマスクされています:
##
## smiths
# データの読み込み
data <- data.frame(
AgeGroup = c("10-14", "15-19", "20-24", "25-29", "30-34", "35-39", "40-44", "45-49", "50-54",
"55-59", "60-64", "65-69", "70-74", "75-79", "80-84", "85-89", "90-94", "95-99", "≥100"),
HemorrhagicGastricUlcer = c(330, 300, 810, 1200, 2130, 3390, 5340, 9210, 12810, 20580, 30330, 37800, 38010, 43050, 48600, 39840, 20700, 5880, 930),
HemorrhagicDuodenalUlcer = c(150, 720, 1650, 1590, 2010, 2940, 3690, 4200, 4710, 7230, 7950, 9570, 9690, 10590, 11940, 9540, 5370, 1260, 180),
EsophagealVaricealBleeding = c(120, 60, 60, 90, 390, 570, 1620, 3420, 3750, 5190, 5940, 5940, 5670, 5820, 3510, 2160, 510, 60, 0),
ColonicDiverticularBleeding = c(0, 0, 0, 240, 180, 1050, 2340, 4800, 7590, 12090, 16770, 24900, 32310, 40260, 43990, 35070, 16260, 3630, 570),
IschemicColitis = c(60, 360, 1380, 2010, 2790, 4890, 7140, 10140, 12060, 15180, 20010, 29580, 35340, 39180, 40530, 30030, 15450, 3090, 690),
RectalUlcer = c(0, 30, 30, 0, 120, 120, 210, 180, 300, 420, 630, 1050, 2250, 3600, 4440, 5850, 2820, 870, 120)
)
disease_order <- c("HemorrhagicGastricUlcer", "HemorrhagicDuodenalUlcer", "EsophagealVaricealBleeding",
"ColonicDiverticularBleeding", "IschemicColitis", "RectalUlcer")
# "≥100" を最後に移動する
data$AgeGroup <- factor(data$AgeGroup, levels = c("10-14", "15-19", "20-24", "25-29", "30-34", "35-39", "40-44",
"45-49", "50-54", "55-59", "60-64", "65-69", "70-74", "75-79",
"80-84", "85-89", "90-94", "95-99", "≥100"))
# dataフレームを長い形式に変換
data_long <- pivot_longer(data, cols = -AgeGroup, names_to = "Disease", values_to = "Count")
# グラフの描画
bmj_colors <- c("HemorrhagicGastricUlcer" = "#377eb8",
"HemorrhagicDuodenalUlcer" = "#ff7f00",
"EsophagealVaricealBleeding" = "#4daf4a",
"ColonicDiverticularBleeding" = "#f781bf",
"IschemicColitis" = "#a65628",
"RectalUlcer" = "#984ea3")
# ラベルの変更
label_translation <- c("HemorrhagicGastricUlcer" = "Hemorrhagic gastric ulcer",
"HemorrhagicDuodenalUlcer" = "Hemorrhagic duodenal ulcer",
"EsophagealVaricealBleeding" = "Esophageal variceal bleeding",
"ColonicDiverticularBleeding" = "Colonic diverticular bleeding",
"IschemicColitis" = "Ischemic colitis",
"RectalUlcer" = "Rectal ulcer")
# グラフの描画
ggplot(data_long, aes(x=AgeGroup, y=Count, color=Disease, group=Disease)) +
geom_line() +
scale_color_manual(values = bmj_colors,
breaks = disease_order,
labels = c("Hemorrhagic gastric ulcer",
"Hemorrhagic duodenal ulcer",
"Esophageal variceal bleeding",
"Colonic diverticular bleeding",
"Ischemic colitis",
"Rectal ulcer")) +
scale_y_continuous(labels = scales::comma_format(scale = 1, accuracy = 1),
breaks = seq(0, max(data_long$Count), by = 20000)) +
labs(x = "Age group",
y = "Number of hospitalization",
) + # タイトルも追加できます
theme_minimal() +
theme(axis.text.x = element_text(angle = 45, hjust = 1))
胃潰瘍
# ライブラリを読み込む
library(tidyverse)
## ── Attaching core tidyverse packages ──────────────────────── tidyverse 2.0.0 ──
## ✔ dplyr 1.1.2 ✔ readr 2.1.4
## ✔ forcats 1.0.0 ✔ stringr 1.5.0
## ✔ lubridate 1.9.2 ✔ tibble 3.2.1
## ✔ purrr 1.0.1
## ── 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
# 出血性胃潰瘍データ
gastric_ulcer <- tribble(
~`Years old`, ~`2012-2015`, ~`2016-2019`, ~Overall,
"10-14", 7, 4, 11,
"15-19", 4, 6, 10,
"20-24", 18, 9, 27,
"25-29", 26, 14, 40,
"30-34", 47, 24, 71,
"35-39", 73, 40, 113,
"40-44", 108, 70, 178,
"45-49", 182, 125, 307,
"50-54", 257, 170, 427,
"55-59", 431, 255, 686,
"60-64", 631, 380, 1011,
"65-69", 715, 545, 1260,
"70-74", 686, 581, 1267,
"75-79", 802, 633, 1435,
"80-84", 869, 751, 1620,
"85-89", 708, 620, 1328,
"90-94", 362, 328, 690,
"95-99", 97, 99, 196,
"≥100", 17, 14, 31
) %>%
mutate(across(`2012-2015`:`Overall`, ~ . * 30)) # 数字を30倍する
# 年齢層を正しい順序で因子化
gastric_ulcer$`Years old` <- factor(gastric_ulcer$`Years old`, levels = unique(gastric_ulcer$`Years old`))
# データを整形
gastric_ulcer_long <- gather(gastric_ulcer, key = "Year Period", value = "Cases", -`Years old`)
# 線グラフをプロットする
ggplot(gastric_ulcer_long, aes(x=`Years old`, y=Cases, linetype=`Year Period`, group=`Year Period`)) +
geom_line() +
geom_point() +
scale_linetype_manual(values=c("2012-2015"="dotted", "2016-2019"="dashed", "Overall"="solid")) +
scale_y_continuous(labels = scales::comma) + # Y軸のラベルを通常の数値に
labs(x="Age Group",
y="Number of hospitalization") +
theme_minimal() +
theme(axis.text.x = element_text(angle = 45, hjust = 1)) # x軸のテキストを45度斜めにする
十二指腸潰瘍
# ライブラリを読み込む
library(tidyverse)
# 十二指腸潰瘍出血データ
duodenal_ulcer <- tribble(
~`Years old`, ~`2012-2015`, ~`2016-2019`, ~Overall,
"10-14", 4, 1, 5,
"15-19", 17, 7, 24,
"20-24", 29, 26, 55,
"25-29", 27, 26, 53,
"30-34", 37, 30, 67,
"35-39", 58, 40, 98,
"40-44", 67, 56, 123,
"45-49", 78, 62, 140,
"50-54", 90, 67, 157,
"55-59", 117, 124, 241,
"60-64", 148, 117, 265,
"65-69", 188, 131, 319,
"70-74", 162, 161, 323,
"75-79", 168, 185, 353,
"80-84", 198, 200, 398,
"85-89", 148, 170, 318,
"90-94", 77, 102, 179,
"95-99", 19, 23, 42,
"≥100", 4, 2, 6
) %>%
mutate(across(`2012-2015`:`Overall`, ~ . * 30)) # 数字を30倍する
# 年齢層を正しい順序で因子化
duodenal_ulcer$`Years old` <- factor(duodenal_ulcer$`Years old`, levels = unique(duodenal_ulcer$`Years old`))
# データを整形
duodenal_ulcer_long <- gather(duodenal_ulcer, key = "Year Period", value = "Cases", -`Years old`)
# 十二指腸潰瘍出血の線グラフをプロットする
ggplot(duodenal_ulcer_long, aes(x=`Years old`, y=Cases, linetype=`Year Period`, group=`Year Period`)) +
geom_line() +
geom_point() +
scale_linetype_manual(values=c("2012-2015"="dotted", "2016-2019"="dashed", "Overall"="solid")) +
scale_y_continuous(labels = scales::comma) + # Y軸のラベルを通常の数値に
labs(x="Age Group",
y="Number of hospitalization") +
theme_minimal() +
theme(axis.text.x = element_text(angle = 45, hjust = 1)) # x軸のテキストを45度斜めにする
食道静脈瘤
# ライブラリを読み込む
library(tidyverse)
# 新しい食道静脈瘤出血データ
esophageal_varices_new <- tribble(
~`Years old`, ~`2012-2015`, ~`2016-2019`, ~Overall,
"10-14", 1, 3, 4,
"15-19", 2, 0, 2,
"20-24", 0, 2, 2,
"25-29", 1, 2, 3,
"30-34", 6, 7, 13,
"35-39", 13, 6, 19,
"40-44", 31, 23, 54,
"45-49", 65, 49, 114,
"50-54", 67, 58, 125,
"55-59", 98, 75, 173,
"60-64", 114, 84, 198,
"65-69", 96, 102, 198,
"70-74", 110, 79, 189,
"75-79", 110, 84, 194,
"80-84", 59, 58, 117,
"85-89", 35, 37, 72,
"90-94", 10, 7, 17,
"95-99", 0, 2, 2,
"≥100", 0, 0, 0
) %>%
mutate(across(`2012-2015`:`Overall`, ~ . * 30)) # 数値を30倍する
# 年齢層を正しい順序で因子化
esophageal_varices_new$`Years old` <- factor(esophageal_varices_new$`Years old`, levels = unique(esophageal_varices_new$`Years old`))
# データを整形
esophageal_varices_new_long <- gather(esophageal_varices_new, key = "Year Period", value = "Cases", -`Years old`)
# 食道静脈瘤出血の線グラフをプロットする
ggplot(esophageal_varices_new_long, aes(x=`Years old`, y=Cases, linetype=`Year Period`, group=`Year Period`)) +
geom_line() +
geom_point() +
scale_linetype_manual(values=c("2012-2015"="dotted", "2016-2019"="dashed", "Overall"="solid")) +
scale_y_continuous(labels = scales::comma) + # Y軸のラベルを通常の数値に
labs(x="Age Group",
y="Number of hospitalization") +
theme_minimal() +
theme(axis.text.x = element_text(angle = 45, hjust = 1)) # x軸のテキストを45度斜めにする
大腸憩室出血
# ライブラリを読み込む
library(tidyverse)
# 新しい大腸憩室出血データ
colonic_diverticulosis_new <- tribble(
~`Years old`, ~`2012-2015`, ~`2016-2019`, ~Overall,
"10-14", 0, 0, 0,
"15-19", 0, 0, 0,
"20-24", 0, 0, 0,
"25-29", 2, 5, 8,
"30-34", 2, 4, 6,
"35-39", 10, 17, 35,
"40-44", 24, 46, 78,
"45-49", 39, 102, 160,
"50-54", 66, 157, 253,
"55-59", 132, 232, 403,
"60-64", 189, 302, 559,
"65-69", 269, 490, 830,
"70-74", 337, 635, 1077,
"75-79", 464, 768, 1342,
"80-84", 498, 878, 1463,
"85-89", 365, 750, 1169,
"90-94", 148, 373, 542,
"95-99", 31, 89, 121,
"≥100", 6, 13, 19
) %>%
mutate(across(`2012-2015`:`Overall`, ~ . * 30)) # 数値を30倍する
# 年齢層を正しい順序で因子化
colonic_diverticulosis_new$`Years old` <- factor(colonic_diverticulosis_new$`Years old`, levels = unique(colonic_diverticulosis_new$`Years old`))
# データを整形
colonic_diverticulosis_new_long <- gather(colonic_diverticulosis_new, key = "Year Period", value = "Cases", -`Years old`)
# 大腸憩室出血の線グラフをプロットする
ggplot(colonic_diverticulosis_new_long, aes(x=`Years old`, y=Cases, linetype=`Year Period`, group=`Year Period`)) +
geom_line() +
geom_point() +
scale_linetype_manual(values=c("2012-2015"="dotted", "2016-2019"="dashed", "Overall"="solid")) +
scale_y_continuous(labels = scales::comma) + # Y軸のラベルを通常の数値に
labs(x="Age Group",
y="Number of hospitalization") +
theme_minimal() +
theme(axis.text.x = element_text(angle = 45, hjust = 1)) # x軸のテキストを45度斜めにする
虚血性腸炎
# 必要なライブラリを読み込む
library(tidyverse)
# 新しい虚血性腸炎のデータ
ischemic_colitis_new <- tribble(
~`Years old`, ~`2012-2015`, ~`2016-2019`, ~Overall,
"10-14", 1, 1, 2,
"15-19", 1, 10, 12,
"20-24", 22, 23, 46,
"25-29", 29, 34, 67,
"30-34", 55, 35, 93,
"35-39", 76, 80, 163,
"40-44", 110, 119, 238,
"45-49", 126, 198, 338,
"50-54", 148, 242, 402,
"55-59", 208, 276, 506,
"60-64", 295, 354, 667,
"65-69", 393, 554, 986,
"70-74", 505, 626, 1178,
"75-79", 495, 756, 1306,
"80-84", 530, 770, 1351,
"85-89", 368, 600, 1001,
"90-94", 181, 319, 515,
"95-99", 33, 67, 103,
"≥100", 7, 15, 23
) %>%
mutate(across(`2012-2015`:`Overall`, ~ . * 30)) # 各数値を30倍する
# 年齢層を正しい順序で因子化
ischemic_colitis_new$`Years old` <- factor(ischemic_colitis_new$`Years old`, levels = unique(ischemic_colitis_new$`Years old`))
# データを長い形式に変換
ischemic_colitis_new_long <- gather(ischemic_colitis_new, key = "Year Period", value = "Cases", -`Years old`)
# 線グラフを作成
ggplot(ischemic_colitis_new_long, aes(x=`Years old`, y=Cases, linetype=`Year Period`, group=`Year Period`)) +
geom_line() +
geom_point() +
scale_linetype_manual(values=c("2012-2015"="dotted", "2016-2019"="dashed", "Overall"="solid")) +
scale_y_continuous(labels = scales::comma) + # Y軸のラベルを通常の数値に
labs(x="Age Group",
y="Number of hospitalization") +
theme_minimal() +
theme(axis.text.x = element_text(angle = 45, hjust = 1)) # x軸のテキストを45度斜めにする
直腸潰瘍
# 必要なライブラリを読み込む
library(tidyverse)
# 新しい直腸潰瘍のデータ
rectal_ulcer_new <- tribble(
~`Years old`, ~`2012-2015`, ~`2016-2019`, ~Overall,
"10-14", 0, 0, 0,
"15-19", 1, 0, 1,
"20-24", 0, 1, 1,
"25-29", 0, 0, 0,
"30-34", 2, 2, 4,
"35-39", 1, 3, 4,
"40-44", 3, 4, 7,
"45-49", 3, 3, 6,
"50-54", 8, 2, 10,
"55-59", 4, 10, 14,
"60-64", 10, 10, 21,
"65-69", 16, 19, 35,
"70-74", 35, 39, 75,
"75-79", 61, 59, 120,
"80-84", 68, 80, 148,
"85-89", 78, 116, 195,
"90-94", 41, 51, 94,
"95-99", 13, 16, 29,
"≥100", 1, 3, 4
) %>%
mutate(across(`2012-2015`:`Overall`, ~ . * 30)) # 各数値を30倍する
# 年齢層を正しい順序で因子化
rectal_ulcer_new$`Years old` <- factor(rectal_ulcer_new$`Years old`, levels = unique(rectal_ulcer_new$`Years old`))
# データを長い形式に変換
rectal_ulcer_new_long <- gather(rectal_ulcer_new, key = "Year Period", value = "Cases", -`Years old`)
# 線グラフを作成
ggplot(rectal_ulcer_new_long, aes(x=`Years old`, y=Cases, linetype=`Year Period`, group=`Year Period`)) +
geom_line() +
geom_point() +
scale_linetype_manual(values=c("2012-2015"="dotted", "2016-2019"="dashed", "Overall"="solid")) +
scale_y_continuous(labels = scales::comma) + # Y軸のラベルを通常の数値に
labs(x="Age Group",
y="Number of hospitalization") +
theme_minimal() +
theme(axis.text.x = element_text(angle = 45, hjust = 1)) # x軸のテキストを45度斜めにする
季節性変化
# 必要なライブラリを読み込む
library(tidyverse)
# データを作成
data <- tribble(
~Disease, ~Month, ~Cases,
"Hemorrhagic gastric ulcer", "January", 41080,
"Hemorrhagic gastric ulcer", "April", 40970,
"Hemorrhagic gastric ulcer", "July", 37420,
"Hemorrhagic gastric ulcer", "October", 39890,
"Hemorrhagic duodenal ulcer", "January", 12210,
"Hemorrhagic duodenal ulcer", "April", 12130,
"Hemorrhagic duodenal ulcer", "July", 10450,
"Hemorrhagic duodenal ulcer", "October", 11790,
"Esophageal variceal bleeding", "January", 6370,
"Esophageal variceal bleeding", "April", 6030,
"Esophageal variceal bleeding", "July", 5260,
"Esophageal variceal bleeding", "October", 5550,
"Colonic diverticular bleeding", "January", 22830,
"Colonic diverticular bleeding", "April", 25590,
"Colonic diverticular bleeding", "July", 27940,
"Colonic diverticular bleeding", "October", 30460,
"Ischemic colitis", "January", 28200,
"Ischemic colitis", "April", 31090,
"Ischemic colitis", "July", 31030,
"Ischemic colitis", "October", 30950,
"Rectal ulcer", "January", 3460,
"Rectal ulcer", "April", 3640,
"Rectal ulcer", "July", 3440,
"Rectal ulcer", "October", 3950
)
# 月の順序を指定
data$Month <- factor(data$Month, levels=c("January", "April", "July", "October"))
# 順番とBMJカラーパレットを指定
disease_order <- c("Hemorrhagic gastric ulcer", "Hemorrhagic duodenal ulcer", "Esophageal variceal bleeding",
"Colonic diverticular bleeding", "Ischemic colitis", "Rectal ulcer")
bmj_colors <- c("January"="#56B4E9", "April"="#009E73", "July"="#D55E00", "October"="#E69F00")
# 棒グラフを作成
ggplot(data, aes(x=factor(Disease, levels=disease_order), y=Cases, fill=Month)) +
geom_bar(stat="identity", position="dodge") +
scale_fill_manual(values=bmj_colors) +
labs(x="Disease",
y="Number of Cases") +
theme_minimal() +
theme(axis.text.x = element_text(angle = 45, hjust = 1)) # x軸のテキストを45度斜めにする
モノクロで月を区別してみる。
# Load required libraries
library(tidyverse)
# Create the new dataset
new_data <- tribble(
~Disease, ~Month, ~Cases,
"Hemorrhagic gastric ulcer", "January", 28220,
"Hemorrhagic gastric ulcer", "April", 27030,
"Hemorrhagic gastric ulcer", "July", 24740,
"Hemorrhagic gastric ulcer", "October", 27090,
"Hemorrhagic duodenal ulcer", "January", 8580,
"Hemorrhagic duodenal ulcer", "April", 8140,
"Hemorrhagic duodenal ulcer", "July", 6870,
"Hemorrhagic duodenal ulcer", "October", 8070,
"Esophageal variceal bleeding", "January", 4440,
"Esophageal variceal bleeding", "April", 3410,
"Esophageal variceal bleeding", "July", 3240,
"Esophageal variceal bleeding", "October", 3870,
"Colonic diverticular bleeding", "January", 17650,
"Colonic diverticular bleeding", "April", 19210,
"Colonic diverticular bleeding", "July", 20770,
"Colonic diverticular bleeding", "October", 23020,
"Ischemic colitis", "January", 20800,
"Ischemic colitis", "April", 22880,
"Ischemic colitis", "July", 23300,
"Ischemic colitis", "October", 22990,
"Rectal ulcer", "January", 2030,
"Rectal ulcer", "April", 1800,
"Rectal ulcer", "July", 1820,
"Rectal ulcer", "October", 2030
)
# Set the order of the months
new_data$Month <- factor(new_data$Month, levels=c("January", "April", "July", "October"))
# Set the order of the diseases
disease_order <- c("Hemorrhagic gastric ulcer", "Hemorrhagic duodenal ulcer", "Esophageal variceal bleeding",
"Colonic diverticular bleeding", "Ischemic colitis", "Rectal ulcer")
# Set the monochrome color palette
grey_colors <- c("January"=grey(0.2), "April"=grey(0.4), "July"=grey(0.6), "October"=grey(0.8))
# Create the bar plot
ggplot(new_data, aes(x=factor(Disease, levels=disease_order), y=Cases, fill=Month)) +
geom_bar(stat="identity", position="dodge") +
scale_fill_manual(values=grey_colors) +
scale_y_continuous(labels = scales::comma) + # Add comma to Y-axis labels
labs(x="Disease",
y="Number of hospitalization") +
theme_minimal() +
theme(axis.text.x = element_text(angle = 45, hjust = 1)) # Tilt x-axis text by 45 degrees
library(ggplot2)
# データフレームを作成
data <- data.frame(
Year = c(2012, 2013, 2014, 2015, 2016, 2017, 2018, 2019,
2012, 2013, 2014, 2015, 2016, 2017, 2018, 2019),
Count = c(95850, 96570, 93090, 93210, 86940, 88620, 87690, 86010,
18690, 18990, 22170, 22740, 24060, 25410, 24990, 26490),
Type = c(rep("Upper endoscopic hemostasis", 8), rep("Lower endoscopic hemostasis", 8))
)
# ggplotを使用して線グラフを描画
ggplot(data, aes(x=Year, y=Count, group=Type, linetype=Type)) +
geom_line() +
scale_linetype_manual(values = c("Upper endoscopic hemostasis" = "solid", "Lower endoscopic hemostasis" = "dashed")) + # Upperを実線、Lowerを点線に設定
scale_y_continuous(limits = c(0, 120000), # Y軸の範囲を0から12万に設定
breaks = seq(0, 120000, by=20000), # 0、2万、4万、..., 12万の目盛りに設定
labels = scales::comma) + # Y軸のラベルを通常の数値に
scale_x_continuous(breaks = seq(min(data$Year), max(data$Year), by = 1)) + # X軸を毎年表示
ylab("Number of Procedures") +
xlab("Year") +
theme_minimal()