##chargement des packages----
library(questionr)
library(tidyverse)
## ── Attaching core tidyverse packages ──────────────────────── tidyverse 2.0.0 ──
## ✔ dplyr     1.1.1     ✔ readr     2.1.4
## ✔ forcats   1.0.0     ✔ stringr   1.5.0
## ✔ ggplot2   3.4.2     ✔ tibble    3.2.1
## ✔ lubridate 1.9.2     ✔ tidyr     1.3.0
## ✔ 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
library(tableone)
library(labelled)
library(gtsummary)
## #BlackLivesMatter
library(GGally)
## Registered S3 method overwritten by 'GGally':
##   method from   
##   +.gg   ggplot2
library(readxl)
library(effects)
## Le chargement a nécessité le package : carData
## lattice theme set by effectsTheme()
## See ?effectsTheme for details.
library(survival)
library(survminer)
## Le chargement a nécessité le package : ggpubr
## 
## Attachement du package : 'survminer'
## 
## L'objet suivant est masqué depuis 'package:survival':
## 
##     myeloma
library(ggplot2)
library(dplyr)
library(knitr)
library(cowplot)
## 
## Attachement du package : 'cowplot'
## 
## L'objet suivant est masqué depuis 'package:ggpubr':
## 
##     get_legend
## 
## L'objet suivant est masqué depuis 'package:lubridate':
## 
##     stamp
##chargement des données 

data_guillaume_dermato_ddi <- read_excel("Y:/fp/FAC/2023-2024/Memoires DES/Guillaume Flandin/20240705/data_guillaume_dermato_ddi.xlsx")
## New names:
## • `Détail` -> `Détail...39`
## • `Détail` -> `Détail...46`
## • `Détail` -> `Détail...70`
## • `Détail` -> `Détail...72`
##recodage bases de données le cas échéant----

dermato_g<-filter(data_guillaume_dermato_ddi, c(eligible_etude=="1" ))

##recodage de données le cas échéant----
dermato_g$charlson_2<-ifelse(dermato_g$charlson>=2, 1, 0)
dermato_g$charlson_3<-ifelse(dermato_g$charlson>=3, 1, 0)
dermato_g$charlson_4<-ifelse(dermato_g$charlson>=4, 1, 0)
dermato_g$charlson_5<-ifelse(dermato_g$charlson>=5, 1, 0)
dermato_g$adjuvant<-ifelse(dermato_g$stade=="ADJUVANT", 1, 0)
dermato_g$raf_mek<-ifelse(dermato_g$classe_medt=="raf_mek", 1, 0)
dermato_g$mek<-ifelse(dermato_g$classe_medt=="mek", 1, 0)
dermato_g$hedgehog<-ifelse(dermato_g$classe_medt=="hedgehog", 1, 0)
dermato_g$cytotox<-ifelse(dermato_g$classe_medt=="cytotox", 1, 0)
dermato_g$pftox_mediane<-dermato_g$pftox/3.7

##renommer des variables pour présentation dans les tableaux de résultats
library(labelled)
var_label(dermato_g$type_evt) <- "evenement lié au médicament"
var_label(dermato_g$consequence_evt) <- "conséquence des evenements liés au médicament"
var_label(dermato_g$meta_snc) <- "presence de métastase cérébrale"
var_label(dermato_g$polymedique) <- "patient polymediqué"         
var_label(dermato_g$comprehension) <- "patient avec difficulté de comprehension"
var_label(dermato_g$pb_social) <- "patient avec difficulté sociale"
var_label(dermato_g$actif_pro) <- "patient avec activité professionnelle"
var_label(dermato_g$ddi) <- "patient avec interaction médicamenteuse"
var_label(dermato_g$prise_discontinue) <- "traitement en prise discontinue"
var_label(dermato_g$evt_tox) <- "patient avec evenement lié au médicament"
var_label(dermato_g$charlson_2) <- "score de charlson >=2 (hors tumeur)" 
var_label(dermato_g$patient_seul) <- "patient vivant seul"
var_label(dermato_g$risque_observance) <- "patient avec risque de mauvaise observance"
var_label(dermato_g$raf_mek) <- "patient traité par inhibiteurs de Raf et Mek"
var_label(dermato_g$mek) <- "patient traité par inhibiteurs de Mek seul"
var_label(dermato_g$hedgehog) <- "patient traité par inhibiteurs hedgehog"
var_label(dermato_g$cytotox) <- "patient traité par cytotoxique"
var_label(dermato_g$ddi_sousdosage) <- "patient avec interaction à risque de sous-dosage"
var_label(dermato_g$ddi_surdosage) <- "patient avec interaction à risque de sur-dosage"
var_label(dermato_g$ddi_qt) <- "patient avec interaction à risque d'allongement du QT"
var_label(dermato_g$ddi_ph) <- "patient avec interaction avec IPP et pH"
var_label(dermato_g$ipp_mdt) <- "patient sous IPP"
var_label(dermato_g$rque_pharma) <- "patient pour lequel l'analyse d'interaction a conclu à un suivi de ei"

##réation de variables à plusieurs catégorie selon valeurs variable continue



##tableau descriptif population globales ----
tbl_summary(
  dermato_g, include = c("age", "pathologie", "dci", "raf_mek", "mek", "hedgehog", "cytotox", "polymedique","stade", "ligne", "evt_tox", "charlson", "charlson_2", "meta_snc", "comprehension", "pb_social", "actif_pro", "patient_seul", "ddi","ddi_surdosage","ddi_sousdosage","ipp_mdt","ddi_ph","ddi_qt","rque_pharma" ,"prise_discontinue", "risque_observance"),
  digits=all_categorical()~ c(0,1)
)
Characteristic N = 781
age 66 (52, 75)
pathologie
    CANCER DE LA THYROIDE 1 (1.3%)
    CARCINOME BASOCELLUALIRE INOPERABLE 15 (19.2%)
    CARCINOME DE MERKEL 1 (1.3%)
    carcinome trichoblastique NON OPERABLE 2 (2.6%)
    MELANOME 59 (75.6%)
dci
    Dabrafenib / Trametinib 37 (47.4%)
    Encorafenib binimetinib 17 (21.8%)
    Etoposide 1 (1.3%)
    Sonidegib 9 (11.5%)
    Trametinib 6 (7.7%)
    Vismodegib 8 (10.3%)
patient traité par inhibiteurs de Raf et Mek 54 (69.2%)
patient traité par inhibiteurs de Mek seul 6 (7.7%)
patient traité par inhibiteurs hedgehog 17 (21.8%)
patient traité par cytotoxique 1 (1.3%)
patient polymediqué 42 (53.8%)
stade
    ADJUVANT 18 (23.1%)
    AVANCE 23 (29.5%)
    METASTATIQUE 37 (47.4%)
