##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_cbnpc <- read_excel("Y:/fp/FAC/2023-2024/Memoires DES/Guillaume Flandin/20240606/data_guillaume_cbnpc.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----
cbnpc<-filter(data_guillaume_cbnpc, c(eligible_etude=="1" ))
##recodage de données le cas échéant----
cbnpc$charlson_2<-ifelse(cbnpc$charlson>=2, 1, 0)
cbnpc$charlson_3<-ifelse(cbnpc$charlson>=3, 1, 0)
cbnpc$charlson_4<-ifelse(cbnpc$charlson>=4, 1, 0)
cbnpc$charlson_5<-ifelse(cbnpc$charlson>=5, 1, 0)
cbnpc$adjuvant<-ifelse(cbnpc$metastatique==0, 1, 0)
cbnpc$raf_mek<-ifelse(cbnpc$classe_medt=="raf_mek", 1, 0)
cbnpc$egfr<-ifelse(cbnpc$classe_medt=="egfr", 1, 0)
cbnpc$alk<-ifelse(cbnpc$classe_medt=="alk", 1, 0)
cbnpc$cytotox<-ifelse(cbnpc$classe_medt=="cytotox", 1, 0)
cbnpc$kras<-ifelse(cbnpc$classe_medt=="kras", 1, 0)
cbnpc$ret<-ifelse(cbnpc$classe_medt=="ret", 1, 0)
cbnpc$vegfr<-ifelse(cbnpc$classe_medt=="vegfr", 1, 0)
cbnpc$pftox_mediane<-cbnpc$pftox/7.23
##renommer des variables pour présentation dans les tableaux de résultats
library(labelled)
var_label(cbnpc$type_evt) <- "evenement lié au médicament"
var_label(cbnpc$consequence_evt) <- "conséquence des evenements liés au médicament"
var_label(cbnpc$meta_snc) <- "presence de métastase cérébrale"
var_label(cbnpc$polymedique) <- "patient polymediqué"
var_label(cbnpc$comprehension) <- "patient avec difficulté de comprehension"
var_label(cbnpc$pb_social) <- "patient avec difficulté sociale"
var_label(cbnpc$actif_pro) <- "patient avec activité professionnelle"
var_label(cbnpc$ddi) <- "patient avec interaction médicamenteuse"
var_label(cbnpc$evt_tox) <- "patient avec evenement lié au médicament"
var_label(cbnpc$charlson_2) <- "score de charlson >=2 (hors tumeur)"
var_label(cbnpc$patient_seul) <- "patient vivant seul"
var_label(cbnpc$risque_observance) <- "patient avec risque de mauvaise observance"
var_label(cbnpc$raf_mek) <- "patient traité par inhibiteurs de Raf et Mek"
var_label(cbnpc$egfr) <- "patient traité par inhibiteurs de egfrl"
var_label(cbnpc$alk) <- "patient traité par inhibiteurs alk"
var_label(cbnpc$cytotox) <- "patient traité par cytotoxique"
var_label(cbnpc$ret) <- "patient traité par inhibiteur de ret"
var_label(cbnpc$vegfr) <- "patient traité par inhibiteur de vegfr"
var_label(cbnpc$kras) <- "patient traité par inhibiteur de RAS"
##réation de variables à plusieurs catégorie selon valeurs variable continue
##tableau descriptif population globales ----
tbl_summary(
cbnpc, include = c("age", "pathologie", "dci", "raf_mek", "egfr", "alk", "cytotox", "vegfr", "kras", "ret", "polymedique","stade", "ligne", "evt_tox", "charlson", "charlson_2", "meta_snc", "comprehension", "pb_social", "actif_pro", "patient_seul", "ddi", "risque_observance"),
digits=all_categorical()~ c(0,1)
)
Characteristic |
N = 94 |
age |
67 (58, 75) |
pathologie |
|
    ADK Bronchique |
82 (87.2%) |
    ADK Thymique |
2 (2.1%) |
    Carcinome épidermoïde |
4 (4.3%) |
    Thymome |
1 (1.1%) |
    THYMOME |
1 (1.1%) |
    Tumeur carcinoïde |
3 (3.2%) |
    Tumeur neuro endocrine |
1 (1.1%) |
dci |
|
    Afatinib |
5 (5.3%) |
    ALECTINIB |
4 (4.3%) |
    BRIGATINIB |
