##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)
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_poolees <- read_excel("Y:/fp/FAC/2023-2024/Memoires DES/Guillaume Flandin/20240606/data_guillaume_poolees.xlsx")
## New names:
## • `Détail` -> `Détail...42`
## • `Détail` -> `Détail...49`
## • `Détail` -> `Détail...58`
## • `Détail` -> `Détail...60`
##recodage bases de données le cas échéant----

pool_g<-filter(data_guillaume_poolees, c(eligible_etude=="1" ))

##recodage de données le cas échéant----
pool_g$charlson_2<-ifelse(pool_g$charlson>=2, 1, 0)
pool_g$charlson_3<-ifelse(pool_g$charlson>=3, 1, 0)
pool_g$charlson_4<-ifelse(pool_g$charlson>=4, 1, 0)
pool_g$charlson_5<-ifelse(pool_g$charlson>=5, 1, 0)
pool_g$adjuvant<-ifelse(pool_g$metastatique==0, 1, 0)
pool_g$raf_mek<-ifelse(pool_g$classe_medt=="raf_mek", 1, 0)
pool_g$egfr<-ifelse(pool_g$classe_medt=="egfr", 1, 0)
pool_g$alk<-ifelse(pool_g$classe_medt=="alk", 1, 0)
pool_g$cytotox<-ifelse(pool_g$classe_medt=="cytotox", 1, 0)
pool_g$kras<-ifelse(pool_g$classe_medt=="kras", 1, 0)
pool_g$ret<-ifelse(pool_g$classe_medt=="ret", 1, 0)
pool_g$vegfr<-ifelse(pool_g$classe_medt=="vegfr", 1, 0)
pool_g$mek<-ifelse(pool_g$classe_medt=="mek", 1, 0)
pool_g$hedgehog<-ifelse(pool_g$classe_medt=="hedgehog", 1, 0)
pool_g$pneumovsdermato<-ifelse(pool_g$spe_medicale=="pneumo", 1, 0)

##renommer des variables pour présentation dans les tableaux de résultats
library(labelled)
var_label(pool_g$type_evt) <- "evenement lié au médicament"
var_label(pool_g$consequence_evt) <- "conséquence des evenements liés au médicament"
var_label(pool_g$meta_snc) <- "presence de métastase cérébrale"
var_label(pool_g$polymedique) <- "patient polymediqué"         
var_label(pool_g$comprehension) <- "patient avec difficulté de comprehension"
var_label(pool_g$pb_social) <- "patient avec difficulté sociale"
var_label(pool_g$actif_pro) <- "patient avec activité professionnelle"
var_label(pool_g$ddi) <- "patient avec interaction médicamenteuse"
var_label(pool_g$evt_tox) <- "patient avec evenement lié au médicament"
var_label(pool_g$charlson_2) <- "score de charlson >=2 (hors tumeur)" 
var_label(pool_g$patient_seul) <- "patient vivant seul"
var_label(pool_g$risque_observance) <- "patient avec risque de mauvaise observance"
var_label(pool_g$raf_mek) <- "patient traité par inhibiteurs de Raf et Mek"
var_label(pool_g$egfr) <- "patient traité par inhibiteurs de egfrl"
var_label(pool_g$alk) <- "patient traité par inhibiteurs alk"
var_label(pool_g$cytotox) <- "patient traité par cytotoxique"
var_label(pool_g$ret) <- "patient traité par inhibiteur de ret"
var_label(pool_g$vegfr) <- "patient traité par inhibiteur de vegfr"
var_label(pool_g$kras) <- "patient traité par inhibiteur de RAS"
var_label(pool_g$raf_mek) <- "patient traité par inhibiteurs de Raf et Mek"
var_label(pool_g$mek) <- "patient traité par inhibiteurs de Mek seul"
var_label(pool_g$hedgehog) <- "patient traité par inhibiteurs hedgehog"

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



##tableau descriptif population globales ----
tbl_summary(
  pool_g, include = c("age", "spe_medicale","dci", "raf_mek", "egfr", "alk", "cytotox", "vegfr", "kras", "ret", "hedgehog", "mek", "polymedique","evt_tox", "charlson", "charlson_2", "meta_snc", "comprehension", "pb_social", "actif_pro", "patient_seul", "ddi", "risque_observance"),
  digits=all_categorical()~ c(0,1), 
  by="spe_medicale",
)%>%
  add_overall(last(FALSE), 
)%>%
  add_p()
