d <- data.frame(
  squid = c(10, 20, 30),
  octopus = c(40, 80, 90),
  tuna = c(20, 50, 40))
  
px <- paste(1:nrow(d), "月")
          
rownames(d) <- px

library(kableExtra)
kable(d) |> kable_classic("striped", full_width = F)
squid octopus tuna
1 月 | 10| 40| 20|
2 月 | 20| 80| 50|
3 月 | 30| 90| 40|
write.csv(d, file = "barplot_py.csv", quote = F)

COL <- c(rgb(255,   0, 255,  55, max = 255), rgb(  0,   0, 255,  55, max = 255), rgb(  0, 255,   0,  55, max = 255))
m <- as.matrix(d)

i <- 2

barplot(m[i, ], col = COL[2],
        main = rownames(m)[i],
        xlab = "ネタ",
        ylab = "注文数[百皿]")
        
abline(h = seq(0, 100, 5), lty = 2, col = gray(0.5, 0.25))

barplot(m, col = COL, beside = T,
        main = "寿司屋の売上げ",
        xlab = "ネタ",
        ylab = "注文数[百皿]")
        
abline(h = seq(0, 100, 20), lty = 2, col = gray(0.5, 0.25))

legend("topleft", fill = COL, legend = rownames(m))

barplot(m, col = COL, beside = T,
        main = "寿司屋の売上げ",
        xlab = "ネタ",
        ylab = "注文数[百皿]")

abline(h = seq(0, 100, 20), lty = 2, col = gray(0.5, 0.25))

legend("topleft", fill = COL, legend = rownames(m))