7 (7.4%) |
    CABOZANTINIB |
1 (1.1%) |
    CRIZOTINIB |
2 (2.1%) |
    Dabrafénib / Tramétinib |
7 (7.4%) |
    Erlotinib |
1 (1.1%) |
    Everolimus |
7 (7.4%) |
    Géfitinib |
1 (1.1%) |
    Lorlatinib |
1 (1.1%) |
    LORLATINIB |
8 (8.5%) |
    MOBOCERTINIB |
2 (2.1%) |
    Osimertinib |
36 (38.3%) |
    Osimertinib + Crizotinib |
1 (1.1%) |
    PRALSETINIB |
1 (1.1%) |
    SOTORASIB |
8 (8.5%) |
    Sunitinib |
1 (1.1%) |
    XELODA+TEMODAL |
1 (1.1%) |
patient traité par inhibiteurs de Raf et Mek |
7 (7.4%) |
patient traité par inhibiteurs de egfrl |
45 (47.9%) |
patient traité par inhibiteurs alk |
22 (23.4%) |
patient traité par cytotoxique |
1 (1.1%) |
patient traité par inhibiteur de vegfr |
2 (2.1%) |
patient traité par inhibiteur de RAS |
8 (8.5%) |
patient traité par inhibiteur de ret |
1 (1.1%) |
patient polymediqué |
44 (46.8%) |
stade |
|
    Localement avancé |
2 (2.1%) |
    métastatique |
58 (61.7%) |
    Métastatique |
33 (35.1%) |
    Primitif |
1 (1.1%) |
ligne |
|
    1ère ligne |
39 (41.5%) |
    2ème ligne |
18 (19.1%) |
    3ème ligne |
21 (22.3%) |
    4ème ligne |
6 (6.4%) |
    5ème ligne |
6 (6.4%) |
    6ème ligne |
2 (2.1%) |
    8ème ligne |
1 (1.1%) |
    Récidive |
1 (1.1%) |
patient avec evenement lié au médicament |
30 (31.9%) |
charlson |
|
    0 |
4 (4.3%) |
    1 |
13 (13.8%) |
    2 |
20 (21.3%) |
    3 |
26 (27.7%) |
    4 |
17 (18.1%) |
    5 |
7 (7.4%) |
    6 |
4 (4.3%) |
    7 |
1 (1.1%) |
    8 |
2 (2.1%) |
score de charlson >=2 (hors tumeur) |
77 (81.9%) |
presence de métastase cérébrale |
29 (30.9%) |
patient avec difficulté de comprehension |
6 (6.4%) |
patient avec difficulté sociale |
5 (5.3%) |
patient avec activité professionnelle |
28 (29.8%) |
patient vivant seul |
11 (11.7%) |
patient avec interaction médicamenteuse |
64 (68.1%) |
patient avec risque de mauvaise observance |
11 (11.7%) |
##Description des evènements liés aux traitement
tbl_summary(
cbnpc, include = c("type_evt"),
digits=all_categorical()~ c(0,1)
)
Characteristic |
N = 94 |
evenement lié au médicament |
|
    0 |
64 (68.1%) |
    ANOREXIE ET DIARRHEES GRADE 2 |
1 (1.1%) |
    Anorexie GRADE 2 |
1 (1.1%) |
    ASTHENIE |
1 (1.1%) |
    Asthénie / hyperbilirubinémie |
1 (1.1%) |
    ASTHENIE / Perturbation triglycérides / Glycémie |
1 (1.1%) |
    Asthénie et nausées grade 3 |
1 (1.1%) |
    Asthénie grade 1 / Myalgies grade 1 |
1 (1.1%) |
    Asthénie, AEG |
1 (1.1%) |
    COLITE / MTEV |
1 (1.1%) |
    Conjonctivite bilatérale / Mucite / Syndrome Lyell |
1 (1.1%) |
    CRAMPES DIGESTIVES |
1 (1.1%) |
    CYTOLYSE HEPATIQUE |
1 (1.1%) |
    CYTOLYSE HEPATIQUE GRADE 4 |
1 (1.1%) |
    DECOMPENSATION CARDIAQUE |
1 (1.1%) |
    Décompensation cardiaque gauche / OAP
Dr Mazières ne retrouve pas d'imputabilité dans la biblio à posteriori de l'osimertinib = reprise ttt |
1 (1.1%) |
    DELIRE, Troubles Psy |