## There was an error in 'add_p()/add_difference()' for variable 'charlson', p-value omitted:
## Error in stats::fisher.test(c(1, 5, 2, 2, 1, 1, 5, 2, 1, 3, 2, 2, 3, 5, : FEXACT erreur 7(location). LDSTP=18630 est trop petit pour ce problème,
##   (pastp=34.0332, ipn_0:=ipoin[itp=274]=1577, stp[ipn_0]=35.369).
## Augmentez la taille de l’environnement de travail ou considérez l’utilisation de ‘simulate.p.value=TRUE’.
Characteristic Overall, N = 1721 dermato, N = 781 pneumo, N = 941 p-value2
age 66 (56, 75) 66 (52, 75) 67 (58, 75) 0.3
dci <0.001
    Afatinib 5 (2.9%) 0 (0.0%) 5 (5.3%)
    ALECTINIB 4 (2.3%) 0 (0.0%) 4 (4.3%)
    BRIGATINIB 7 (4.1%) 0 (0.0%) 7 (7.4%)
    CABOZANTINIB 1 (0.6%) 0 (0.0%) 1 (1.1%)
    CRIZOTINIB 2 (1.2%) 0 (0.0%) 2 (2.1%)
    Dabrafenib / Trametinib 37 (21.5%) 37 (47.4%) 0 (0.0%)
    Dabrafénib / Tramétinib 7 (4.1%) 0 (0.0%) 7 (7.4%)
    Encorafenib binimetinib 17 (9.9%) 17 (21.8%) 0 (0.0%)
    Erlotinib 1 (0.6%) 0 (0.0%) 1 (1.1%)
    Etoposide 1 (0.6%) 1 (1.3%) 0 (0.0%)
    Everolimus 7 (4.1%) 0 (0.0%) 7 (7.4%)
    Géfitinib 1 (0.6%) 0 (0.0%) 1 (1.1%)
    Lorlatinib 1 (0.6%) 0 (0.0%) 1 (1.1%)
    LORLATINIB 8 (4.7%) 0 (0.0%) 8 (8.5%)
    MOBOCERTINIB 2 (1.2%) 0 (0.0%) 2 (2.1%)
    Osimertinib 36 (20.9%) 0 (0.0%) 36 (38.3%)
    Osimertinib + Crizotinib 1 (0.6%) 0 (0.0%) 1 (1.1%)
    PRALSETINIB 1 (0.6%) 0 (0.0%) 1 (1.1%)
    Sonidegib 9 (5.2%) 9 (11.5%) 0 (0.0%)
    SOTORASIB 8 (4.7%) 0 (0.0%) 8 (8.5%)
    Sunitinib 1 (0.6%) 0 (0.0%) 1 (1.1%)
    Trametinib 6 (3.5%) 6 (7.7%) 0 (0.0%)
    Vismodegib 8 (4.7%) 8 (10.3%) 0 (0.0%)
    XELODA+TEMODAL 1 (0.6%) 0 (0.0%) 1 (1.1%)
patient traité par inhibiteurs de Raf et Mek 61 (35.5%) 54 (69.2%) 7 (7.4%) <0.001
patient traité par inhibiteurs de egfrl 45 (26.2%) 0 (0.0%) 45 (47.9%) <0.001
patient traité par inhibiteurs alk 22 (12.8%) 0 (0.0%) 22 (23.4%) <0.001
patient traité par cytotoxique 2 (1.2%) 1 (1.3%) 1 (1.1%) >0.9
patient traité par inhibiteur de vegfr 2 (1.2%) 0 (0.0%) 2 (2.1%) 0.5
patient traité par inhibiteur de RAS 8 (4.7%) 0 (0.0%) 8 (8.5%) 0.008
patient traité par inhibiteur de ret 1 (0.6%) 0 (0.0%) 1 (1.1%) >0.9
patient traité par inhibiteurs hedgehog 17 (9.9%) 17 (21.8%) 0 (0.0%) <0.001
patient traité par inhibiteurs de Mek seul 6 (3.5%) 6 (7.7%) 0 (0.0%) 0.008
patient polymediqué 86 (50.0%) 42 (53.8%) 44 (46.8%) 0.4
patient avec evenement lié au médicament 93 (54.1%) 63 (80.8%) 30 (31.9%) <0.001
charlson
    0 16 (9.3%) 12 (15.4%) 4 (4.3%)
    1 32 (18.6%) 19 (24.4%) 13 (13.8%)
    2 30 (17.4%) 10 (12.8%) 20 (21.3%)
    3 38 (22.1%) 12 (15.4%) 26 (27.7%)
    4 26 (15.1%) 9 (11.5%) 17 (18.1%)
    5 17 (9.9%) 10 (12.8%) 7 (7.4%)
    6 9 (5.2%) 5 (6.4%) 4 (4.3%)
    7 1 (0.6%) 0 (0.0%) 1 (1.1%)
    8 3 (1.7%) 1 (1.3%) 2 (2.1%)
