##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_dermato <- read_excel("Y:/fp/FAC/2023-2024/Memoires DES/Guillaume Flandin/20240606/data_guillaume_dermato.xlsx")
## New names:
## • `Détail` -> `Détail...39`
## • `Détail` -> `Détail...46`
## • `Détail` -> `Détail...56`
## • `Détail` -> `Détail...58`
##recodage bases de données le cas échéant----
dermato_g<-filter(data_guillaume_dermato, 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"
##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", "prise_discontinue", "risque_observance"),
digits=all_categorical()~ c(0,1)
)
Characteristic |
N = 78 |
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 |
43 (55.1%) |
traitement en prise discontinue |
9 (11.5%) |
patient avec risque de mauvaise observance |
17 (21.8%) |
##Description des evènements liés aux traitement
tbl_summary(
dermato_g, include = c("type_evt"),
digits=all_categorical()~ c(0,1)
)
Characteristic |
N = 78 |
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%) |
##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 = 78 |
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 |
###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 = 78 |
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 |
###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 ANALYS UNIVARIEE ----
####charlson en valeur continue
modsurv<-coxph(Surv(pftox, evt_tox)~charlson, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
charlson |
1.18 |
1.04, 1.34 |
0.009 |
####charlson >=2---
modsurv<-coxph(Surv(pftox, evt_tox)~charlson_2, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
score de charlson >=2 (hors tumeur) |
1.59 |
0.95, 2.66 |
0.079 |
####charlson >=3---
modsurv<-coxph(Surv(pftox, evt_tox)~charlson_3, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
charlson_3 |
1.92 |
1.16, 3.17 |
0.012 |
####charlson >=4---
modsurv<-coxph(Surv(pftox, evt_tox)~charlson_4, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
charlson_4 |
1.63 |
0.98, 2.73 |
0.062 |
####charlson >=5---
modsurv<-coxph(Surv(pftox, evt_tox)~charlson_5, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
charlson_5 |
1.83 |
1.03, 3.26 |
0.040 |
####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 |
HR |
95% CI |
p-value |
presence de métastase cérébrale |
1.10 |
0.52, 2.35 |
0.8 |
####problème de compréhension
modsurv<-coxph(Surv(pftox, evt_tox)~comprehension, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
patient avec difficulté de comprehension |
2.08 |
0.97, 4.46 |
0.061 |
####problème social
modsurv<-coxph(Surv(pftox, evt_tox)~pb_social, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
patient avec difficulté sociale |
0.79 |
0.39, 1.60 |
0.5 |
####patient vivant seul
modsurv<-coxph(Surv(pftox, evt_tox)~patient_seul, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
patient vivant seul |
0.79 |
0.39, 1.60 |
0.5 |
####activité professionnelle
modsurv<-coxph(Surv(pftox, evt_tox)~actif_pro, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
patient avec activité professionnelle |
0.60 |
0.33, 1.10 |
0.10 |
####interaction médicamenteuse
modsurv<-coxph(Surv(pftox, evt_tox)~ddi, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
patient avec interaction médicamenteuse |
1.49 |
0.89, 2.49 |
0.13 |
####Schéma de prise discontinue
modsurv<-coxph(Surv(pftox, evt_tox)~prise_discontinue, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
traitement en prise discontinue |
1.26 |
0.59, 2.69 |
0.5 |
####patient polymédiqué
modsurv<-coxph(Surv(pftox, evt_tox)~polymedique, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
patient polymediqué |
1.37 |
0.83, 2.26 |
0.2 |
####patient avec risque de mauvaise observance
modsurv<-coxph(Surv(pftox, evt_tox)~risque_observance, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
patient avec risque de mauvaise observance |
0.89 |
0.48, 1.64 |
0.7 |
####stade adjuvant vs autres
modsurv<-coxph(Surv(pftox, evt_tox)~adjuvant, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
adjuvant |
1.23 |
0.70, 2.17 |
0.5 |
##patient traité par combo raf_mek
modsurv<-coxph(Surv(pftox, evt_tox)~raf_mek, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
patient traité par inhibiteurs de Raf et Mek |
0.88 |
0.51, 1.49 |
0.6 |
##patient traité par mek seul
modsurv<-coxph(Surv(pftox, evt_tox)~mek, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
patient traité par inhibiteurs de Mek seul |
3.70 |
1.26, 10.9 |
0.018 |
##patient traité par hedgehog
modsurv<-coxph(Surv(pftox, evt_tox)~hedgehog, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
patient traité par inhibiteurs hedgehog |
0.88 |
0.50, 1.57 |
0.7 |
##patient traité par cytotox
modsurv<-coxph(Surv(pftox, evt_tox)~cytotox, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
patient traité par cytotoxique |
1.86 |
0.25, 13.7 |
0.5 |
##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 |
HR |
95% CI |
p-value |
score de charlson >=2 (hors tumeur) |
1.28 |
0.65, 2.49 |
0.5 |
patient avec difficulté de comprehension |
1.79 |
0.80, 3.97 |
0.2 |
patient avec activité professionnelle |
0.84 |
0.38, 1.87 |
0.7 |
patient avec interaction médicamenteuse |
1.28 |
0.71, 2.33 |
0.4 |
patient polymediqué |
1.10 |
0.62, 1.94 |
0.8 |
patient traité par inhibiteurs de Mek seul |
3.19 |
1.05, 9.73 |
0.041 |
step(modsurv)
## Start: AIC=436.87
## Surv(pftox, evt_tox) ~ charlson_2 + comprehension + actif_pro +
## ddi + polymedique + mek
##
## Df AIC
## - polymedique 1 434.96
## - actif_pro 1 435.04
## - charlson_2 1 435.39
## - ddi 1 435.54
## - comprehension 1 436.68
## <none> 436.87
## - mek 1 438.17
##
## Step: AIC=434.96
## Surv(pftox, evt_tox) ~ charlson_2 + comprehension + actif_pro +
## ddi + mek
##
## Df AIC
## - actif_pro 1 433.14
## - charlson_2 1 433.58
## - ddi 1 434.04
## - comprehension 1 434.72
## <none> 434.96
## - mek 1 436.44
##
## Step: AIC=433.14
## Surv(pftox, evt_tox) ~ charlson_2 + comprehension + ddi + mek
##
## Df AIC
## - ddi 1 432.62
## - comprehension 1 432.77
## - charlson_2 1 432.81
## <none> 433.14
## - mek 1 434.81
##
## Step: AIC=432.62
## Surv(pftox, evt_tox) ~ charlson_2 + comprehension + mek
##
## Df AIC
## - comprehension 1 432.35
## <none> 432.62
## - charlson_2 1 432.80
## - mek 1 434.30
##
## Step: AIC=432.35
## Surv(pftox, evt_tox) ~ charlson_2 + mek
##
## Df AIC
## <none> 432.35
## - charlson_2 1 433.36
## - mek 1 434.39
## Call:
## coxph(formula = Surv(pftox, evt_tox) ~ charlson_2 + mek, data = dermato_g)
##
## coef exp(coef) se(coef) z p
## charlson_2 0.4504 1.5690 0.2637 1.708 0.0877
## mek 1.2840 3.6110 0.5560 2.309 0.0209
##
## Likelihood ratio test=7.22 on 2 df, p=0.02705
## n= 78, number of events= 63
##modèle final avec Charlson >=2
modsurv<-coxph(Surv(pftox, evt_tox)~charlson_2+mek, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
p-value |
score de charlson >=2 (hors tumeur) |
1.57 |
0.94, 2.63 |
0.088 |
patient traité par inhibiteurs de Mek seul |
3.61 |
1.21, 10.7 |
0.021 |
##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 |
HR |
95% CI |
p-value |
charlson_3 |
1.66 |
0.88, 3.14 |
0.12 |
patient avec difficulté de comprehension |
1.71 |
0.78, 3.77 |
0.2 |
patient avec activité professionnelle |
0.94 |
0.45, 1.99 |
0.9 |
patient avec interaction médicamenteuse |
1.30 |
0.71, 2.38 |
0.4 |
patient polymediqué |
0.98 |
0.54, 1.80 |
>0.9 |
patient traité par inhibiteurs de Mek seul |
3.15 |
1.04, 9.60 |
0.043 |
step(modsurv)
## Start: AIC=434.85
## Surv(pftox, evt_tox) ~ charlson_3 + comprehension + actif_pro +
## ddi + polymedique + mek
##
## Df AIC
## - polymedique 1 432.85
## - actif_pro 1 432.88
## - ddi 1 433.57
## - comprehension 1 434.46
## <none> 434.85
## - charlson_3 1 435.39
## - mek 1 436.10
##
## Step: AIC=432.85
## Surv(pftox, evt_tox) ~ charlson_3 + comprehension + actif_pro +
## ddi + mek
##
## Df AIC
## - actif_pro 1 430.88
## - ddi 1 431.70
## - comprehension 1 432.49
## <none> 432.85
## - charlson_3 1 433.58
## - mek 1 434.11
##
## Step: AIC=430.88
## Surv(pftox, evt_tox) ~ charlson_3 + comprehension + ddi + mek
##
## Df AIC
## - ddi 1 429.86
## - comprehension 1 430.50
## <none> 430.88
## - mek 1 432.19
## - charlson_3 1 432.81
##
## Step: AIC=429.86
## Surv(pftox, evt_tox) ~ charlson_3 + comprehension + mek
##
## Df AIC
## - comprehension 1 429.63
## <none> 429.86
## - mek 1 431.08
## - charlson_3 1 432.80
##
## Step: AIC=429.63
## Surv(pftox, evt_tox) ~ charlson_3 + mek
##
## Df AIC
## <none> 429.63
## - mek 1 431.20
## - charlson_3 1 433.36
## Call:
## coxph(formula = Surv(pftox, evt_tox) ~ charlson_3 + mek, data = dermato_g)
##
## coef exp(coef) se(coef) z p
## charlson_3 0.6211 1.8610 0.2590 2.398 0.0165
## mek 1.2007 3.3225 0.5589 2.148 0.0317
##
## Likelihood ratio test=9.94 on 2 df, p=0.006945
## n= 78, number of events= 63
###modèle final
modsurv<-coxph(Surv(pftox, evt_tox)~charlson_3+mek, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
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 |
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+mek, data=dermato_g)
modsurv%>%tbl_regression(exponentiate = TRUE)
Characteristic |
HR |
95% CI |
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 |
ggforest(modsurv)
## Warning in .get_data(model, data = data): The `data` argument is not provided.
## Data will be extracted from model fit.