1 (1.1%) |
    DIARRHEES / CONSTIPATION |
1 (1.1%) |
    DIARRHEES GRADE 2 |
1 (1.1%) |
    Diarrhées grade 2 |
1 (1.1%) |
    DIARRHEES GRADE 2 / VOMISSEMENTS GRADE 2 |
1 (1.1%) |
    EMBOLIE PULMONAIRE (THROMBUS INTRACARDIAQUE) |
1 (1.1%) |
    Hypertension |
1 (1.1%) |
    OEDEMES GRADE 2 / DEPRESSION (dérégulation thymique) / HYPERTRIGLYCERIDEMIE |
1 (1.1%) |
    Pneumopathie grade 2, OMI et crampes grade 2 |
1 (1.1%) |
    Pneumopathie liée au traitement |
1 (1.1%) |
    Toxicité cutanée grade 1 / diarrhées grade 1 |
1 (1.1%) |
    TOXICITE CUTANEO MUQUEUSE / TOXICIT2 Digestive grade 2 |
1 (1.1%) |
    TOXIDERMIE GRADE 2 |
1 (1.1%) |
    TROUBLES DIGESTIFS GRADE 2-3 (DIARRHEES / CONSTIPATIONS) |
1 (1.1%) |
    TROUBLES MNESIQUES / ASTHENIE |
1 (1.1%) |
##Conséquences des évènements liés aux traitement
tbl_summary(
cbnpc, include = c("consequence_evt"),
digits=all_categorical()~ c(0,1)
)
Characteristic |
N = 94 |
conséquence des evenements liés au médicament |
|
    ARRET DEFINITIF |
7 (23.3%) |
    ARRET DEFINITIF CRIZOTINIB |
1 (3.3%) |
    ARRET DEFINITIF MEKINIST |
1 (3.3%) |
    ARRET TEMPORAIRE |
3 (10.0%) |
    Arret temporaire / Concession posologique |
2 (6.7%) |
    Concession posologique |
16 (53.3%) |
    Unknown |
64 |
###Description durée de traitement
km_duree_tt<-survfit(Surv(cbnpc$duree_tt, cbnpc$evt_tt)~1)
km_duree_tt
## Call: survfit(formula = Surv(cbnpc$duree_tt, cbnpc$evt_tt) ~ 1)
##
## n events median 0.95LCL 0.95UCL
## [1,] 94 78 11 7.43 14.5
ggsurvplot(km_duree_tt, data = cbnpc,
risk.table=TRUE,
surv.scale="percent",
break.time.by=3,
surv.median.line = "hv"
)

##Description motifs d'arrêts de traitement
tbl_summary(
cbnpc, include = c("motif_arret"),
digits=all_categorical()~ c(0,1)
)
Characteristic |
N = 94 |
motif_arret |
|
    ARRET Par Patiente / Occlusion intestinale non liée au ttt |
1 (1.3%) |
    ARRET par patiente / TOXICITE |
1 (1.3%) |
    DECES |
14 (17.7%) |
    progression |
1 (1.3%) |
    PROGRESSION |
38 (48.1%) |
    PROGRESSION / Toxicite |
4 (5.1%) |
    PROGRESSION + NON Observance |
1 (1.3%) |
    Soins palliatifs |
8 (10.1%) |
    TOXICITE |
9 (11.4%) |
    TOXICITE / REANIMATION |
1 (1.3%) |
    TOXICITE / SOINS PAL |
1 (1.3%) |
    Unknown |
15 |
###Description PFS
km_pfs<-survfit(Surv(cbnpc$pfs, cbnpc$evt_pfs)~1)
km_pfs
## Call: survfit(formula = Surv(cbnpc$pfs, cbnpc$evt_pfs) ~ 1)
##
## n events median 0.95LCL 0.95UCL
## [1,] 94 62 13.8 8.17 20.1
ggsurvplot(km_pfs, data = cbnpc,
risk.table=TRUE,
surv.scale="percent",
break.time.by=3,
surv.median.line = "hv"
)