ligne
    1ere ligne 41 (52.6%)
    2eme ligne 24 (30.8%)
    2ème ligne 4 (5.1%)
    3eme ligne 4 (5.1%)
    3ème ligne 1 (1.3%)
    4eme ligne 1 (1.3%)
    4ème ligne 1 (1.3%)
    5eme ligne 2 (2.6%)
patient avec evenement lié au médicament 63 (80.8%)
charlson
    0 12 (15.4%)
    1 19 (24.4%)
    2 10 (12.8%)
    3 12 (15.4%)
    4 9 (11.5%)
    5 10 (12.8%)
    6 5 (6.4%)
    8 1 (1.3%)
score de charlson >=2 (hors tumeur) 47 (60.3%)
presence de métastase cérébrale 11 (14.1%)
patient avec difficulté de comprehension 9 (11.5%)
patient avec difficulté sociale 14 (17.9%)
patient avec activité professionnelle 17 (21.8%)
patient vivant seul 10 (12.8%)
patient avec interaction médicamenteuse 37 (47.4%)
patient avec interaction à risque de sur-dosage 24 (30.8%)
patient avec interaction à risque de sous-dosage 5 (6.4%)
patient sous IPP 20 (29.0%)
    Unknown 9
patient avec interaction avec IPP et pH 10 (12.8%)
patient avec interaction à risque d'allongement du QT 8 (10.3%)
patient pour lequel l'analyse d'interaction a conclu à un suivi de ei 34 (43.6%)
traitement en prise discontinue 9 (11.5%)
patient avec risque de mauvaise observance 17 (21.8%)
1 Median (IQR); n (%)
##Description des evènements liés aux traitement 
tbl_summary(
  dermato_g, include = c("type_evt"),
  digits=all_categorical()~ c(0,1)
)
Characteristic N = 781
evenement lié au médicament
    0 32 (41.0%)
    AEG (fatigue, perte d'appétit) 1 (1.3%)
    AEG, HYPERTHERMIE, INCONTINENCE URINAIRE 1 (1.3%)
    AEG, IRA, diarrhées grade II, déshydratation grade IV 1 (1.3%)
    AEG,PERTE DE POIDS 1 (1.3%)
    ALOPECIE / MYALGIES 1 (1.3%)
    ANEMIE GRADE III 1 (1.3%)
    ANEMIE, IRC 1 (1.3%)
    ASTHENIE / NAUSEES 1 (1.3%)
    ASTHENIE GRADE 2, DIARRHEES GRADE 2, MODIF BILAN HEPATIQUE,FRISSON 1 (1.3%)
    CEPHALEES GRADE 2 1 (1.3%)
    CONTRACTURES MUSCULAIRES GRADE 1, DYSGUEUSIE GRADE II, FOLLICULITE GRADE I 1 (1.3%)
    crampes musculaires grade 1 1 (1.3%)
    CRAMPES / Déséquilibre du ttt parkinson 1 (1.3%)
    CRAMPES MUSCULAIRES 1 (1.3%)
    Cytolyse grade II/fonction cardiaque 1 (1.3%)
    CYTOLYSE HEPATIQUE, INSUFFISANCE RENALE, DECOMPENSATION DIABETIQUE 1 (1.3%)
    dégradation fonction rénale 1 (1.3%)
    DEGRADATION INSUFFISANCE RENALE 1 (1.3%)
    DIARRHEES GRADE 2, AEG 1 (1.3%)
    DOULEURS MUSCULAIRES 1 (1.3%)
    Fièvre grade III 1 (1.3%)
    Frissons, fievre 1 (1.3%)
    GASTRITE 1 (1.3%)
    HYPERTHERMIE 1 (1.3%)
    PERTE DE POIDS, DYSGUESIE GRADE2, CRAMPES MUSCULAIRES GRADE 2 1 (1.3%)
    PHOTO TOXICITE 1 (1.3%)
    RHABDOMYOLYSE, TOXICITE CARDIAQUE 1 (1.3%)
    SYMPTOMES DIGESTIFS ET URINAIRES 1 (1.3%)
    TOXICITE CARDIAQUE 4 (5.1%)
    TOXICITE CARDIAQUE / DEGLOBULISATION 1 (1.3%)
    TOXICITE CARDIAQUE / Diminution FEVG 1 (1.3%)
    TOXICITE CARDIAQUE, AEG,ERUPTION CUTANEE 1 (1.3%)
    TOXICITE CUTANEE 2 (2.6%)
    TOXICITE DIGESTIVE 1 (1.3%)
    Toxicité digestive 1 (1.3%)
    TOXICITE DIGESTIVE / ANOREXIE 1 (1.3%)
    Toxicité digestive grade II 1 (1.3%)
    Toxicité oculaire 1 (1.3%)
    TOXICITE OCULAIRE ET CUTANEE 1 (1.3%)
    TREMBLEMENTS 1 (1.3%)
    TROUBLES DIGESTIFS / VOMISSEMENTS 1 (1.3%)
    TROUBLES VISUELS 1 (1.3%)
1 n (%)
##Conséquences des évènements liés aux traitement
tbl_summary(
  dermato_g, include = c("consequence_evt"),
  digits=all_categorical()~ c(0,1)
)
Characteristic N = 781
conséquence des evenements liés au médicament
    ARRET DEFINITIF 12 (27.3%)
    ARRET TEMPORAIRE 8 (18.2%)
    ARRET TEMPORAIRE / CONCESSION 5 (11.4%)
    ARRET TEMPORAIRE / CONCESSION TEMPORELLE 1 (2.3%)
    ARRET TEMPORAIRE / HOSPIT EN REA 1 (2.3%)
    ARRET TEMPORAIRE MEKINIST 1 (2.3%)
    ARRET TEMPORAIRE MEKINIST / CONCESSION POSOLOGIQUE 1 (2.3%)
    Concession Posologique 14 (31.8%)
    CONCESSION TEMPORELLE 1 (2.3%)
    Unknown 34
1 n (%)
###Description durée de traitement
km_duree_tt<-survfit(Surv(dermato_g$duree_tt, dermato_g$evt_tt)~1)
km_duree_tt
## Call: survfit(formula = Surv(dermato_g$duree_tt, dermato_g$evt_tt) ~ 
##     1)
## 
##       n events median 0.95LCL 0.95UCL
## [1,] 78     73    5.8    4.77    11.3
ggsurvplot(km_duree_tt, data = dermato_g,
           risk.table=TRUE,
           surv.scale="percent",
           break.time.by=3,
           surv.median.line = "hv"
)

##Description motifs d'arrêts de traitement
tbl_summary(
  dermato_g, include = c("motif_arret"),
  digits=all_categorical()~ c(0,1)
)
Characteristic N = 781
motif_arret
    DECES 3 (4.1%)
    Fin de traitement / Surveillance 21 (28.8%)
    FIN DE VIE 1 (1.4%)
    PAUSE THERAPEUTIQUE 2 (2.7%)
    progression 2 (2.7%)
    PROGRESSION 16 (21.9%)
    PROGRESSION + TOX 1 (1.4%)
    PROGRESSION ET DIFFILCULTE D'OBSERVANCE 1 (1.4%)
    ROTATION VERS DABRA / TRAME 1 (1.4%)
    TOXICITE 22 (30.1%)
    TOXICITE / FIN DE TTT (RADIOTHERAPIE CLOTURE) 1 (1.4%)
    TOXICITE / SOINS PAL 1 (1.4%)
    TOXICITE + SOUHAIT DE LA PATIENTE 1 (1.4%)
    Unknown 5
1 n (%)
###Description PFS
km_pfs<-survfit(Surv(dermato_g$pfs, dermato_g$evt_pfs)~1)
km_pfs
## Call: survfit(formula = Surv(dermato_g$pfs, dermato_g$evt_pfs) ~ 1)
## 
##       n events median 0.95LCL 0.95UCL
## [1,] 78     36   21.9    17.6    30.7
ggsurvplot(km_pfs, data = dermato_g,
           risk.table=TRUE,
           surv.scale="percent",
           break.time.by=3,
           surv.median.line = "hv"
)

###Description OS
km_os<-survfit(Surv(dermato_g$os, dermato_g$evt_os)~1)
km_os
## Call: survfit(formula = Surv(dermato_g$os, dermato_g$evt_os) ~ 1)
## 
##       n events median 0.95LCL 0.95UCL
## [1,] 78     31   36.1    31.2      NA
ggsurvplot(km_os, data = dermato_g,
           risk.table=TRUE,
           surv.scale="percent",
           break.time.by=3,
           surv.median.line = "hv"
)

#Courbe de Kaplan Meier survie sans événement toxique lié au médicament----

km_pftox<-survfit(Surv(dermato_g$pftox, dermato_g$evt_tox)~1)
km_pftox
## Call: survfit(formula = Surv(dermato_g$pftox, dermato_g$evt_tox) ~ 
##     1)
## 
##       n events median 0.95LCL 0.95UCL
## [1,] 78     63   4.27    3.37    6.37
ggsurvplot(km_pftox, data = dermato_g,
           risk.table=TRUE,
           surv.scale="percent",
           break.time.by=2,
           surv.median.line = "hv"
)

##modèles de cox ANALYSE UNIVARIEE ----


####charlson en valeur continue
modsurv<-coxph(Surv(pftox, evt_tox)~charlson, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
charlson 1.18 1.04, 1.34 0.009
1 HR = Hazard Ratio, CI = Confidence Interval
####charlson >=2---
modsurv<-coxph(Surv(pftox, evt_tox)~charlson_2, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
score de charlson >=2 (hors tumeur) 1.59 0.95, 2.66 0.079
1 HR = Hazard Ratio, CI = Confidence Interval
####charlson >=3---
modsurv<-coxph(Surv(pftox, evt_tox)~charlson_3, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
charlson_3 1.92 1.16, 3.17 0.012
1 HR = Hazard Ratio, CI = Confidence Interval
####charlson >=4---
modsurv<-coxph(Surv(pftox, evt_tox)~charlson_4, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
charlson_4 1.63 0.98, 2.73 0.062
1 HR = Hazard Ratio, CI = Confidence Interval
####charlson >=5---
modsurv<-coxph(Surv(pftox, evt_tox)~charlson_5, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
charlson_5 1.83 1.03, 3.26 0.040
1 HR = Hazard Ratio, CI = Confidence Interval
####présence de méta cérébrale
modsurv<-coxph(Surv(pftox, evt_tox)~meta_snc, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
presence de métastase cérébrale 1.10 0.52, 2.35 0.8
1 HR = Hazard Ratio, CI = Confidence Interval
####problème de compréhension
modsurv<-coxph(Surv(pftox, evt_tox)~comprehension, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient avec difficulté de comprehension 2.08 0.97, 4.46 0.061
1 HR = Hazard Ratio, CI = Confidence Interval
####problème social
modsurv<-coxph(Surv(pftox, evt_tox)~pb_social, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient avec difficulté sociale 0.79 0.39, 1.60 0.5
1 HR = Hazard Ratio, CI = Confidence Interval
####patient vivant seul
modsurv<-coxph(Surv(pftox, evt_tox)~patient_seul, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient vivant seul 0.79 0.39, 1.60 0.5
1 HR = Hazard Ratio, CI = Confidence Interval
####activité professionnelle
modsurv<-coxph(Surv(pftox, evt_tox)~actif_pro, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient avec activité professionnelle 0.60 0.33, 1.10 0.10
1 HR = Hazard Ratio, CI = Confidence Interval
####interaction médicamenteuse
modsurv<-coxph(Surv(pftox, evt_tox)~ddi, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient avec interaction médicamenteuse 1.57 0.94, 2.60 0.082
1 HR = Hazard Ratio, CI = Confidence Interval
####interaction médicamenteuse à risque de surdosage
modsurv<-coxph(Surv(pftox, evt_tox)~ddi_surdosage, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient avec interaction à risque de sur-dosage 0.93 0.53, 1.62 0.8
1 HR = Hazard Ratio, CI = Confidence Interval
####prise d'ipp
modsurv<-coxph(Surv(pftox, evt_tox)~ipp_mdt, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient sous IPP 1.13 0.63, 2.03 0.7
1 HR = Hazard Ratio, CI = Confidence Interval
####interaction médicamenteuse à risque de QT
modsurv<-coxph(Surv(pftox, evt_tox)~ddi_qt, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient avec interaction à risque d'allongement du QT 1.32 0.60, 2.92 0.5
1 HR = Hazard Ratio, CI = Confidence Interval
####conclusion necessité suivi
modsurv<-coxph(Surv(pftox, evt_tox)~rque_pharma_ei, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
rque_pharma_ei 1.17 0.67, 2.04 0.6
1 HR = Hazard Ratio, CI = Confidence Interval
####Schéma de prise discontinue
modsurv<-coxph(Surv(pftox, evt_tox)~prise_discontinue, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
traitement en prise discontinue 1.26 0.59, 2.69 0.5
1 HR = Hazard Ratio, CI = Confidence Interval
####patient polymédiqué
modsurv<-coxph(Surv(pftox, evt_tox)~polymedique, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient polymediqué 1.37 0.83, 2.26 0.2
1 HR = Hazard Ratio, CI = Confidence Interval
####patient avec risque de mauvaise observance
modsurv<-coxph(Surv(pftox, evt_tox)~risque_observance, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient avec risque de mauvaise observance 0.89 0.48, 1.64 0.7
1 HR = Hazard Ratio, CI = Confidence Interval
####stade adjuvant vs autres 
modsurv<-coxph(Surv(pftox, evt_tox)~adjuvant, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
adjuvant 1.23 0.70, 2.17 0.5
1 HR = Hazard Ratio, CI = Confidence Interval
##patient traité par combo raf_mek
modsurv<-coxph(Surv(pftox, evt_tox)~raf_mek, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient traité par inhibiteurs de Raf et Mek 0.88 0.51, 1.49 0.6
1 HR = Hazard Ratio, CI = Confidence Interval
##patient traité par mek seul
modsurv<-coxph(Surv(pftox, evt_tox)~mek, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient traité par inhibiteurs de Mek seul 3.70 1.26, 10.9 0.018
1 HR = Hazard Ratio, CI = Confidence Interval
##patient traité par hedgehog
modsurv<-coxph(Surv(pftox, evt_tox)~hedgehog, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient traité par inhibiteurs hedgehog 0.88 0.50, 1.57 0.7
1 HR = Hazard Ratio, CI = Confidence Interval
##patient traité par cytotox
modsurv<-coxph(Surv(pftox, evt_tox)~cytotox, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient traité par cytotoxique 1.86 0.25, 13.7 0.5
1 HR = Hazard Ratio, CI = Confidence Interval
##Analyse multivariée avec charlson >=2
modsurv<-coxph(Surv(pftox, evt_tox)~charlson_2+comprehension+actif_pro+ddi+polymedique+mek, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
score de charlson >=2 (hors tumeur) 1.32 0.67, 2.60 0.4
patient avec difficulté de comprehension 1.70 0.76, 3.80 0.2
patient avec activité professionnelle 0.85 0.39, 1.87 0.7
patient avec interaction médicamenteuse 1.39 0.80, 2.41 0.2
patient polymediqué 1.10 0.64, 1.90 0.7
patient traité par inhibiteurs de Mek seul 3.11 1.03, 9.45 0.045
1 HR = Hazard Ratio, CI = Confidence Interval
step(modsurv)
## Start:  AIC=436.19
## Surv(pftox, evt_tox) ~ charlson_2 + comprehension + actif_pro + 
##     ddi + polymedique + mek
## 
##                 Df    AIC
## - polymedique    1 434.31
## - actif_pro      1 434.35
## - charlson_2     1 434.87
## - ddi            1 435.54
## - comprehension  1 435.71
## <none>             436.19
## - mek            1 437.39
## 
## Step:  AIC=434.31
## Surv(pftox, evt_tox) ~ charlson_2 + comprehension + actif_pro + 
##     ddi + mek
## 
##                 Df    AIC
## - actif_pro      1 432.48
## - charlson_2     1 433.11
## - comprehension  1 433.76
## - ddi            1 434.04
## <none>             434.31
## - mek            1 435.66
## 
## Step:  AIC=432.48
## Surv(pftox, evt_tox) ~ charlson_2 + comprehension + ddi + mek
## 
##                 Df    AIC
## - comprehension  1 431.82
## <none>             432.48
## - charlson_2     1 432.61
## - ddi            1 432.62
## - mek            1 434.01
## 
## Step:  AIC=431.82
## Surv(pftox, evt_tox) ~ charlson_2 + ddi + mek
## 
##              Df    AIC
## <none>          431.82
## - ddi         1 432.35
## - charlson_2  1 432.62
## - mek         1 433.79
## Call:
## coxph(formula = Surv(pftox, evt_tox) ~ charlson_2 + ddi + mek, 
##     data = dermato_g)
## 
##              coef exp(coef) se(coef)     z      p
## charlson_2 0.4347    1.5445   0.2637 1.648 0.0993
## ddi        0.4131    1.5116   0.2584 1.599 0.1099
## mek        1.2669    3.5499   0.5524 2.294 0.0218
## 
## Likelihood ratio test=9.75  on 3 df, p=0.02081
## n= 78, number of events= 63
##modèle final avec Charlson >=2 (covariables retenues sur le critère Aikake)
modsurv<-coxph(Surv(pftox, evt_tox)~charlson_2+mek+ddi, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
score de charlson >=2 (hors tumeur) 1.54 0.92, 2.59 0.10
patient traité par inhibiteurs de Mek seul 3.55 1.20, 10.5 0.022
patient avec interaction médicamenteuse 1.51 0.91, 2.51 0.11
1 HR = Hazard Ratio, CI = Confidence Interval
ggforest(modsurv)
## Warning in .get_data(model, data = data): The `data` argument is not provided.
## Data will be extracted from model fit.

###Modèles alternatifs à 2 covariables
modsurv<-coxph(Surv(pftox, evt_tox)~mek+ddi, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient traité par inhibiteurs de Mek seul 3.52 1.20, 10.3 0.022
patient avec interaction médicamenteuse 1.54 0.93, 2.56 0.10
1 HR = Hazard Ratio, CI = Confidence Interval
ggforest(modsurv)
## Warning in .get_data(model, data = data): The `data` argument is not provided.
## Data will be extracted from model fit.

modsurv<-coxph(Surv(pftox, evt_tox)~mek+charlson_2, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient traité par inhibiteurs de Mek seul 3.61 1.21, 10.7 0.021
score de charlson >=2 (hors tumeur) 1.57 0.94, 2.63 0.088
1 HR = Hazard Ratio, CI = Confidence Interval
ggforest(modsurv)
## Warning in .get_data(model, data = data): The `data` argument is not provided.
## Data will be extracted from model fit.

modsurv<-coxph(Surv(pftox, evt_tox)~ddi+charlson_2, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient avec interaction médicamenteuse 1.52 0.92, 2.53 0.11
score de charlson >=2 (hors tumeur) 1.54 0.92, 2.59 0.10
1 HR = Hazard Ratio, CI = Confidence Interval
ggforest(modsurv)
## Warning in .get_data(model, data = data): The `data` argument is not provided.
## Data will be extracted from model fit.

##Analyse multivariée avec charlson >=3 
modsurv<-coxph(Surv(pftox, evt_tox)~charlson_3+comprehension+actif_pro+ddi+polymedique+mek, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
charlson_3 1.80 0.93, 3.47 0.080
patient avec difficulté de comprehension 1.59 0.72, 3.53 0.3
patient avec activité professionnelle 0.97 0.46, 2.04 >0.9
patient avec interaction médicamenteuse 1.49 0.85, 2.63 0.2
patient polymediqué 0.95 0.53, 1.71 0.9
patient traité par inhibiteurs de Mek seul 3.08 1.02, 9.33 0.047
1 HR = Hazard Ratio, CI = Confidence Interval
step(modsurv)
## Start:  AIC=433.65
## Surv(pftox, evt_tox) ~ charlson_3 + comprehension + actif_pro + 
##     ddi + polymedique + mek
## 
##                 Df    AIC
## - actif_pro      1 431.65
## - polymedique    1 431.67
## - comprehension  1 432.84
## - ddi            1 433.57
## <none>             433.65
## - mek            1 434.79
## - charlson_3     1 434.87
## 
## Step:  AIC=431.65
## Surv(pftox, evt_tox) ~ charlson_3 + comprehension + ddi + polymedique + 
##     mek
## 
##                 Df    AIC
## - polymedique    1 429.68
## - comprehension  1 430.84
## <none>             431.65
## - ddi            1 431.70
## - mek            1 432.83
## - charlson_3     1 434.14
## 
## Step:  AIC=429.68
## Surv(pftox, evt_tox) ~ charlson_3 + comprehension + ddi + mek
## 
##                 Df    AIC
## - comprehension  1 428.91
## <none>             429.68
## - ddi            1 429.86
## - mek            1 430.83
## - charlson_3     1 432.61
## 
## Step:  AIC=428.91
## Surv(pftox, evt_tox) ~ charlson_3 + ddi + mek
## 
##              Df    AIC
## <none>          428.91
## - ddi         1 429.63
## - mek         1 430.49
## - charlson_3  1 432.62
## Call:
## coxph(formula = Surv(pftox, evt_tox) ~ charlson_3 + ddi + mek, 
##     data = dermato_g)
## 
##              coef exp(coef) se(coef)     z      p
## charlson_3 0.6187    1.8564   0.2586 2.392 0.0168
## ddi        0.4266    1.5321   0.2576 1.656 0.0977
## mek        1.1939    3.2999   0.5543 2.154 0.0312
## 
## Likelihood ratio test=12.65  on 3 df, p=0.005449
## n= 78, number of events= 63
###modèle final (covariables retenues sur le critère Aikake)
modsurv<-coxph(Surv(pftox, evt_tox)~charlson_3+mek+ddi, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
charlson_3 1.86 1.12, 3.08 0.017
patient traité par inhibiteurs de Mek seul 3.30 1.11, 9.78 0.031
patient avec interaction médicamenteuse 1.53 0.92, 2.54 0.10
1 HR = Hazard Ratio, CI = Confidence Interval
ggforest(modsurv)
## Warning in .get_data(model, data = data): The `data` argument is not provided.
## Data will be extracted from model fit.

###modèles alternatifs à 2 covariables 
modsurv<-coxph(Surv(pftox_mediane, evt_tox)~charlson_3+mek, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
charlson_3 1.86 1.12, 3.09 0.016
patient traité par inhibiteurs de Mek seul 3.32 1.11, 9.94 0.032
1 HR = Hazard Ratio, CI = Confidence Interval
ggforest(modsurv)
## Warning in .get_data(model, data = data): The `data` argument is not provided.
## Data will be extracted from model fit.

modsurv<-coxph(Surv(pftox_mediane, evt_tox)~ddi+mek, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient avec interaction médicamenteuse 1.54 0.93, 2.56 0.10
patient traité par inhibiteurs de Mek seul 3.52 1.20, 10.3 0.022
1 HR = Hazard Ratio, CI = Confidence Interval
ggforest(modsurv)
## Warning in .get_data(model, data = data): The `data` argument is not provided.
## Data will be extracted from model fit.

modsurv<-coxph(Surv(pftox_mediane, evt_tox)~ddi+charlson_3, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient avec interaction médicamenteuse 1.53 0.92, 2.54 0.10
charlson_3 1.89 1.14, 3.13 0.013
1 HR = Hazard Ratio, CI = Confidence Interval
ggforest(modsurv)
## Warning in .get_data(model, data = data): The `data` argument is not provided.
## Data will be extracted from model fit.

#ANALYSE SUR CRITERE DE TOXICITE PRECOCE
##codage de la nouvelle variable 
dermato_g$tox3mois<-ifelse(dermato_g$pftox<3 & dermato_g$evt_tox==1, 1, 0)

##Analyses univariées 
##analyses univariée avec tableau de résultat, ex tox selon aucmoy en valeur continue
dermato_g |>
  tbl_uvregression(
    y = tox3mois,
    include = c(charlson, charlson_2, charlson_3, charlson_4, charlson_5, ddi, ddi_surdosage, rque_pharma_ei, polymedique, patient_seul, actif_pro, comprehension, mek, raf_mek, hedgehog, cytotox),
    method = glm,
    method.args = list(family = binomial),
    exponentiate = TRUE
  ) |> 
  bold_labels()
## Warning: glm.fit: des probabilités ont été ajustées numériquement à 0 ou 1
## Warning: glm.fit: des probabilités ont été ajustées numériquement à 0 ou 1

## Warning: glm.fit: des probabilités ont été ajustées numériquement à 0 ou 1

## Warning: glm.fit: des probabilités ont été ajustées numériquement à 0 ou 1

## Warning: glm.fit: des probabilités ont été ajustées numériquement à 0 ou 1

## Warning: glm.fit: des probabilités ont été ajustées numériquement à 0 ou 1

## Warning: glm.fit: des probabilités ont été ajustées numériquement à 0 ou 1

## Warning: glm.fit: des probabilités ont été ajustées numériquement à 0 ou 1

## Warning: glm.fit: des probabilités ont été ajustées numériquement à 0 ou 1

## Warning: glm.fit: des probabilités ont été ajustées numériquement à 0 ou 1
Characteristic N OR1 95% CI1 p-value
charlson 78 1.43 1.12, 1.89 0.006
patient avec difficulté de comprehension 78 2.50 0.61, 11.0 0.2
patient avec activité professionnelle 78 0.18 0.03, 0.71 0.031
patient vivant seul 78 0.17 0.01, 0.97 0.10
patient polymediqué 78 1.95 0.76, 5.18 0.2
patient avec interaction médicamenteuse 78 2.94 1.14, 7.91 0.028
patient avec interaction à risque de sur-dosage 78 1.43 0.52, 3.84 0.5
rque_pharma_ei 78 2.66 0.98, 7.39 0.056
score de charlson >=2 (hors tumeur) 78 3.67 1.33, 11.4 0.016
charlson_3 78 3.75 1.44, 10.4 0.008
charlson_4 78 2.74 1.03, 7.50 0.045
charlson_5 78 2.91 0.95, 9.28 0.063
patient traité par inhibiteurs de Raf et Mek 78 2.06 0.73, 6.44 0.2
patient traité par inhibiteurs de Mek seul 78 4.00 0.73, 30.3 0.12
patient traité par inhibiteurs hedgehog 78 0.18 0.03, 0.71 0.031
patient traité par cytotoxique 78 0.00 >0.9
1 OR = Odds Ratio, CI = Confidence Interval
##courbe ROC sur score de charlson
library(pROC)
## Type 'citation("pROC")' for a citation.
## 
## Attachement du package : 'pROC'
## 
## Les objets suivants sont masqués depuis 'package:stats':
## 
##     cov, smooth, var
roc1<-roc(tox3mois~charlson, dermato_g)
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases
coords(roc1, "best", ret=c("threshold", "specificity", "1-npv"))
##           threshold specificity     1-npv
## threshold       2.5        0.64 0.2195122
##modele multivarié
mod<-glm(  tox3mois ~ charlson_2+comprehension+actif_pro+patient_seul+polymedique+ddi+rque_pharma_ei+mek, data=dermato_g, family="binomial")
summary(mod)
## 
## Call:
## glm(formula = tox3mois ~ charlson_2 + comprehension + actif_pro + 
##     patient_seul + polymedique + ddi + rque_pharma_ei + mek, 
##     family = "binomial", data = dermato_g)
## 
## Deviance Residuals: 
##     Min       1Q   Median       3Q      Max  
## -1.6542  -0.8074  -0.4403   0.9000   2.1826  
## 
## Coefficients:
##                Estimate Std. Error z value Pr(>|z|)  
## (Intercept)     -1.8173     0.8051  -2.257   0.0240 *
## charlson_2       1.0398     0.7084   1.468   0.1422  
## comprehension    0.7629     0.8839   0.863   0.3881  
## actif_pro       -0.4676     1.0047  -0.465   0.6416  
## patient_seul    -2.2372     1.1456  -1.953   0.0508 .
## polymedique     -0.1905     0.6168  -0.309   0.7574  
## ddi              0.8684     0.6271   1.385   0.1661  
## rque_pharma_ei   0.7942     0.6284   1.264   0.2063  
## mek              1.8519     1.0786   1.717   0.0860 .
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## (Dispersion parameter for binomial family taken to be 1)
## 
##     Null deviance: 101.841  on 77  degrees of freedom
## Residual deviance:  80.837  on 69  degrees of freedom
## AIC: 98.837
## 
## Number of Fisher Scoring iterations: 5
exp(coefficients(mod))
##    (Intercept)     charlson_2  comprehension      actif_pro   patient_seul 
##      0.1624671      2.8286874      2.1444852      0.6264995      0.1067519 
##    polymedique            ddi rque_pharma_ei            mek 
##      0.8265136      2.3831621      2.2126513      6.3719947
exp(confint(mod, level=0.95))
## Attente de la réalisation du profilage...
##                      2.5 %     97.5 %
## (Intercept)    0.029756989  0.7249183
## charlson_2     0.736369482 12.3158451
## comprehension  0.389174393 13.8228562
## actif_pro      0.070967247  4.2735958
## patient_seul   0.005237159  0.7159724
## polymedique    0.236441914  2.7364224
## ddi            0.711846045  8.5647826
## rque_pharma_ei 0.647213731  7.7856084
## mek            0.866860682 72.0352844
mod%>%tbl_regression(intercept = TRUE, exponentiate = TRUE)
Characteristic OR1 95% CI1 p-value
(Intercept) 0.16 0.03, 0.72 0.024
score de charlson >=2 (hors tumeur) 2.83 0.74, 12.3 0.14
patient avec difficulté de comprehension 2.14 0.39, 13.8 0.4
patient avec activité professionnelle 0.63 0.07, 4.27 0.6
patient vivant seul 0.11 0.01, 0.72 0.051
patient polymediqué 0.83 0.24, 2.74 0.8
patient avec interaction médicamenteuse 2.38 0.71, 8.56 0.2
rque_pharma_ei 2.21 0.65, 7.79 0.2
patient traité par inhibiteurs de Mek seul 6.37 0.87, 72.0 0.086
1 OR = Odds Ratio, CI = Confidence Interval
step(mod)
## Start:  AIC=98.84
## tox3mois ~ charlson_2 + comprehension + actif_pro + patient_seul + 
##     polymedique + ddi + rque_pharma_ei + mek
## 
##                  Df Deviance     AIC
## - polymedique     1   80.933  96.933
## - actif_pro       1   81.058  97.058
## - comprehension   1   81.602  97.602
## - rque_pharma_ei  1   82.445  98.445
## - ddi             1   82.811  98.811
## <none>                80.837  98.837
## - charlson_2      1   83.108  99.108
## - mek             1   84.137 100.137
## - patient_seul    1   86.386 102.386
## 
## Step:  AIC=96.93
## tox3mois ~ charlson_2 + comprehension + actif_pro + patient_seul + 
##     ddi + rque_pharma_ei + mek
## 
##                  Df Deviance     AIC
## - actif_pro       1   81.141  95.141
## - comprehension   1   81.777  95.777
## - rque_pharma_ei  1   82.448  96.448
## - ddi             1   82.811  96.811
## <none>                80.933  96.933
## - charlson_2      1   83.126  97.126
## - mek             1   84.171  98.171
## - patient_seul    1   86.463 100.463
## 
## Step:  AIC=95.14
## tox3mois ~ charlson_2 + comprehension + patient_seul + ddi + 
##     rque_pharma_ei + mek
## 
##                  Df Deviance    AIC
## - comprehension   1   81.908 93.908
## - rque_pharma_ei  1   82.724 94.724
## <none>                81.141 95.141
## - ddi             1   83.656 95.656
## - mek             1   84.747 96.747
## - charlson_2      1   85.133 97.133
## - patient_seul    1   86.802 98.802
## 
## Step:  AIC=93.91
## tox3mois ~ charlson_2 + patient_seul + ddi + rque_pharma_ei + 
##     mek
## 
##                  Df Deviance    AIC
## - rque_pharma_ei  1   83.452 93.452
## <none>                81.908 93.908
## - ddi             1   84.722 94.722
## - mek             1   85.521 95.521
## - charlson_2      1   86.522 96.522
## - patient_seul    1   87.193 97.193
## 
## Step:  AIC=93.45
## tox3mois ~ charlson_2 + patient_seul + ddi + mek
## 
##                Df Deviance    AIC
## <none>              83.452 93.452
## - mek           1   86.282 94.282
## - ddi           1   88.320 96.320
## - patient_seul  1   88.482 96.482
## - charlson_2    1   89.274 97.274
## 
## Call:  glm(formula = tox3mois ~ charlson_2 + patient_seul + ddi + mek, 
##     family = "binomial", data = dermato_g)
## 
## Coefficients:
##  (Intercept)    charlson_2  patient_seul           ddi           mek  
##       -2.005         1.352        -2.122         1.171         1.625  
## 
## Degrees of Freedom: 77 Total (i.e. Null);  73 Residual
## Null Deviance:       101.8 
## Residual Deviance: 83.45     AIC: 93.45
##modele final sur critere aikake
mod<-glm(  tox3mois ~ charlson_2+patient_seul+ddi+mek, data=dermato_g, family="binomial")
summary(mod)
## 
## Call:
## glm(formula = tox3mois ~ charlson_2 + patient_seul + ddi + mek, 
##     family = "binomial", data = dermato_g)
## 
## Deviance Residuals: 
##     Min       1Q   Median       3Q      Max  
## -1.6079  -0.8989  -0.5027   0.9668   2.0646  
## 
## Coefficients:
##              Estimate Std. Error z value Pr(>|z|)    
## (Intercept)   -2.0049     0.5904  -3.396 0.000685 ***
## charlson_2     1.3517     0.5853   2.309 0.020929 *  
## patient_seul  -2.1220     1.1393  -1.863 0.062522 .  
## ddi            1.1712     0.5450   2.149 0.031629 *  
## mek            1.6250     1.0206   1.592 0.111339    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## (Dispersion parameter for binomial family taken to be 1)
## 
##     Null deviance: 101.841  on 77  degrees of freedom
## Residual deviance:  83.452  on 73  degrees of freedom
## AIC: 93.452
## 
## Number of Fisher Scoring iterations: 5
exp(coefficients(mod))
##  (Intercept)   charlson_2 patient_seul          ddi          mek 
##    0.1346779    3.8638133    0.1197958    3.2258724    5.0783667
exp(confint(mod, level=0.95))
## Attente de la réalisation du profilage...
##                   2.5 %     97.5 %
## (Intercept)  0.03725841  0.3882517
## charlson_2   1.28050791 13.0726810
## patient_seul 0.00590895  0.7892842
## ddi          1.13751425  9.8245571
## mek          0.76904606 51.3576888
mod%>%tbl_regression(intercept = TRUE, exponentiate = TRUE)
Characteristic OR1 95% CI1 p-value
(Intercept) 0.13 0.04, 0.39 <0.001
score de charlson >=2 (hors tumeur) 3.86 1.28, 13.1 0.021
patient vivant seul 0.12 0.01, 0.79 0.063
patient avec interaction médicamenteuse 3.23 1.14, 9.82 0.032
patient traité par inhibiteurs de Mek seul 5.08 0.77, 51.4 0.11
1 OR = Odds Ratio, CI = Confidence Interval
##modele final sur signification des covariables
mod<-glm(  tox3mois ~ charlson_2+ddi, data=dermato_g, family="binomial")
summary(mod)
## 
## Call:
## glm(formula = tox3mois ~ charlson_2 + ddi, family = "binomial", 
##     data = dermato_g)
## 
## Deviance Residuals: 
##     Min       1Q   Median       3Q      Max  
## -1.3414  -0.9073  -0.5155   1.0218   2.0417  
## 
## Coefficients:
##             Estimate Std. Error z value Pr(>|z|)    
## (Intercept)  -1.9513     0.5496  -3.550 0.000385 ***
## charlson_2    1.2765     0.5548   2.301 0.021407 *  
## ddi           1.0525     0.5093   2.066 0.038794 *  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## (Dispersion parameter for binomial family taken to be 1)
## 
##     Null deviance: 101.84  on 77  degrees of freedom
## Residual deviance:  91.00  on 75  degrees of freedom
## AIC: 97
## 
## Number of Fisher Scoring iterations: 3
exp(coefficients(mod))
## (Intercept)  charlson_2         ddi 
##   0.1420841   3.5841588   2.8646922
exp(confint(mod, level=0.95))
## Attente de la réalisation du profilage...
##                  2.5 %     97.5 %
## (Intercept) 0.04337382  0.3834649
## charlson_2  1.26175777 11.4165423
## ddi         1.07390060  8.0233616
mod%>%tbl_regression(intercept = TRUE, exponentiate = TRUE)
Characteristic OR1 95% CI1 p-value
(Intercept) 0.14 0.04, 0.38 <0.001
score de charlson >=2 (hors tumeur) 3.58 1.26, 11.4 0.021
patient avec interaction médicamenteuse 2.86 1.07, 8.02 0.039
1 OR = Odds Ratio, CI = Confidence Interval
##Analmyse multivariée avec Charlson à 3 

mod<-glm(  tox3mois ~ charlson_3+comprehension+actif_pro+patient_seul+polymedique+ddi+rque_pharma_ei+mek, data=dermato_g, family="binomial")
summary(mod)
## 
## Call:
## glm(formula = tox3mois ~ charlson_3 + comprehension + actif_pro + 
##     patient_seul + polymedique + ddi + rque_pharma_ei + mek, 
##     family = "binomial", data = dermato_g)
## 
## Deviance Residuals: 
##     Min       1Q   Median       3Q      Max  
## -1.7335  -0.8142  -0.4792   0.8408   2.1078  
## 
## Coefficients:
##                Estimate Std. Error z value Pr(>|z|)  
## (Intercept)     -1.6483     0.7016  -2.349   0.0188 *
## charlson_3       1.1978     0.6745   1.776   0.0757 .
## comprehension    0.6859     0.9154   0.749   0.4537  
## actif_pro       -0.4584     0.9686  -0.473   0.6360  
## patient_seul    -2.2547     1.1465  -1.967   0.0492 *
## polymedique     -0.4123     0.6503  -0.634   0.5261  
## ddi              0.9035     0.6331   1.427   0.1535  
## rque_pharma_ei   0.8762     0.6327   1.385   0.1661  
## mek              1.7013     1.0874   1.565   0.1177  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## (Dispersion parameter for binomial family taken to be 1)
## 
##     Null deviance: 101.841  on 77  degrees of freedom
## Residual deviance:  79.732  on 69  degrees of freedom
## AIC: 97.732
## 
## Number of Fisher Scoring iterations: 5
exp(coefficients(mod))
##    (Intercept)     charlson_3  comprehension      actif_pro   patient_seul 
##      0.1923863      3.3128026      1.9854668      0.6322745      0.1048999 
##    polymedique            ddi rque_pharma_ei            mek 
##      0.6621342      2.4681398      2.4017258      5.4808730
exp(confint(mod, level=0.95))
## Attente de la réalisation du profilage...
##                      2.5 %     97.5 %
## (Intercept)    0.043303100  0.7009033
## charlson_3     0.924881480 13.4864322
## comprehension  0.339805771 13.5197255
## actif_pro      0.075320717  3.9429607
## patient_seul   0.005135477  0.7021183
## polymedique    0.173837611  2.3028880
## ddi            0.729488997  8.9799431
## rque_pharma_ei 0.700048733  8.5676987
## mek            0.730532778 62.9494425
mod%>%tbl_regression(intercept = TRUE, exponentiate = TRUE)
Characteristic OR1 95% CI1 p-value
(Intercept) 0.19 0.04, 0.70 0.019
charlson_3 3.31 0.92, 13.5 0.076
patient avec difficulté de comprehension 1.99 0.34, 13.5 0.5
patient avec activité professionnelle 0.63 0.08, 3.94 0.6
patient vivant seul 0.10 0.01, 0.70 0.049
patient polymediqué 0.66 0.17, 2.30 0.5
patient avec interaction médicamenteuse 2.47 0.73, 8.98 0.2
rque_pharma_ei 2.40 0.70, 8.57 0.2
patient traité par inhibiteurs de Mek seul 5.48 0.73, 62.9 0.12
1 OR = Odds Ratio, CI = Confidence Interval
step(mod)
## Start:  AIC=97.73
## tox3mois ~ charlson_3 + comprehension + actif_pro + patient_seul + 
##     polymedique + ddi + rque_pharma_ei + mek
## 
##                  Df Deviance     AIC
## - actif_pro       1   79.963  95.963
## - polymedique     1   80.143  96.143
## - comprehension   1   80.308  96.308
## - rque_pharma_ei  1   81.674  97.674
## <none>                79.732  97.732
## - ddi             1   81.833  97.833
## - mek             1   82.450  98.450
## - charlson_3      1   83.108  99.108
## - patient_seul    1   85.402 101.402
## 
## Step:  AIC=95.96
## tox3mois ~ charlson_3 + comprehension + patient_seul + polymedique + 
##     ddi + rque_pharma_ei + mek
## 
##                  Df Deviance    AIC
## - polymedique     1   80.375 94.375
## - comprehension   1   80.507 94.507
## <none>                79.963 95.963
## - rque_pharma_ei  1   82.048 96.048
## - ddi             1   82.707 96.707
## - mek             1   82.947 96.947
## - charlson_3      1   85.121 99.121
## - patient_seul    1   85.790 99.790
## 
## Step:  AIC=94.37
## tox3mois ~ charlson_3 + comprehension + patient_seul + ddi + 
##     rque_pharma_ei + mek
## 
##                  Df Deviance    AIC
## - comprehension   1   81.081 93.081
## - rque_pharma_ei  1   82.176 94.176
## <none>                80.375 94.375
## - ddi             1   82.746 94.746
## - mek             1   83.266 95.266
## - charlson_3      1   85.133 97.133
## - patient_seul    1   86.036 98.036
## 
## Step:  AIC=93.08
## tox3mois ~ charlson_3 + patient_seul + ddi + rque_pharma_ei + 
##     mek
## 
##                  Df Deviance    AIC
## - rque_pharma_ei  1   82.855 92.855
## <none>                81.081 93.081
## - ddi             1   83.758 93.758
## - mek             1   83.944 93.944
## - patient_seul    1   86.321 96.321
## - charlson_3      1   86.522 96.522
## 
## Step:  AIC=92.85
## tox3mois ~ charlson_3 + patient_seul + ddi + mek
## 
##                Df Deviance    AIC
## <none>              82.855 92.855
## - mek           1   84.942 92.942
## - ddi           1   87.477 95.477
## - patient_seul  1   87.933 95.933
## - charlson_3    1   89.274 97.274
## 
## Call:  glm(formula = tox3mois ~ charlson_3 + patient_seul + ddi + mek, 
##     family = "binomial", data = dermato_g)
## 
## Coefficients:
##  (Intercept)    charlson_3  patient_seul           ddi           mek  
##       -1.793         1.361        -2.134         1.149         1.414  
## 
## Degrees of Freedom: 77 Total (i.e. Null);  73 Residual
## Null Deviance:       101.8 
## Residual Deviance: 82.85     AIC: 92.85
##modele final sur critere aikake
mod<-glm(  tox3mois ~ charlson_3+patient_seul+ddi+mek, data=dermato_g, family="binomial")
summary(mod)
## 
## Call:
## glm(formula = tox3mois ~ charlson_3 + patient_seul + ddi + mek, 
##     family = "binomial", data = dermato_g)
## 
## Deviance Residuals: 
##     Min       1Q   Median       3Q      Max  
## -1.6125  -0.9188  -0.5548   0.8918   1.9735  
## 
## Coefficients:
##              Estimate Std. Error z value Pr(>|z|)    
## (Intercept)   -1.7934     0.5165  -3.472 0.000516 ***
## charlson_3     1.3609     0.5505   2.472 0.013433 *  
## patient_seul  -2.1339     1.1425  -1.868 0.061782 .  
## ddi            1.1493     0.5474   2.099 0.035783 *  
## mek            1.4143     1.0277   1.376 0.168746    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## (Dispersion parameter for binomial family taken to be 1)
## 
##     Null deviance: 101.841  on 77  degrees of freedom
## Residual deviance:  82.855  on 73  degrees of freedom
## AIC: 92.855
## 
## Number of Fisher Scoring iterations: 5
exp(coefficients(mod))
##  (Intercept)   charlson_3 patient_seul          ddi          mek 
##    0.1664016    3.8996595    0.1183692    3.1558634    4.1136876
exp(confint(mod, level=0.95))
## Attente de la réalisation du profilage...
##                    2.5 %     97.5 %
## (Intercept)  0.054608222  0.4239110
## charlson_3   1.356225754 11.9491629
## patient_seul 0.005814189  0.7825451
## ddi          1.105450838  9.6497309
## mek          0.611002798 41.9602737
mod%>%tbl_regression(intercept = TRUE, exponentiate = TRUE)
Characteristic OR1 95% CI1 p-value
(Intercept) 0.17 0.05, 0.42 <0.001
charlson_3 3.90 1.36, 11.9 0.013
patient vivant seul 0.12 0.01, 0.78 0.062
patient avec interaction médicamenteuse 3.16 1.11, 9.65 0.036
patient traité par inhibiteurs de Mek seul 4.11 0.61, 42.0 0.2
1 OR = Odds Ratio, CI = Confidence Interval
##modele final sur signification covariabels
mod<-glm(  tox3mois ~ charlson_3+ddi, data=dermato_g, family="binomial")
summary(mod)
## 
## Call:
## glm(formula = tox3mois ~ charlson_3 + ddi, family = "binomial", 
##     data = dermato_g)
## 
## Deviance Residuals: 
##     Min       1Q   Median       3Q      Max  
## -1.4331  -0.8824  -0.5470   0.9416   1.9868  
## 
## Coefficients:
##             Estimate Std. Error z value Pr(>|z|)    
## (Intercept)  -1.8241     0.4914  -3.712 0.000205 ***
## charlson_3    1.3261     0.5173   2.563 0.010365 *  
## ddi           1.0815     0.5151   2.100 0.035770 *  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## (Dispersion parameter for binomial family taken to be 1)
## 
##     Null deviance: 101.841  on 77  degrees of freedom
## Residual deviance:  89.833  on 75  degrees of freedom
## AIC: 95.833
## 
## Number of Fisher Scoring iterations: 3
exp(coefficients(mod))
## (Intercept)  charlson_3         ddi 
##   0.1613696   3.7661749   2.9492436
exp(confint(mod, level=0.95))
## Attente de la réalisation du profilage...
##                  2.5 %    97.5 %
## (Intercept) 0.05636702  0.394456
## charlson_3  1.40124907 10.818284
## ddi         1.09520065  8.382527
mod%>%tbl_regression(intercept = TRUE, exponentiate = TRUE)
Characteristic OR1 95% CI1 p-value
(Intercept) 0.16 0.06, 0.39 <0.001
charlson_3 3.77 1.40, 10.8 0.010
patient avec interaction médicamenteuse 2.95 1.10, 8.38 0.036
1 OR = Odds Ratio, CI = Confidence Interval
mod%>%tbl_regression(intercept = TRUE, exponentiate = TRUE)
Characteristic OR1 95% CI1 p-value
(Intercept) 0.16 0.06, 0.39 <0.001
charlson_3 3.77 1.40, 10.8 0.010
patient avec interaction médicamenteuse 2.95 1.10, 8.38 0.036
1 OR = Odds Ratio, CI = Confidence Interval