d <- read.csv('https://stats.dip.jp/01_ds/data/heart.data.csv')[, -1]

library(DT)
datatable(round(d, 1))
COL <- c(rgb(255,   0,   0,  255, max = 255), 
         rgb(  0,   0, 255,  255, max = 255), 
         rgb(  0, 155,   0,  255, max = 255)) 
library(psych)
pairs.panels(d)

library(ggcorrplot)
##  要求されたパッケージ ggplot2 をロード中です
## 
##  次のパッケージを付け加えます: 'ggplot2'
##  以下のオブジェクトは 'package:psych' からマスクされています:
## 
##     %+%, alpha
library(plotly)
## 
##  次のパッケージを付け加えます: 'plotly'
##  以下のオブジェクトは 'package:ggplot2' からマスクされています:
## 
##     last_plot
##  以下のオブジェクトは 'package:stats' からマスクされています:
## 
##     filter
##  以下のオブジェクトは 'package:graphics' からマスクされています:
## 
##     layout
cor(d) |> ggcorrplot(lab = T, hc.order = T, outline.color = "white", p.mat = cor_pmat(d)) |> ggplotly() |>
layout(font  = list(size = 11, color = 'blue', family = 'UD Digi Kyokasho NK-R'),
       title = '主タイトル',
       xaxis = list(title = 'x軸カテゴリラベル'),
       yaxis = list(title = 'y軸カテゴリラベル'))
fit <- lm(heart.disease ~ biking + smoking, data = d)
library(sjPlot)
## Install package "strengejacke" from GitHub (`devtools::install_github("strengejacke/strengejacke")`) to load all sj-packages at once!
tab_model(fit, show.stat = T, show.aic = T)
  heart.disease
Predictors Estimates CI Statistic p
(Intercept) 14.98 14.83 – 15.14 186.99 <0.001
biking -0.20 -0.20 – -0.20 -146.53 <0.001
smoking 0.18 0.17 – 0.19 50.39 <0.001
Observations 498
R2 / R2 adjusted 0.980 / 0.980
AIC 995.353
plot_model(fit, show.values = T, show.intercept = T, width = 0.1)

plot(fit)

d <- read.csv('https://stats.dip.jp/01_ds/data/real_estate_price.csv')

datatable(round(d, 1))