score de charlson >=2 (hors tumeur) 124 (72.1%) 47 (60.3%) 77 (81.9%) 0.002
presence de métastase cérébrale 40 (23.3%) 11 (14.1%) 29 (30.9%) 0.010
patient avec difficulté de comprehension 15 (8.7%) 9 (11.5%) 6 (6.4%) 0.2
patient avec difficulté sociale 19 (11.0%) 14 (17.9%) 5 (5.3%) 0.009
patient avec activité professionnelle 45 (26.2%) 17 (21.8%) 28 (29.8%) 0.2
patient vivant seul 21 (12.2%) 10 (12.8%) 11 (11.7%) 0.8
patient avec interaction médicamenteuse 107 (62.2%) 43 (55.1%) 64 (68.1%) 0.081
patient avec risque de mauvaise observance 28 (16.3%) 17 (21.8%) 11 (11.7%) 0.074
1 Median (IQR); n (%)
2 Wilcoxon rank sum test; Fisher’s exact test; Pearson’s Chi-squared test
##modèles de cox ANALYSE UNIVARIEE sur data poolé PFtox pondéré par la valeur mediane d'apparition observée poru chaque pathologie----

####charlson en valeur continue
modsurv<-coxph(Surv(pftox_mediane, evt_tox)~charlson, data=pool_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
charlson 1.14 1.02, 1.27 0.019
1 HR = Hazard Ratio, CI = Confidence Interval
####charlson >=2---
modsurv<-coxph(Surv(pftox_mediane, evt_tox)~charlson_2, data=pool_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
score de charlson >=2 (hors tumeur) 1.38 0.88, 2.18 0.2
1 HR = Hazard Ratio, CI = Confidence Interval
####charlson >=3---
modsurv<-coxph(Surv(pftox_mediane, evt_tox)~charlson_3, data=pool_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
charlson_3 1.45 0.95, 2.20 0.081
1 HR = Hazard Ratio, CI = Confidence Interval
####charlson >=4---
modsurv<-coxph(Surv(pftox_mediane, evt_tox)~charlson_4, data=pool_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
charlson_4 1.68 1.11, 2.55 0.015
1 HR = Hazard Ratio, CI = Confidence Interval
####charlson >=5---
modsurv<-coxph(Surv(pftox_mediane, evt_tox)~charlson_5, data=pool_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
charlson_5 1.89 1.17, 3.07 0.010
1 HR = Hazard Ratio, CI = Confidence Interval
####présence de méta cérébrale
modsurv<-coxph(Surv(pftox_mediane, evt_tox)~meta_snc, data=pool_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
presence de métastase cérébrale 0.66 0.38, 1.12 0.12
1 HR = Hazard Ratio, CI = Confidence Interval
####problème de compréhension
modsurv<-coxph(Surv(pftox_mediane, evt_tox)~comprehension, data=pool_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient avec difficulté de comprehension 2.10 1.11, 3.98 0.023
1 HR = Hazard Ratio, CI = Confidence Interval
####problème social
modsurv<-coxph(Surv(pftox_mediane, evt_tox)~pb_social, data=pool_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient avec difficulté sociale 1.10 0.59, 2.08 0.8
1 HR = Hazard Ratio, CI = Confidence Interval
####patient vivant seul
modsurv<-coxph(Surv(pftox_mediane, evt_tox)~patient_seul, data=pool_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient vivant seul 1.38 0.79, 2.40 0.3
1 HR = Hazard Ratio, CI = Confidence Interval
####activité professionnelle
modsurv<-coxph(Surv(pftox_mediane, evt_tox)~actif_pro, data=pool_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient avec activité professionnelle 0.64 0.40, 1.04 0.072
1 HR = Hazard Ratio, CI = Confidence Interval
####interaction médicamenteuse
modsurv<-coxph(Surv(pftox_mediane, evt_tox)~ddi, data=pool_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient avec interaction médicamenteuse 0.96 0.63, 1.46 0.9
1 HR = Hazard Ratio, CI = Confidence Interval
####patient polymédiqué
modsurv<-coxph(Surv(pftox_mediane, evt_tox)~polymedique, data=pool_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient polymediqué 1.32 0.87, 1.99 0.2
1 HR = Hazard Ratio, CI = Confidence Interval
####patient avec risque de mauvaise observance
modsurv<-coxph(Surv(pftox_mediane, evt_tox)~risque_observance, data=pool_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient avec risque de mauvaise observance 1.25 0.74, 2.13 0.4
1 HR = Hazard Ratio, CI = Confidence Interval
####stade adjuvant vs autres 
modsurv<-coxph(Surv(pftox_mediane, evt_tox)~adjuvant, data=pool_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
adjuvant 0.95 0.23, 4.00 >0.9
1 HR = Hazard Ratio, CI = Confidence Interval
##patient traité par combo raf_mek
modsurv<-coxph(Surv(pftox_mediane, evt_tox)~raf_mek, data=pool_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient traité par inhibiteurs de Raf et Mek 2.03 1.34, 3.07 <0.001
1 HR = Hazard Ratio, CI = Confidence Interval
##patient traité par cytotox
modsurv<-coxph(Surv(pftox_mediane, evt_tox)~cytotox, data=pool_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient traité par cytotoxique 0.77 0.11, 5.55 0.8
1 HR = Hazard Ratio, CI = Confidence Interval
##patient traité par inhibiteur egfr
modsurv<-coxph(Surv(pftox_mediane, evt_tox)~egfr, data=pool_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient traité par inhibiteurs de egfrl 0.28 0.15, 0.54 <0.001
1 HR = Hazard Ratio, CI = Confidence Interval
##patient traité par inhibiteur alk
modsurv<-coxph(Surv(pftox_mediane, evt_tox)~alk, data=pool_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient traité par inhibiteurs alk 0.43 0.19, 0.99 0.048
1 HR = Hazard Ratio, CI = Confidence Interval
##patient traité par inhibiteur vegfr
modsurv<-coxph(Surv(pftox_mediane, evt_tox)~vegfr, data=pool_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient traité par inhibiteur de vegfr 3.04 0.42, 22.1 0.3
1 HR = Hazard Ratio, CI = Confidence Interval
##patient traité par inhibiteur ret
modsurv<-coxph(Surv(pftox_mediane, evt_tox)~ret, data=pool_g)
## Warning in coxph.fit(X, Y, istrat, offset, init, control, weights = weights, :
## Loglik converged before variable 1 ; coefficient may be infinite.
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient traité par inhibiteur de ret 0.00 0.00, Inf >0.9
1 HR = Hazard Ratio, CI = Confidence Interval
##patient traité par inhibiteur ras
modsurv<-coxph(Surv(pftox_mediane, evt_tox)~kras, data=pool_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient traité par inhibiteur de RAS 2.19 0.79, 6.09 0.13
1 HR = Hazard Ratio, CI = Confidence Interval
##patient traité par mek seul
modsurv<-coxph(Surv(pftox_mediane, evt_tox)~mek, data=pool_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient traité par inhibiteurs de Mek seul 4.06 1.44, 11.4 0.008
1 HR = Hazard Ratio, CI = Confidence Interval
##patient traité par hedgehog
modsurv<-coxph(Surv(pftox_mediane, evt_tox)~hedgehog, data=pool_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient traité par inhibiteurs hedgehog 1.51 0.88, 2.59 0.14
1 HR = Hazard Ratio, CI = Confidence Interval
##patient pneumo vs dermato
modsurv<-coxph(Surv(pftox_mediane, evt_tox)~pneumovsdermato, data=pool_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
pneumovsdermato 0.38 0.25, 0.59 <0.001
1 HR = Hazard Ratio, CI = Confidence Interval
###ANALYSE MULTIVARIEE Avec Charlson >=2
modsurv<-coxph(Surv(pftox_mediane, evt_tox)~pneumovsdermato+hedgehog+mek+alk+egfr+raf_mek+polymedique+actif_pro+comprehension+meta_snc+charlson_2, data=pool_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
pneumovsdermato 0.92 0.36, 2.35 0.9
patient traité par inhibiteurs hedgehog 1.03 0.31, 3.43 >0.9
patient traité par inhibiteurs de Mek seul 2.91 0.65, 13.1 0.2
patient traité par inhibiteurs alk 0.42 0.14, 1.24 0.12
patient traité par inhibiteurs de egfrl 0.30 0.12, 0.74 0.009
patient traité par inhibiteurs de Raf et Mek 1.26 0.45, 3.58 0.7
patient polymediqué 1.10 0.72, 1.69 0.7
patient avec activité professionnelle 0.88 0.48, 1.59 0.7
patient avec difficulté de comprehension 1.77 0.90, 3.46 0.10
presence de métastase cérébrale 0.92 0.51, 1.67 0.8
score de charlson >=2 (hors tumeur) 1.52 0.85, 2.71 0.2
1 HR = Hazard Ratio, CI = Confidence Interval
step(modsurv)
## Start:  AIC=802.74
## Surv(pftox_mediane, evt_tox) ~ pneumovsdermato + hedgehog + mek + 
##     alk + egfr + raf_mek + polymedique + actif_pro + comprehension + 
##     meta_snc + charlson_2
## 
##                   Df    AIC
## - hedgehog         1 800.75
## - pneumovsdermato  1 800.77
## - meta_snc         1 800.81
## - actif_pro        1 800.94
## - polymedique      1 800.94
## - raf_mek          1 800.94
## - mek              1 802.54
## <none>               802.74
## - charlson_2       1 802.85
## - comprehension    1 803.21
## - alk              1 803.33
## - egfr             1 807.25
## 
## Step:  AIC=800.75
## Surv(pftox_mediane, evt_tox) ~ pneumovsdermato + mek + alk + 
##     egfr + raf_mek + polymedique + actif_pro + comprehension + 
##     meta_snc + charlson_2
## 
##                   Df    AIC
## - meta_snc         1 798.82
## - pneumovsdermato  1 798.84
## - actif_pro        1 798.94
## - polymedique      1 798.94
## - raf_mek          1 799.34
## <none>               800.75
## - charlson_2       1 800.87
## - comprehension    1 801.31
## - mek              1 801.37
## - alk              1 801.64
## - egfr             1 806.42
## 
## Step:  AIC=798.82
## Surv(pftox_mediane, evt_tox) ~ pneumovsdermato + mek + alk + 
##     egfr + raf_mek + polymedique + actif_pro + comprehension + 
##     charlson_2
## 
##                   Df    AIC
## - pneumovsdermato  1 796.90
## - polymedique      1 797.00
## - actif_pro        1 797.01
## - raf_mek          1 797.36
## <none>               798.82
## - charlson_2       1 798.89
## - mek              1 799.38
## - comprehension    1 799.39
## - alk              1 800.50
## - egfr             1 805.33
## 
## Step:  AIC=796.9
## Surv(pftox_mediane, evt_tox) ~ mek + alk + egfr + raf_mek + polymedique + 
##     actif_pro + comprehension + charlson_2
## 
##                 Df    AIC
## - polymedique    1 795.07
## - actif_pro      1 795.14
## - raf_mek        1 795.62
## - charlson_2     1 796.89
## <none>             796.90
## - comprehension  1 797.59
## - mek            1 797.66
## - alk            1 800.50
## - egfr           1 808.56
## 
## Step:  AIC=795.07
## Surv(pftox_mediane, evt_tox) ~ mek + alk + egfr + raf_mek + actif_pro + 
##     comprehension + charlson_2
## 
##                 Df    AIC
## - actif_pro      1 793.36
## - raf_mek        1 793.91
## <none>             795.07
## - charlson_2     1 795.19
## - comprehension  1 795.76
## - mek            1 795.98
## - alk            1 798.64
## - egfr           1 806.67
## 
## Step:  AIC=793.36
## Surv(pftox_mediane, evt_tox) ~ mek + alk + egfr + raf_mek + comprehension + 
##     charlson_2
## 
##                 Df    AIC
## - raf_mek        1 792.53
## <none>             793.36
## - comprehension  1 794.00
## - mek            1 794.59
## - charlson_2     1 795.80
## - alk            1 796.89
## - egfr           1 804.74
## 
## Step:  AIC=792.53
## Surv(pftox_mediane, evt_tox) ~ mek + alk + egfr + comprehension + 
##     charlson_2
## 
##                 Df    AIC
## <none>             792.53
## - comprehension  1 793.02
## - mek            1 793.11
## - charlson_2     1 794.38
## - alk            1 800.33
## - egfr           1 815.07
## Call:
## coxph(formula = Surv(pftox_mediane, evt_tox) ~ mek + alk + egfr + 
##     comprehension + charlson_2, data = pool_g)
## 
##                  coef exp(coef) se(coef)      z        p
## mek            0.9686    2.6344   0.5341  1.813  0.06976
## alk           -1.1385    0.3203   0.4264 -2.670  0.00758
## egfr          -1.4417    0.2365   0.3412 -4.226 2.38e-05
## comprehension  0.5581    1.7473   0.3326  1.678  0.09332
## charlson_2     0.4507    1.5694   0.2359  1.911  0.05601
## 
## Likelihood ratio test=39.99  on 5 df, p=1.5e-07
## n= 172, number of events= 93
####Modèle intermédiaire

modsurv<-coxph(Surv(pftox_mediane, evt_tox)~mek+alk+egfr+comprehension+charlson_2, data=pool_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient traité par inhibiteurs de Mek seul 2.63 0.92, 7.50 0.070
patient traité par inhibiteurs alk 0.32 0.14, 0.74 0.008
patient traité par inhibiteurs de egfrl 0.24 0.12, 0.46 <0.001
patient avec difficulté de comprehension 1.75 0.91, 3.35 0.093
score de charlson >=2 (hors tumeur) 1.57 0.99, 2.49 0.056
1 HR = Hazard Ratio, CI = Confidence Interval
####Modèle final 
modsurv<-coxph(Surv(pftox_mediane, evt_tox)~mek+alk+egfr+charlson_2, data=pool_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient traité par inhibiteurs de Mek seul 2.83 1.00, 8.02 0.050
patient traité par inhibiteurs alk 0.33 0.14, 0.76 0.009
patient traité par inhibiteurs de egfrl 0.23 0.12, 0.44 <0.001
score de charlson >=2 (hors tumeur) 1.63 1.03, 2.58 0.036
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 MULTIVARIEE Avec Charlson >=3
modsurv<-coxph(Surv(pftox_mediane, evt_tox)~pneumovsdermato+hedgehog+mek+alk+egfr+raf_mek+polymedique+actif_pro+comprehension+meta_snc+charlson_3, data=pool_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
pneumovsdermato 0.82 0.33, 2.05 0.7
patient traité par inhibiteurs hedgehog 0.82 0.25, 2.69 0.7
patient traité par inhibiteurs de Mek seul 2.38 0.54, 10.4 0.2
patient traité par inhibiteurs alk 0.38 0.13, 1.11 0.078
patient traité par inhibiteurs de egfrl 0.27 0.11, 0.67 0.005
patient traité par inhibiteurs de Raf et Mek 1.13 0.41, 3.09 0.8
patient polymediqué 1.02 0.65, 1.58 >0.9
patient avec activité professionnelle 0.96 0.53, 1.74 0.9
patient avec difficulté de comprehension 1.76 0.90, 3.42 0.10
presence de métastase cérébrale 0.90 0.50, 1.63 0.7
charlson_3 1.82 1.04, 3.18 0.036
1 HR = Hazard Ratio, CI = Confidence Interval
step(modsurv)
## Start:  AIC=800.23
## Surv(pftox_mediane, evt_tox) ~ pneumovsdermato + hedgehog + mek + 
##     alk + egfr + raf_mek + polymedique + actif_pro + comprehension + 
##     meta_snc + charlson_3
## 
##                   Df    AIC
## - polymedique      1 798.23
## - actif_pro        1 798.24
## - raf_mek          1 798.28
## - hedgehog         1 798.33
## - meta_snc         1 798.35
## - pneumovsdermato  1 798.41
## - mek              1 799.48
## <none>               800.23
## - comprehension    1 800.67
## - alk              1 801.47
## - charlson_3       1 802.85
## - egfr             1 805.80
## 
## Step:  AIC=798.23
## Surv(pftox_mediane, evt_tox) ~ pneumovsdermato + hedgehog + mek + 
##     alk + egfr + raf_mek + actif_pro + comprehension + meta_snc + 
##     charlson_3
## 
##                   Df    AIC
## - actif_pro        1 796.25
## - raf_mek          1 796.29
## - hedgehog         1 796.34
## - meta_snc         1 796.36
## - pneumovsdermato  1 796.41
## - mek              1 797.49
## <none>               798.23
## - comprehension    1 798.67
## - alk              1 799.50
## - charlson_3       1 801.16
## - egfr             1 803.83
## 
## Step:  AIC=796.25
## Surv(pftox_mediane, evt_tox) ~ pneumovsdermato + hedgehog + mek + 
##     alk + egfr + raf_mek + comprehension + meta_snc + charlson_3
## 
##                   Df    AIC
## - raf_mek          1 794.31
## - hedgehog         1 794.36
## - meta_snc         1 794.37
## - pneumovsdermato  1 794.45
## - mek              1 795.52
## <none>               796.25
## - comprehension    1 796.69
## - alk              1 797.54
## - charlson_3       1 801.74
## - egfr             1 801.85
## 
## Step:  AIC=794.31
## Surv(pftox_mediane, evt_tox) ~ pneumovsdermato + hedgehog + mek + 
##     alk + egfr + comprehension + meta_snc + charlson_3
## 
##                   Df    AIC
## - meta_snc         1 792.43
## - pneumovsdermato  1 793.13
## - hedgehog         1 793.45
## - mek              1 793.88
## <none>               794.31
## - comprehension    1 794.84
## - alk              1 796.50
## - charlson_3       1 800.04
## - egfr             1 802.37
## 
## Step:  AIC=792.43
## Surv(pftox_mediane, evt_tox) ~ pneumovsdermato + hedgehog + mek + 
##     alk + egfr + comprehension + charlson_3
## 
##                   Df    AIC
## - pneumovsdermato  1 791.17
## - hedgehog         1 791.46
## - mek              1 791.96
## <none>               792.43
## - comprehension    1 792.96
## - alk              1 795.62
## - charlson_3       1 798.04
## - egfr             1 801.45
## 
## Step:  AIC=791.17
## Surv(pftox_mediane, evt_tox) ~ hedgehog + mek + alk + egfr + 
##     comprehension + charlson_3
## 
##                 Df    AIC
## - hedgehog       1 789.78
## - mek            1 791.06
## <none>             791.17
## - comprehension  1 791.82
## - charlson_3     1 796.16
## - alk            1 800.64
## - egfr           1 815.55
## 
## Step:  AIC=789.78
## Surv(pftox_mediane, evt_tox) ~ mek + alk + egfr + comprehension + 
##     charlson_3
## 
##                 Df    AIC
## <none>             789.78
## - mek            1 789.93
## - comprehension  1 790.16
## - charlson_3     1 794.38
## - alk            1 798.64
## - egfr           1 814.20
## Call:
## coxph(formula = Surv(pftox_mediane, evt_tox) ~ mek + alk + egfr + 
##     comprehension + charlson_3, data = pool_g)
## 
##                  coef exp(coef) se(coef)      z        p
## mek            0.8758    2.4008   0.5354  1.636  0.10186
## alk           -1.1916    0.3037   0.4266 -2.793  0.00522
## egfr          -1.5030    0.2225   0.3431 -4.380 1.18e-05
## comprehension  0.5452    1.7250   0.3326  1.639  0.10118
## charlson_3     0.5568    1.7451   0.2187  2.546  0.01089
## 
## Likelihood ratio test=42.75  on 5 df, p=4.162e-08
## n= 172, number of events= 93
###modèle final
modsurv<-coxph(Surv(pftox_mediane, evt_tox)~alk+egfr+charlson_3, data=pool_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic HR1 95% CI1 p-value
patient traité par inhibiteurs alk 0.30 0.13, 0.70 0.005
patient traité par inhibiteurs de egfrl 0.21 0.11, 0.41 <0.001
charlson_3 1.83 1.20, 2.80 0.005
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.