###Description OS
km_os<-survfit(Surv(cbnpc$os, cbnpc$evt_os)~1)
km_os
## Call: survfit(formula = Surv(cbnpc$os, cbnpc$evt_os) ~ 1)
##
## n events median 0.95LCL 0.95UCL
## [1,] 94 67 22.8 17.3 26.5
ggsurvplot(km_os, data = cbnpc,
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(cbnpc$pftox, cbnpc$evt_tox)~1)
km_pftox
## Call: survfit(formula = Surv(cbnpc$pftox, cbnpc$evt_tox) ~ 1)
##
## n events median 0.95LCL 0.95UCL
## [1,] 94 30 NA NA NA
ggsurvplot(km_pftox, data = cbnpc,
risk.table=TRUE,
surv.scale="percent",
break.time.by=2,
surv.median.line = "hv"
)
## Warning in .add_surv_median(p, fit, type = surv.median.line, fun = fun, :
## Median survival not reached.

##modèles de cox ANALYS UNIVARIEE ----
####charlson en valeur continue
modsurv<-coxph(Surv(pftox, evt_tox)~charlson, data=cbnpc)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
charlson |
1.18 |
0.97, 1.43 |
0.11 |
####charlson >=2---
modsurv<-coxph(Surv(pftox, evt_tox)~charlson_2, data=cbnpc)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
score de charlson >=2 (hors tumeur) |
2.63 |
0.79, 8.70 |
0.11 |
####charlson >=3---
modsurv<-coxph(Surv(pftox, evt_tox)~charlson_3, data=cbnpc)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
charlson_3 |
1.79 |
0.80, 4.03 |
0.2 |
####charlson >=4---
modsurv<-coxph(Surv(pftox, evt_tox)~charlson_4, data=cbnpc)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
charlson_4 |
1.89 |
0.92, 3.88 |
0.082 |
####charlson >=5---
modsurv<-coxph(Surv(pftox, evt_tox)~charlson_5, data=cbnpc)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
charlson_5 |
1.60 |
0.65, 3.92 |
0.3 |
####présence de méta cérébrale
modsurv<-coxph(Surv(pftox, evt_tox)~meta_snc, data=cbnpc)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
presence de métastase cérébrale |
0.74 |
0.33, 1.66 |
0.5 |
####problème de compréhension
modsurv<-coxph(Surv(pftox, evt_tox)~comprehension, data=cbnpc)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
patient avec difficulté de comprehension |
1.67 |
0.50, 5.51 |
0.4 |
####problème social
modsurv<-coxph(Surv(pftox, evt_tox)~pb_social, data=cbnpc)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
patient avec difficulté sociale |
1.08 |
0.26, 4.56 |
>0.9 |
####patient vivant seul
modsurv<-coxph(Surv(pftox, evt_tox)~patient_seul, data=cbnpc)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
patient vivant seul |
2.28 |
0.93, 5.63 |
0.073 |
####activité professionnelle
modsurv<-coxph(Surv(pftox, evt_tox)~actif_pro, data=cbnpc)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
patient avec activité professionnelle |
0.81 |
0.36, 1.82 |
0.6 |
####interaction médicamenteuse
modsurv<-coxph(Surv(pftox, evt_tox)~ddi, data=cbnpc)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
patient avec interaction médicamenteuse |
0.61 |
0.29, 1.26 |
0.2 |
####patient polymédiqué
modsurv<-coxph(Surv(pftox, evt_tox)~polymedique, data=cbnpc)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
patient polymediqué |
1.12 |
0.54, 2.29 |
0.8 |
####patient avec risque de mauvaise observance
modsurv<-coxph(Surv(pftox, evt_tox)~risque_observance, data=cbnpc)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
patient avec risque de mauvaise observance |
1.19 |
0.41, 3.42 |
0.7 |
####stade adjuvant vs autres
modsurv<-coxph(Surv(pftox, evt_tox)~adjuvant, data=cbnpc)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
adjuvant |
0.95 |
0.23, 4.00 |
>0.9 |
##patient traité par combo raf_mek
modsurv<-coxph(Surv(pftox, evt_tox)~raf_mek, data=cbnpc)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
patient traité par inhibiteurs de Raf et Mek |
3.25 |
1.23, 8.57 |
0.017 |
##patient traité par cytotox
modsurv<-coxph(Surv(pftox, evt_tox)~cytotox, data=cbnpc)
## 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 |
HR |
95% CI |
p-value |
patient traité par cytotoxique |
0.00 |
0.00, Inf |
>0.9 |
##patient traité par inhibiteur egfr
modsurv<-coxph(Surv(pftox, evt_tox)~egfr, data=cbnpc)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
patient traité par inhibiteurs de egfrl |
0.44 |
0.21, 0.94 |
0.035 |
##patient traité par inhibiteur alk
modsurv<-coxph(Surv(pftox, evt_tox)~alk, data=cbnpc)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
patient traité par inhibiteurs alk |
0.76 |
0.31, 1.87 |
0.6 |
##patient traité par inhibiteur vegfr
modsurv<-coxph(Surv(pftox, evt_tox)~vegfr, data=cbnpc)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
patient traité par inhibiteur de vegfr |
3.98 |
0.53, 30.0 |
0.2 |
##patient traité par inhibiteur ret
modsurv<-coxph(Surv(pftox, evt_tox)~ret, data=cbnpc)
## 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 |
HR |
95% CI |
p-value |
patient traité par inhibiteur de ret |
0.00 |
0.00, Inf |
>0.9 |
##patient traité par inhibiteur ras
modsurv<-coxph(Surv(pftox, evt_tox)~kras, data=cbnpc)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
patient traité par inhibiteur de RAS |
2.96 |
1.00, 8.75 |
0.050 |
#ANALYSES MULTIVARIEE avec Charlson >=2
modsurv<-coxph(Surv(pftox, evt_tox)~charlson_2+patient_seul+ddi+raf_mek+egfr+vegfr+kras, data=cbnpc)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
score de charlson >=2 (hors tumeur) |
2.76 |
0.76, 10.0 |
0.12 |
patient vivant seul |
1.99 |
0.68, 5.81 |
0.2 |
patient avec interaction médicamenteuse |
0.66 |
0.30, 1.44 |
0.3 |
patient traité par inhibiteurs de Raf et Mek |
2.88 |
0.94, 8.79 |
0.063 |
patient traité par inhibiteurs de egfrl |
0.61 |
0.25, 1.48 |
0.3 |
patient traité par inhibiteur de vegfr |
8.82 |
0.97, 80.3 |
0.053 |
patient traité par inhibiteur de RAS |
1.77 |
0.49, 6.43 |
0.4 |
step(modsurv)
## Start: AIC=247.95
## Surv(pftox, evt_tox) ~ charlson_2 + patient_seul + ddi + raf_mek +
## egfr + vegfr + kras
##
## Df AIC
## - kras 1 246.67
## - ddi 1 247.00
## - egfr 1 247.11
## - patient_seul 1 247.40
## <none> 247.95
## - vegfr 1 248.33
## - charlson_2 1 248.87
## - raf_mek 1 248.99
##
## Step: AIC=246.67
## Surv(pftox, evt_tox) ~ charlson_2 + patient_seul + ddi + raf_mek +
## egfr + vegfr
##
## Df AIC
## - ddi 1 245.82
## <none> 246.67
## - egfr 1 246.75
## - vegfr 1 246.91
## - patient_seul 1 247.02
## - raf_mek 1 247.31
## - charlson_2 1 248.10
##
## Step: AIC=245.83
## Surv(pftox, evt_tox) ~ charlson_2 + patient_seul + raf_mek +
## egfr + vegfr
##
## Df AIC
## <none> 245.82
## - vegfr 1 246.07
## - egfr 1 246.15
## - raf_mek 1 246.35
## - charlson_2 1 247.11
## - patient_seul 1 247.40
## Call:
## coxph(formula = Surv(pftox, evt_tox) ~ charlson_2 + patient_seul +
## raf_mek + egfr + vegfr, data = cbnpc)
##
## coef exp(coef) se(coef) z p
## charlson_2 1.0622 2.8928 0.6608 1.608 0.1079
## patient_seul 0.9900 2.6912 0.4811 2.058 0.0396
## raf_mek 0.9281 2.5296 0.5469 1.697 0.0897
## egfr -0.6303 0.5324 0.4175 -1.510 0.1311
## vegfr 2.1038 8.1975 1.1331 1.857 0.0634
##
## Likelihood ratio test=15.44 on 5 df, p=0.008645
## n= 94, number of events= 30
###Modèle final
modsurv<-coxph(Surv(pftox, evt_tox)~charlson_2+patient_seul+raf_mek+vegfr, data=cbnpc)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
score de charlson >=2 (hors tumeur) |
2.85 |
0.78, 10.4 |
0.11 |
patient vivant seul |
2.84 |
1.12, 7.22 |
0.029 |
patient traité par inhibiteurs de Raf et Mek |
3.49 |
1.27, 9.57 |
0.015 |
patient traité par inhibiteur de vegfr |
11.0 |
1.22, 99.2 |
0.033 |
#ANALYSE MULTIVARIEE avec CHarlson >=3
modsurv<-coxph(Surv(pftox, evt_tox)~charlson_3+patient_seul+ddi+raf_mek+egfr+vegfr+kras, data=cbnpc)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
charlson_3 |
2.24 |
0.90, 5.56 |
0.082 |
patient vivant seul |
2.30 |
0.78, 6.84 |
0.13 |
patient avec interaction médicamenteuse |
0.63 |
0.29, 1.39 |
0.3 |
patient traité par inhibiteurs de Raf et Mek |
2.51 |
0.80, 7.89 |
0.11 |
patient traité par inhibiteurs de egfrl |
0.56 |
0.23, 1.38 |
0.2 |
patient traité par inhibiteur de vegfr |
8.49 |
0.95, 75.7 |
0.055 |
patient traité par inhibiteur de RAS |
1.92 |
0.50, 7.33 |
0.3 |
step(modsurv)
## Start: AIC=247.59
## Surv(pftox, evt_tox) ~ charlson_3 + patient_seul + ddi + raf_mek +
## egfr + vegfr + kras
##
## Df AIC
## - kras 1 246.44
## - ddi 1 246.86
## - egfr 1 247.13
## <none> 247.59
## - patient_seul 1 247.59
## - raf_mek 1 247.86
## - vegfr 1 247.92
## - charlson_3 1 248.87
##
## Step: AIC=246.44
## Surv(pftox, evt_tox) ~ charlson_3 + patient_seul + ddi + raf_mek +
## egfr + vegfr
##
## Df AIC
## - ddi 1 246.01
## - raf_mek 1 246.31
## <none> 246.44
## - vegfr 1 246.63
## - egfr 1 247.23
## - patient_seul 1 248.00
## - charlson_3 1 248.10
##
## Step: AIC=246.01
## Surv(pftox, evt_tox) ~ charlson_3 + patient_seul + raf_mek +
## egfr + vegfr
##
## Df AIC
## - raf_mek 1 245.94
## <none> 246.01
## - vegfr 1 246.02
## - egfr 1 246.81
## - charlson_3 1 247.11
## - patient_seul 1 248.90
##
## Step: AIC=245.94
## Surv(pftox, evt_tox) ~ charlson_3 + patient_seul + egfr + vegfr
##
## Df AIC
## - vegfr 1 245.79
## <none> 245.94
## - patient_seul 1 248.12
## - charlson_3 1 248.64
## - egfr 1 248.97
##
## Step: AIC=245.79
## Surv(pftox, evt_tox) ~ charlson_3 + patient_seul + egfr
##
## Df AIC
## <none> 245.79
## - patient_seul 1 247.57
## - charlson_3 1 247.62
## - egfr 1 249.35
## Call:
## coxph(formula = Surv(pftox, evt_tox) ~ charlson_3 + patient_seul +
## egfr, data = cbnpc)
##
## coef exp(coef) se(coef) z p
## charlson_3 0.7797 2.1808 0.4184 1.863 0.0624
## patient_seul 1.0016 2.7226 0.4676 2.142 0.0322
## egfr -0.8899 0.4107 0.3904 -2.279 0.0226
##
## Likelihood ratio test=11.47 on 3 df, p=0.009422
## n= 94, number of events= 30
##modèle final
modsurv<-coxph(Surv(pftox, evt_tox)~charlson_3+egfr+patient_seul, data=cbnpc)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
charlson_3 |
2.18 |
0.96, 4.95 |
0.062 |
patient traité par inhibiteurs de egfrl |
0.41 |
0.19, 0.88 |
0.023 |
patient vivant seul |
2.72 |
1.09, 6.81 |
0.032 |
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)~charlson_3+egfr+patient_seul, data=cbnpc)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
charlson_3 |
2.18 |
0.96, 4.95 |
0.062 |
patient traité par inhibiteurs de egfrl |
0.41 |
0.19, 0.88 |
0.023 |
patient vivant seul |
2.72 |
1.09, 6.81 |
0.032 |
ggforest(modsurv)
## Warning in .get_data(model, data = data): The `data` argument is not provided.
## Data will be extracted from model fit.
