st_options(plain.ascii = FALSE, # This is a must in Rmd documents
style = "rmarkdown", # idem
dfSummary.varnumbers = FALSE, # This keeps results narrow enough
dfSummary.valid.col = FALSE)
EVERO <- EVERO <- read_delim("~/Downloads/EVERO.csv",
";", escape_double = FALSE, col_types = cols(Cmax = col_number(),
Taux_residuel = col_number(), Valeur_AUC = col_number()), trim_ws = TRUE)
EVERO$`AUC/D`<-EVERO$Valeur_AUC/EVERO$Dose_matin
EVERO$`AUC/C0`<-EVERO$Valeur_AUC/EVERO$Taux_residuel
EVERO<-EVERO %>% filter(Dose_matin<5) %>% filter(!is.na(C2))
evero<-EVERO %>% select(Valeur_AUC, Dose_matin, Greffe_réelle, Taux_residuel, Cmax, Tmax, `AUC/D`, `AUC/C0`)
AucvsC0<-lm(Valeur_AUC~Taux_residuel, data=evero)
coeff=coefficients(AucvsC0)
# Equation de la droite de regression :
eq = paste0("y = ", round(coeff[2],1), "*x + ", round(coeff[1],1))
eq
## [1] "y = 14.3*x + 24.7"
## Type de greffe
ggplot(evero) +
aes(x = Greffe_réelle, fill = Greffe_réelle) +
geom_bar() +
scale_fill_brewer(palette = "Set3") +
theme_minimal() +
theme(legend.position = "none")
## Type de greffe vs AUC
ggplot(evero) +
aes(x = Greffe_réelle, y = Valeur_AUC, fill = Greffe_réelle) +
geom_boxplot() +
scale_fill_brewer(palette = "Set3") +
theme_minimal() +
theme(legend.position = "none")
## Type de greffe vs AUC/D
ggplot(evero) +
aes(x = Greffe_réelle, y =`AUC/D` , fill = Greffe_réelle) +
geom_boxplot() +
scale_fill_brewer(palette = "Set3") +
theme_minimal() +
theme(legend.position = "none")
## Type de greffe vs AUC/C0
ggplot(evero) +
aes(x = Greffe_réelle, y =`AUC/C0` , fill = Greffe_réelle) +
geom_boxplot() +
scale_fill_brewer(palette = "Set3") +
theme_minimal() +
theme(legend.position = "none")
## C0 vs AUC
ggplot(evero) +
aes(x = Taux_residuel, y = Valeur_AUC) +
geom_point(size = 2L) +
stat_smooth(method = "lm", col = "red", se=FALSE) +
scale_color_hue() +labs(title = paste("Adj R2 = ",signif(summary(AucvsC0)$adj.r.squared, 5),
"Intercept =",signif(AucvsC0$coef[[1]],5 ),
" Slope =",signif(AucvsC0$coef[[2]], 5),
" P =",signif(summary(AucvsC0)$coef[2,4], 5))) +
theme_minimal()
## `geom_smooth()` using formula 'y ~ x'
## C0 vs AUC (par typé de greffe)
ggplot(evero) +
aes(x = Taux_residuel, y = Valeur_AUC, colour = Greffe_réelle) +
geom_point(size = 2L) +
scale_color_hue() +
geom_smooth(method=lm)+
theme_minimal()
## `geom_smooth()` using formula 'y ~ x'
## Dose vs AUC
ggplot(evero) +
aes(x = Dose_matin, y = Valeur_AUC, colour = Greffe_réelle) +
geom_point(size = 2L) +
scale_color_hue() +
theme_minimal()
## Dose vs C0
ggplot(evero) +
aes(x = Dose_matin, y = Taux_residuel, colour = Greffe_réelle) +
geom_point(size = 2L) +
scale_color_hue() +
theme_minimal()
## Dose vs Cmax
ggplot(evero) +
aes(x = Dose_matin, y = Cmax, colour = Greffe_réelle) +
geom_point(size = 2L) +
scale_color_hue() +
theme_minimal()
## stat descriptive
table<-stat.desc(evero)
paged_table(table)
paged_table(skim(evero))
paged_table(evero %>% group_by(Greffe_réelle) %>% skim())
CreateTableOne(data = evero)
##
## Overall
## n 187
## Valeur_AUC (mean (SD)) 118.08 (54.23)
## Dose_matin (mean (SD)) 1.52 (0.78)
## Greffe_réelle (%)
## Greffe cardiaque 5 ( 2.7)
## Greffe hépatique 8 ( 4.3)
## Greffe pulmonaire 1 ( 0.5)
## Greffe rénale 172 (92.0)
## Greffe rénale + pancréatique 1 ( 0.5)
## Taux_residuel (mean (SD)) 6.54 (3.51)
## Cmax (mean (SD)) 19.14 (9.62)
## AUC/D (mean (SD)) 91.86 (47.78)
## AUC/C0 (mean (SD)) 20.76 (25.54)
Après calcul en se basant sur la corrélation AUC vs C0, la borne de l’interval d’AUC pour un C0 à 3 mg/L est de 67.6 h.mg/L et pour un C0 à 8 mg/L de 139.0 h.mg/L.