library(survival)
library(survminer)
library(rms)
library(readxl)
library(MASS)
library(ggplot2)
library(MatchIt)
library(optmatch)
library(twang)
library(cobalt)
library(stddiff)
library(tableone)
library(gmodels)
Load data from spreadsheet:
data <- read_excel("/Users/carolinaferreiraatuesta/Desktop/Peer-reviews/robot.xlsx")
data$age_dx <- as.numeric(data$age_dx)
data$PSA_inicial <- as.numeric(data$PSA_inicial)
data$IMC <- as.numeric(data$IMC)
data$tiempo_cx <- as.numeric(data$tiempo_cx)
data$tiempo_consola<- as.numeric(data$tiempo_consola)
data$gleason_prec0<- as.numeric(data$gleason_prec0)
data$gleason_pato<- as.numeric(data$gleason_pato)
data$psa_control<- as.numeric(data$psa_control)
data$tiempo__pop_presentacion<- as.numeric(data$tiempo__pop_presentacion)
cat <-
c(
'ASA',
'comorb',
'drugs',
'bloque_hormonal',
'gleason_prec0',
'nccn',
'pT',
'N',
'M',
'gleason_pato',
'ganglios_positivos',
'bordes',
'clavien_dindo',
'complicaciones_mas30',
'linfocele_sintomatico',
'tiempo__pop_presentacion',
'imagen_linfocele',
'localizacion',
'manejo',
'drenaje_punciones',
'escleroterapia',
'cultivo',
'blee',
'imagen_control')
data$age_dx <- as.numeric(data$age_dx)
data$PSA_inicial <- as.numeric(data$PSA_inicial)
data$IMC <- as.numeric(data$IMC)
data$tiempo_cx <- as.numeric(data$tiempo_cx)
data$tiempo_consola<- as.numeric(data$tiempo_consola)
data$gleason_prec0<- as.numeric(data$gleason_prec0)
data$gleason_pato<- as.numeric(data$gleason_pato)
data$psa_control<- as.numeric(data$psa_control)
data$tiempo__pop_presentacion<- as.numeric(data$tiempo__pop_presentacion)
cont <- c('age_dx','PSA_inicial',
'IMC','tiempo_cx','tiempo_consola',
'sangrado', 'tiempo__pop_presentacion',
'duracion_estancia','no_ganglios','psa_control', 'volumen')
tab1<- CreateTableOne(data = data[,-1], strata = "linfocele_sintomatico", factorVars = cat,includeNA =TRUE)
## Warning in ModuleReturnVarsExist(factorVars, data): The data frame does not
## have: imagen_control Dropped
## Warning in min(x, na.rm = TRUE): no non-missing arguments to min; returning Inf
## Warning in min(x, na.rm = TRUE): no non-missing arguments to min; returning Inf
## Warning in max(x, na.rm = TRUE): no non-missing arguments to max; returning -Inf
## Warning in max(x, na.rm = TRUE): no non-missing arguments to max; returning -Inf
## Warning in StdDiff(variable = var, group = strataVar): Variable has only NA's in
## at least one stratum. na.rm turned off.
## Warning in StdDiff(variable = var, group = strataVar): Variable has only NA's in
## at least one stratum. na.rm turned off.
tabone<- print(tab1, nonnormal = cont, exact = cat, test=TRUE, testNonNormal = TRUE, smd = TRUE)
## Stratified by linfocele_sintomatico
## 0
## n 8
## age_dx (median [IQR]) 64.00 [62.50, 65.00]
## PSA_inicial (median [IQR]) 8.80 [2.55, 12.00]
## IMC (median [IQR]) 26.25 [24.02, 28.75]
## ASA (%)
## 0 0 ( 0.0)
## 1 0 ( 0.0)
## 2 5 ( 62.5)
## 3 3 ( 37.5)
## NA 0 ( 0.0)
## comorb = 1 (%) 6 ( 75.0)
## comorb_cual (%)
## 0 2 ( 25.0)
## 1 3 ( 37.5)
## 1, 3 0 ( 0.0)
## 1, 4 0 ( 0.0)
## 1, 4, 8 0 ( 0.0)
## 1, 7 0 ( 0.0)
## 1,2,4 0 ( 0.0)
## 1,2.7 0 ( 0.0)
## 1,3,20 1 ( 12.5)
## 1,3.8 0 ( 0.0)
## 1,4, 8 0 ( 0.0)
## 1.2 0 ( 0.0)
## 1.3 0 ( 0.0)
## 1.3,7 0 ( 0.0)
## 1.4 0 ( 0.0)
## 10 0 ( 0.0)
## 2 0 ( 0.0)
## 2, 11 0 ( 0.0)
## 2,3,4,8 0 ( 0.0)
## 2,4.8 0 ( 0.0)
## 3 0 ( 0.0)
## 3, 8 0 ( 0.0)
## 3. 10 0 ( 0.0)
## 4 0 ( 0.0)
## 40238 1 ( 12.5)
## 44621 1 ( 12.5)
## 44835 0 ( 0.0)
## 5, 6 0 ( 0.0)
## 8 0 ( 0.0)
## 9 0 ( 0.0)
## drugs = 1 (%) 7 ( 87.5)
## drugs_cual (%)
## 0 2 ( 25.0)
## 1, 2 0 ( 0.0)
## 1, 24 0 ( 0.0)
## 1,3,4 0 ( 0.0)
## 1.24 1 ( 12.5)
## 1.8 0 ( 0.0)
## 10 0 ( 0.0)
## 10, 19, 24 0 ( 0.0)
## 10, 21 0 ( 0.0)
## 12, 20 0 ( 0.0)
## 12, 24 0 ( 0.0)
## 12, 28 0 ( 0.0)
## 16 0 ( 0.0)
## 17, 18 0 ( 0.0)
## 19 0 ( 0.0)
## 19, 21, 24 0 ( 0.0)
## 19, 24 1 ( 12.5)
## 19, 24, 25 0 ( 0.0)
## 19.24 0 ( 0.0)
## 20 0 ( 0.0)
## 22, 23 0 ( 0.0)
## 24 1 ( 12.5)
## 24, 25, 30 1 ( 12.5)
## 24, 27 0 ( 0.0)
## 25 0 ( 0.0)
## 26 0 ( 0.0)
## 28 1 ( 12.5)
## 29 1 ( 12.5)
## 3 0 ( 0.0)
## 3, 21 0 ( 0.0)
## 3, 25 0 ( 0.0)
## 3,6,7,10 0 ( 0.0)
## 31 0 ( 0.0)
## 4 0 ( 0.0)
## 40427 0 ( 0.0)
## 42158 0 ( 0.0)
## 5 0 ( 0.0)
## 6 0 ( 0.0)
## 6, 11, 12, 13, 14 0 ( 0.0)
## 7 0 ( 0.0)
## 8 0 ( 0.0)
## bloque_hormonal = 1 (%) 1 ( 12.5)
## gleason_prec0 (%)
## 0 1 ( 12.5)
## 1 1 ( 12.5)
## 2 0 ( 0.0)
## 3 4 ( 50.0)
## 4 1 ( 12.5)
## 5 1 ( 12.5)
## nccn (%)
## 0 1 ( 12.5)
## 1 0 ( 0.0)
## 2 0 ( 0.0)
## 3 4 ( 50.0)
## 4 1 ( 12.5)
## 5 1 ( 12.5)
## 6 1 ( 12.5)
## tiempo_cx (median [IQR]) 0.00 [0.00, 180.00]
## sangrado (median [IQR]) 400.00 [387.50, 450.00]
## tiempo_consola (median [IQR]) 162.50 [146.25, 180.00]
## duracion_estancia (median [IQR]) 1.00 [1.00, 2.00]
## pT (%)
## 1 3 ( 37.5)
## 2 4 ( 50.0)
## 3 1 ( 12.5)
## 4 0 ( 0.0)
## N (%)
## 1 0 ( 0.0)
## 2 8 (100.0)
## 3 0 ( 0.0)
## M (%)
## 0 4 ( 50.0)
## 1 4 ( 50.0)
## 2 0 ( 0.0)
## gleason_pato (%)
## 1 2 ( 25.0)
## 2 0 ( 0.0)
## 3 0 ( 0.0)
## 4 6 ( 75.0)
## 5 0 ( 0.0)
## NA 0 ( 0.0)
## no_ganglios (median [IQR]) 36.00 [31.25, 45.00]
## ganglios_positivos (%)
## 1 , 2, 4 0 ( 0.0)
## 1,4.6 0 ( 0.0)
## 3 0 ( 0.0)
## 3,4 0 ( 0.0)
## 3,5 0 ( 0.0)
## 3.4,6 0 ( 0.0)
## 4 0 ( 0.0)
## 44621 0 ( 0.0)
## NA 8 (100.0)
## bordes = 1 (%) 1 ( 12.5)
## psa_control (median [IQR]) 0.03 [0.01, 0.05]
## clavien_dindo (%)
## 1 1 ( 12.5)
## 2 1 ( 12.5)
## 3 1 ( 12.5)
## 5 0 ( 0.0)
## NA 5 ( 62.5)
## complicaciones_mas30 (%)
## 0 1 ( 12.5)
## 3 4 ( 50.0)
## NA 3 ( 37.5)
## linfocele_sintomatico (%)
## 0 8 (100.0)
## 1 0 ( 0.0)
## NA 0 ( 0.0)
## tiempo__pop_presentacion (%)
## 1 3 ( 37.5)
## 2 1 ( 12.5)
## 2.5 1 ( 12.5)
## 3 1 ( 12.5)
## 4 1 ( 12.5)
## 6 1 ( 12.5)
## NA 0 ( 0.0)
## imagen_linfocele (%)
## 0 2 ( 25.0)
## 1 6 ( 75.0)
## NA 0 ( 0.0)
## localizacion (%)
## 0 1 ( 12.5)
## 1 5 ( 62.5)
## 2 2 ( 25.0)
## NA 0 ( 0.0)
## volumen (median [IQR]) 299.00 [154.00, 429.50]
## manejo (%)
## 0 3 ( 37.5)
## 1 4 ( 50.0)
## 2 1 ( 12.5)
## NA 0 ( 0.0)
## drenaje_punciones (%)
## 1 3 ( 37.5)
## 4 1 ( 12.5)
## NA 4 ( 50.0)
## escleroterapia = NA (%) 7 ( 87.5)
## cultivo (%)
## 6 1 ( 12.5)
## 44717 1 ( 12.5)
## NA 6 ( 75.0)
## blee = NA (%) 7 ( 87.5)
## imagen_control\r\n (mean (SD)) 0.60 (0.55)
## Stratified by linfocele_sintomatico
## 1 p test
## n 1
## age_dx (median [IQR]) 61.00 [61.00, 61.00] 0.323 nonnorm
## PSA_inicial (median [IQR]) 6.50 [6.50, 6.50] 0.696 nonnorm
## IMC (median [IQR]) 29.10 [29.10, 29.10] 0.439 nonnorm
## ASA (%) 1.000 exact
## 0 0 ( 0.0)
## 1 0 ( 0.0)
## 2 1 (100.0)
## 3 0 ( 0.0)
## NA 0 ( 0.0)
## comorb = 1 (%) 1 (100.0) 1.000 exact
## comorb_cual (%) NaN
## 0 0 ( 0.0)
## 1 1 (100.0)
## 1, 3 0 ( 0.0)
## 1, 4 0 ( 0.0)
## 1, 4, 8 0 ( 0.0)
## 1, 7 0 ( 0.0)
## 1,2,4 0 ( 0.0)
## 1,2.7 0 ( 0.0)
## 1,3,20 0 ( 0.0)
## 1,3.8 0 ( 0.0)
## 1,4, 8 0 ( 0.0)
## 1.2 0 ( 0.0)
## 1.3 0 ( 0.0)
## 1.3,7 0 ( 0.0)
## 1.4 0 ( 0.0)
## 10 0 ( 0.0)
## 2 0 ( 0.0)
## 2, 11 0 ( 0.0)
## 2,3,4,8 0 ( 0.0)
## 2,4.8 0 ( 0.0)
## 3 0 ( 0.0)
## 3, 8 0 ( 0.0)
## 3. 10 0 ( 0.0)
## 4 0 ( 0.0)
## 40238 0 ( 0.0)
## 44621 0 ( 0.0)
## 44835 0 ( 0.0)
## 5, 6 0 ( 0.0)
## 8 0 ( 0.0)
## 9 0 ( 0.0)
## drugs = 1 (%) 1 (100.0) 1.000 exact
## drugs_cual (%) NaN
## 0 0 ( 0.0)
## 1, 2 0 ( 0.0)
## 1, 24 0 ( 0.0)
## 1,3,4 0 ( 0.0)
## 1.24 0 ( 0.0)
## 1.8 0 ( 0.0)
## 10 0 ( 0.0)
## 10, 19, 24 0 ( 0.0)
## 10, 21 0 ( 0.0)
## 12, 20 0 ( 0.0)
## 12, 24 0 ( 0.0)
## 12, 28 0 ( 0.0)
## 16 0 ( 0.0)
## 17, 18 0 ( 0.0)
## 19 0 ( 0.0)
## 19, 21, 24 0 ( 0.0)
## 19, 24 0 ( 0.0)
## 19, 24, 25 0 ( 0.0)
## 19.24 0 ( 0.0)
## 20 0 ( 0.0)
## 22, 23 0 ( 0.0)
## 24 1 (100.0)
## 24, 25, 30 0 ( 0.0)
## 24, 27 0 ( 0.0)
## 25 0 ( 0.0)
## 26 0 ( 0.0)
## 28 0 ( 0.0)
## 29 0 ( 0.0)
## 3 0 ( 0.0)
## 3, 21 0 ( 0.0)
## 3, 25 0 ( 0.0)
## 3,6,7,10 0 ( 0.0)
## 31 0 ( 0.0)
## 4 0 ( 0.0)
## 40427 0 ( 0.0)
## 42158 0 ( 0.0)
## 5 0 ( 0.0)
## 6 0 ( 0.0)
## 6, 11, 12, 13, 14 0 ( 0.0)
## 7 0 ( 0.0)
## 8 0 ( 0.0)
## bloque_hormonal = 1 (%) 0 ( 0.0) 1.000 exact
## gleason_prec0 (%) 1.000 exact
## 0 0 ( 0.0)
## 1 0 ( 0.0)
## 2 0 ( 0.0)
## 3 1 (100.0)
## 4 0 ( 0.0)
## 5 0 ( 0.0)
## nccn (%) 1.000 exact
## 0 0 ( 0.0)
## 1 0 ( 0.0)
## 2 0 ( 0.0)
## 3 1 (100.0)
## 4 0 ( 0.0)
## 5 0 ( 0.0)
## 6 0 ( 0.0)
## tiempo_cx (median [IQR]) 210.00 [210.00, 210.00] 0.088 nonnorm
## sangrado (median [IQR]) 400.00 [400.00, 400.00] 1.000 nonnorm
## tiempo_consola (median [IQR]) 165.00 [165.00, 165.00] 1.000 nonnorm
## duracion_estancia (median [IQR]) 1.00 [1.00, 1.00] 0.480 nonnorm
## pT (%) 1.000 exact
## 1 1 (100.0)
## 2 0 ( 0.0)
## 3 0 ( 0.0)
## 4 0 ( 0.0)
## N (%) 1.000 exact
## 1 0 ( 0.0)
## 2 1 (100.0)
## 3 0 ( 0.0)
## M (%) 1.000 exact
## 0 1 (100.0)
## 1 0 ( 0.0)
## 2 0 ( 0.0)
## gleason_pato (%) 0.333 exact
## 1 1 (100.0)
## 2 0 ( 0.0)
## 3 0 ( 0.0)
## 4 0 ( 0.0)
## 5 0 ( 0.0)
## NA 0 ( 0.0)
## no_ganglios (median [IQR]) 43.00 [43.00, 43.00] 0.697 nonnorm
## ganglios_positivos (%) 1.000 exact
## 1 , 2, 4 0 ( 0.0)
## 1,4.6 0 ( 0.0)
## 3 0 ( 0.0)
## 3,4 0 ( 0.0)
## 3,5 0 ( 0.0)
## 3.4,6 0 ( 0.0)
## 4 0 ( 0.0)
## 44621 0 ( 0.0)
## NA 1 (100.0)
## bordes = 1 (%) 0 ( 0.0) 1.000 exact
## psa_control (median [IQR]) NA [NA, NA] NA nonnorm
## clavien_dindo (%) 0.444 exact
## 1 1 (100.0)
## 2 0 ( 0.0)
## 3 0 ( 0.0)
## 5 0 ( 0.0)
## NA 0 ( 0.0)
## complicaciones_mas30 (%) 1.000 exact
## 0 0 ( 0.0)
## 3 0 ( 0.0)
## NA 1 (100.0)
## linfocele_sintomatico (%) 0.111 exact
## 0 0 ( 0.0)
## 1 1 (100.0)
## NA 0 ( 0.0)
## tiempo__pop_presentacion (%) 1.000 exact
## 1 1 (100.0)
## 2 0 ( 0.0)
## 2.5 0 ( 0.0)
## 3 0 ( 0.0)
## 4 0 ( 0.0)
## 6 0 ( 0.0)
## NA 0 ( 0.0)
## imagen_linfocele (%) 1.000 exact
## 0 0 ( 0.0)
## 1 1 (100.0)
## NA 0 ( 0.0)
## localizacion (%) 1.000 exact
## 0 0 ( 0.0)
## 1 1 (100.0)
## 2 0 ( 0.0)
## NA 0 ( 0.0)
## volumen (median [IQR]) 114.00 [114.00, 114.00] 0.513 nonnorm
## manejo (%) 1.000 exact
## 0 1 (100.0)
## 1 0 ( 0.0)
## 2 0 ( 0.0)
## NA 0 ( 0.0)
## drenaje_punciones (%) 1.000 exact
## 1 0 ( 0.0)
## 4 0 ( 0.0)
## NA 1 (100.0)
## escleroterapia = NA (%) 1 (100.0) 1.000 exact
## cultivo (%) 1.000 exact
## 6 0 ( 0.0)
## 44717 0 ( 0.0)
## NA 1 (100.0)
## blee = NA (%) 1 (100.0) 1.000 exact
## imagen_control\r\n (mean (SD)) NaN (NA) NA
## Stratified by linfocele_sintomatico
## SMD
## n
## age_dx (median [IQR]) NA
## PSA_inicial (median [IQR]) NA
## IMC (median [IQR]) NA
## ASA (%) 1.095
## 0
## 1
## 2
## 3
## NA
## comorb = 1 (%) 0.816
## comorb_cual (%) 1.826
## 0
## 1
## 1, 3
## 1, 4
## 1, 4, 8
## 1, 7
## 1,2,4
## 1,2.7
## 1,3,20
## 1,3.8
## 1,4, 8
## 1.2
## 1.3
## 1.3,7
## 1.4
## 10
## 2
## 2, 11
## 2,3,4,8
## 2,4.8
## 3
## 3, 8
## 3. 10
## 4
## 40238
## 44621
## 44835
## 5, 6
## 8
## 9
## drugs = 1 (%) 0.535
## drugs_cual (%) 3.742
## 0
## 1, 2
## 1, 24
## 1,3,4
## 1.24
## 1.8
## 10
## 10, 19, 24
## 10, 21
## 12, 20
## 12, 24
## 12, 28
## 16
## 17, 18
## 19
## 19, 21, 24
## 19, 24
## 19, 24, 25
## 19.24
## 20
## 22, 23
## 24
## 24, 25, 30
## 24, 27
## 25
## 26
## 28
## 29
## 3
## 3, 21
## 3, 25
## 3,6,7,10
## 31
## 4
## 40427
## 42158
## 5
## 6
## 6, 11, 12, 13, 14
## 7
## 8
## bloque_hormonal = 1 (%) 0.535
## gleason_prec0 (%) 1.414
## 0
## 1
## 2
## 3
## 4
## 5
## nccn (%) 1.414
## 0
## 1
## 2
## 3
## 4
## 5
## 6
## tiempo_cx (median [IQR]) NA
## sangrado (median [IQR]) NA
## tiempo_consola (median [IQR]) NA
## duracion_estancia (median [IQR]) NA
## pT (%) 1.826
## 1
## 2
## 3
## 4
## N (%) <0.001
## 1
## 2
## 3
## M (%) 1.414
## 0
## 1
## 2
## gleason_pato (%) 2.449
## 1
## 2
## 3
## 4
## 5
## NA
## no_ganglios (median [IQR]) NA
## ganglios_positivos (%) <0.001
## 1 , 2, 4
## 1,4.6
## 3
## 3,4
## 3,5
## 3.4,6
## 4
## 44621
## NA
## bordes = 1 (%) 0.535
## psa_control (median [IQR]) NA
## clavien_dindo (%) 3.742
## 1
## 2
## 3
## 5
## NA
## complicaciones_mas30 (%) 1.826
## 0
## 3
## NA
## linfocele_sintomatico (%) NaN
## 0
## 1
## NA
## tiempo__pop_presentacion (%) 1.826
## 1
## 2
## 2.5
## 3
## 4
## 6
## NA
## imagen_linfocele (%) 0.816
## 0
## 1
## NA
## localizacion (%) 1.095
## 0
## 1
## 2
## NA
## volumen (median [IQR]) NA
## manejo (%) 1.826
## 0
## 1
## 2
## NA
## drenaje_punciones (%) 1.414
## 1
## 4
## NA
## escleroterapia = NA (%) 0.535
## cultivo (%) 0.816
## 6
## 44717
## NA
## blee = NA (%) 0.535
## imagen_control\r\n (mean (SD)) NA
write.csv(tabone, "robot.csv")
logage_dx<- lm(linfocele_sintomatico~age_dx,data=data, family=binomial)
## Warning: In lm.fit(x, y, offset = offset, singular.ok = singular.ok, ...) :
## extra argument 'family' will be disregarded
logPSA_inicial<- lm(linfocele_sintomatico~PSA_inicial,data=data, family=binomial)
## Warning: In lm.fit(x, y, offset = offset, singular.ok = singular.ok, ...) :
## extra argument 'family' will be disregarded
logIMC<- lm(linfocele_sintomatico~IMC,data=data, family=binomial)
## Warning: In lm.fit(x, y, offset = offset, singular.ok = singular.ok, ...) :
## extra argument 'family' will be disregarded
logASA<- lm(linfocele_sintomatico~ASA,data=data, family=binomial)
## Warning: In lm.fit(x, y, offset = offset, singular.ok = singular.ok, ...) :
## extra argument 'family' will be disregarded
logcomorb<- lm(linfocele_sintomatico~comorb,data=data, family=binomial)
## Warning: In lm.fit(x, y, offset = offset, singular.ok = singular.ok, ...) :
## extra argument 'family' will be disregarded
logdrugs<- lm(linfocele_sintomatico~drugs,data=data, family=binomial)
## Warning: In lm.fit(x, y, offset = offset, singular.ok = singular.ok, ...) :
## extra argument 'family' will be disregarded
logbloque_hormonal<- lm(linfocele_sintomatico~bloque_hormonal,data=data, family=binomial)
## Warning: In lm.fit(x, y, offset = offset, singular.ok = singular.ok, ...) :
## extra argument 'family' will be disregarded
loggleason_prec0<- lm(linfocele_sintomatico~gleason_prec0,data=data, family=binomial)
## Warning: In lm.fit(x, y, offset = offset, singular.ok = singular.ok, ...) :
## extra argument 'family' will be disregarded
lognccn<- lm(linfocele_sintomatico~nccn,data=data, family=binomial)
## Warning: In lm.fit(x, y, offset = offset, singular.ok = singular.ok, ...) :
## extra argument 'family' will be disregarded
logtiempo_cx<- lm(linfocele_sintomatico~tiempo_cx,data=data, family=binomial)
## Warning: In lm.fit(x, y, offset = offset, singular.ok = singular.ok, ...) :
## extra argument 'family' will be disregarded
logsangrado<- lm(linfocele_sintomatico~sangrado,data=data, family=binomial)
## Warning: In lm.fit(x, y, offset = offset, singular.ok = singular.ok, ...) :
## extra argument 'family' will be disregarded
logtiempo_consola<- lm(linfocele_sintomatico~tiempo_consola,data=data, family=binomial)
## Warning: In lm.fit(x, y, offset = offset, singular.ok = singular.ok, ...) :
## extra argument 'family' will be disregarded
logduracion_estancia<- lm(linfocele_sintomatico~duracion_estancia,data=data, family=binomial)
## Warning: In lm.fit(x, y, offset = offset, singular.ok = singular.ok, ...) :
## extra argument 'family' will be disregarded
logpT<- lm(linfocele_sintomatico~pT,data=data, family=binomial)
## Warning: In lm.fit(x, y, offset = offset, singular.ok = singular.ok, ...) :
## extra argument 'family' will be disregarded
logN<- lm(linfocele_sintomatico~N,data=data, family=binomial)
## Warning: In lm.fit(x, y, offset = offset, singular.ok = singular.ok, ...) :
## extra argument 'family' will be disregarded
logM<- lm(linfocele_sintomatico~M,data=data, family=binomial)
## Warning: In lm.fit(x, y, offset = offset, singular.ok = singular.ok, ...) :
## extra argument 'family' will be disregarded
loggleason_pato<- lm(linfocele_sintomatico~gleason_pato,data=data, family=binomial)
## Warning: In lm.fit(x, y, offset = offset, singular.ok = singular.ok, ...) :
## extra argument 'family' will be disregarded
logno_ganglios<- lm(linfocele_sintomatico~no_ganglios,data=data, family=binomial)
## Warning: In lm.fit(x, y, offset = offset, singular.ok = singular.ok, ...) :
## extra argument 'family' will be disregarded
#logganglios_positivos<- lm(linfocele_sintomatico~ganglios_positivos,data=data, family=binomial)
logbordes<- lm(linfocele_sintomatico~bordes,data=data, family=binomial)
## Warning: In lm.fit(x, y, offset = offset, singular.ok = singular.ok, ...) :
## extra argument 'family' will be disregarded
logpsa_control<- lm(linfocele_sintomatico~psa_control,data=data, family=binomial)
## Warning: In lm.fit(x, y, offset = offset, singular.ok = singular.ok, ...) :
## extra argument 'family' will be disregarded
logclavien_dindo<- lm(linfocele_sintomatico~clavien_dindo,data=data, family=binomial)
## Warning: In lm.fit(x, y, offset = offset, singular.ok = singular.ok, ...) :
## extra argument 'family' will be disregarded
logcomplicaciones_mas30<- lm(linfocele_sintomatico~complicaciones_mas30,data=data, family=binomial)
## Warning: In lm.fit(x, y, offset = offset, singular.ok = singular.ok, ...) :
## extra argument 'family' will be disregarded
loglinfocele_sintomatico<- lm(linfocele_sintomatico~linfocele_sintomatico,data=data, family=binomial)
## Warning in model.matrix.default(mt, mf, contrasts): the response appeared on the
## right-hand side and was dropped
## Warning in model.matrix.default(mt, mf, contrasts): problem with term 1 in
## model.matrix: no columns are assigned
## Warning: In lm.fit(x, y, offset = offset, singular.ok = singular.ok, ...) :
## extra argument 'family' will be disregarded
logtiempo__pop_presentacion<- lm(linfocele_sintomatico~tiempo__pop_presentacion,data=data, family=binomial)
## Warning: In lm.fit(x, y, offset = offset, singular.ok = singular.ok, ...) :
## extra argument 'family' will be disregarded
logimagen_linfocele<- lm(linfocele_sintomatico~imagen_linfocele,data=data, family=binomial)
## Warning: In lm.fit(x, y, offset = offset, singular.ok = singular.ok, ...) :
## extra argument 'family' will be disregarded
loglocalizacion<- lm(linfocele_sintomatico~localizacion,data=data, family=binomial)
## Warning: In lm.fit(x, y, offset = offset, singular.ok = singular.ok, ...) :
## extra argument 'family' will be disregarded
logvolumen<- lm(linfocele_sintomatico~volumen,data=data, family=binomial)
## Warning: In lm.fit(x, y, offset = offset, singular.ok = singular.ok, ...) :
## extra argument 'family' will be disregarded
logmanejo<- lm(linfocele_sintomatico~manejo,data=data, family=binomial)
## Warning: In lm.fit(x, y, offset = offset, singular.ok = singular.ok, ...) :
## extra argument 'family' will be disregarded
logdrenaje_punciones<- lm(linfocele_sintomatico~drenaje_punciones,data=data, family=binomial)
## Warning: In lm.fit(x, y, offset = offset, singular.ok = singular.ok, ...) :
## extra argument 'family' will be disregarded
logescleroterapia<- lm(linfocele_sintomatico~escleroterapia,data=data, family=binomial)
## Warning: In lm.fit(x, y, offset = offset, singular.ok = singular.ok, ...) :
## extra argument 'family' will be disregarded
logcultivo<- lm(linfocele_sintomatico~cultivo,data=data, family=binomial)
## Warning: In lm.fit(x, y, offset = offset, singular.ok = singular.ok, ...) :
## extra argument 'family' will be disregarded
logblee<- lm(linfocele_sintomatico~blee,data=data, family=binomial)
## Warning: In lm.fit(x, y, offset = offset, singular.ok = singular.ok, ...) :
## extra argument 'family' will be disregarded
summary( logage_dx)
##
## Call:
## lm(formula = linfocele_sintomatico ~ age_dx, data = data, family = binomial)
##
## Residuals:
## Min 1Q Median 3Q Max
## -0.23379 -0.11908 -0.10474 -0.04738 0.85224
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 1.02244 1.66520 0.614 0.559
## age_dx -0.01434 0.02614 -0.549 0.600
##
## Residual standard error: 0.3489 on 7 degrees of freedom
## (121 observations deleted due to missingness)
## Multiple R-squared: 0.04123, Adjusted R-squared: -0.09574
## F-statistic: 0.301 on 1 and 7 DF, p-value: 0.6003
summary( logPSA_inicial)
##
## Call:
## lm(formula = linfocele_sintomatico ~ PSA_inicial, data = data,
## family = binomial)
##
## Residuals:
## Min 1Q Median 3Q Max
## -0.14599 -0.13125 -0.10090 -0.09396 0.88219
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 0.145991 0.192091 0.760 0.472
## PSA_inicial -0.004336 0.018810 -0.231 0.824
##
## Residual standard error: 0.355 on 7 degrees of freedom
## (121 observations deleted due to missingness)
## Multiple R-squared: 0.007534, Adjusted R-squared: -0.1342
## F-statistic: 0.05314 on 1 and 7 DF, p-value: 0.8243
summary( logIMC)
##
## Call:
## lm(formula = linfocele_sintomatico ~ IMC, data = data, family = binomial)
##
## Residuals:
## Min 1Q Median 3Q Max
## -0.23888 -0.15418 -0.06949 -0.00108 0.81650
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) -0.76447 1.11724 -0.684 0.516
## IMC 0.03258 0.04135 0.788 0.457
##
## Residual standard error: 0.3415 on 7 degrees of freedom
## (121 observations deleted due to missingness)
## Multiple R-squared: 0.08144, Adjusted R-squared: -0.04978
## F-statistic: 0.6206 on 1 and 7 DF, p-value: 0.4567
summary( logASA)
##
## Call:
## lm(formula = linfocele_sintomatico ~ ASA, data = data, family = binomial)
##
## Residuals:
## Min 1Q Median 3Q Max
## -0.1667 -0.1667 -0.1667 0.0000 0.8333
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 0.5000 0.5808 0.861 0.418
## ASA -0.1667 0.2440 -0.683 0.516
##
## Residual standard error: 0.345 on 7 degrees of freedom
## (121 observations deleted due to missingness)
## Multiple R-squared: 0.0625, Adjusted R-squared: -0.07143
## F-statistic: 0.4667 on 1 and 7 DF, p-value: 0.5165
summary( logcomorb)
##
## Call:
## lm(formula = linfocele_sintomatico ~ comorb, data = data, family = binomial)
##
## Residuals:
## Min 1Q Median 3Q Max
## -0.1429 -0.1429 -0.1429 0.0000 0.8571
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) -2.820e-17 2.474e-01 0.000 1.000
## comorb 1.429e-01 2.806e-01 0.509 0.626
##
## Residual standard error: 0.3499 on 7 degrees of freedom
## (121 observations deleted due to missingness)
## Multiple R-squared: 0.03571, Adjusted R-squared: -0.102
## F-statistic: 0.2593 on 1 and 7 DF, p-value: 0.6263
summary( logdrugs)
##
## Call:
## lm(formula = linfocele_sintomatico ~ drugs, data = data, family = binomial)
##
## Residuals:
## Min 1Q Median 3Q Max
## -0.125 -0.125 -0.125 -0.125 0.875
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 3.084e-17 3.536e-01 0.000 1.000
## drugs1 1.250e-01 3.750e-01 0.333 0.749
##
## Residual standard error: 0.3536 on 7 degrees of freedom
## (121 observations deleted due to missingness)
## Multiple R-squared: 0.01562, Adjusted R-squared: -0.125
## F-statistic: 0.1111 on 1 and 7 DF, p-value: 0.7486
summary( logbloque_hormonal)
##
## Call:
## lm(formula = linfocele_sintomatico ~ bloque_hormonal, data = data,
## family = binomial)
##
## Residuals:
## Min 1Q Median 3Q Max
## -0.125 -0.125 -0.125 -0.125 0.875
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 0.125 0.125 1.000 0.351
## bloque_hormonal -0.125 0.375 -0.333 0.749
##
## Residual standard error: 0.3536 on 7 degrees of freedom
## (121 observations deleted due to missingness)
## Multiple R-squared: 0.01563, Adjusted R-squared: -0.125
## F-statistic: 0.1111 on 1 and 7 DF, p-value: 0.7486
summary( loggleason_prec0)
##
## Call:
## lm(formula = linfocele_sintomatico ~ gleason_prec0, data = data,
## family = binomial)
##
## Residuals:
## Min 1Q Median 3Q Max
## -0.13924 -0.11392 -0.11392 -0.08861 0.88608
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 0.07595 0.26401 0.288 0.782
## gleason_prec0 0.01266 0.08491 0.149 0.886
##
## Residual standard error: 0.3558 on 7 degrees of freedom
## (121 observations deleted due to missingness)
## Multiple R-squared: 0.003165, Adjusted R-squared: -0.1392
## F-statistic: 0.02222 on 1 and 7 DF, p-value: 0.8857
summary( lognccn)
##
## Call:
## lm(formula = linfocele_sintomatico ~ nccn, data = data, family = binomial)
##
## Residuals:
## Min 1Q Median 3Q Max
## -0.16162 -0.11616 -0.11616 -0.08586 0.88384
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 0.16162 0.27892 0.579 0.580
## nccn -0.01515 0.07576 -0.200 0.847
##
## Residual standard error: 0.3553 on 7 degrees of freedom
## (121 observations deleted due to missingness)
## Multiple R-squared: 0.005682, Adjusted R-squared: -0.1364
## F-statistic: 0.04 on 1 and 7 DF, p-value: 0.8472
summary( logtiempo_cx)
##
## Call:
## lm(formula = linfocele_sintomatico ~ tiempo_cx, data = data,
## family = binomial)
##
## Residuals:
## Min 1Q Median 3Q Max
## -0.27900 -0.25611 0.01862 0.01862 0.69811
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) -0.018620 0.140993 -0.132 0.899
## tiempo_cx 0.001526 0.001103 1.383 0.209
##
## Residual standard error: 0.3158 on 7 degrees of freedom
## (121 observations deleted due to missingness)
## Multiple R-squared: 0.2146, Adjusted R-squared: 0.1024
## F-statistic: 1.913 on 1 and 7 DF, p-value: 0.2091
summary( logsangrado)
##
## Call:
## lm(formula = linfocele_sintomatico ~ sangrado, data = data, family = binomial)
##
## Residuals:
## Min 1Q Median 3Q Max
## -0.14684 -0.11521 -0.11521 -0.09413 0.88479
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 0.1573795 0.2829240 0.556 0.595
## sangrado -0.0001054 0.0005854 -0.180 0.862
##
## Residual standard error: 0.3555 on 7 degrees of freedom
## (121 observations deleted due to missingness)
## Multiple R-squared: 0.004612, Adjusted R-squared: -0.1376
## F-statistic: 0.03243 on 1 and 7 DF, p-value: 0.8622
summary( logtiempo_consola)
##
## Call:
## lm(formula = linfocele_sintomatico ~ tiempo_consola, data = data,
## family = binomial)
##
## Residuals:
## Min 1Q Median 3Q Max
## -0.13843 -0.13843 -0.10227 -0.07335 0.88326
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) -0.121901 1.109994 -0.110 0.916
## tiempo_consola 0.001446 0.006850 0.211 0.839
##
## Residual standard error: 0.3552 on 7 degrees of freedom
## (121 observations deleted due to missingness)
## Multiple R-squared: 0.006327, Adjusted R-squared: -0.1356
## F-statistic: 0.04457 on 1 and 7 DF, p-value: 0.8388
summary( logduracion_estancia)
##
## Call:
## lm(formula = linfocele_sintomatico ~ duracion_estancia, data = data,
## family = binomial)
##
## Residuals:
## Min 1Q Median 3Q Max
## -0.1667 -0.1667 -0.1667 0.0000 0.8333
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 0.3333 0.3450 0.966 0.366
## duracion_estancia -0.1667 0.2440 -0.683 0.516
##
## Residual standard error: 0.345 on 7 degrees of freedom
## (121 observations deleted due to missingness)
## Multiple R-squared: 0.0625, Adjusted R-squared: -0.07143
## F-statistic: 0.4667 on 1 and 7 DF, p-value: 0.5165
summary( logpT)
##
## Call:
## lm(formula = linfocele_sintomatico ~ pT, data = data, family = binomial)
##
## Residuals:
## Min 1Q Median 3Q Max
## -0.22222 -0.22222 -0.05556 -0.05556 0.77778
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 0.3889 0.2992 1.3 0.235
## pT -0.1667 0.1667 -1.0 0.351
##
## Residual standard error: 0.3333 on 7 degrees of freedom
## (121 observations deleted due to missingness)
## Multiple R-squared: 0.125, Adjusted R-squared: 0
## F-statistic: 1 on 1 and 7 DF, p-value: 0.3506
summary( logN)
##
## Call:
## lm(formula = linfocele_sintomatico ~ N, data = data, family = binomial)
##
## Residuals:
## Min 1Q Median 3Q Max
## -0.1111 -0.1111 -0.1111 -0.1111 0.8889
##
## Coefficients: (1 not defined because of singularities)
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 0.1111 0.1111 1 0.347
## N NA NA NA NA
##
## Residual standard error: 0.3333 on 8 degrees of freedom
## (121 observations deleted due to missingness)
summary( logM)
##
## Call:
## lm(formula = linfocele_sintomatico ~ M, data = data, family = binomial)
##
## Residuals:
## Min 1Q Median 3Q Max
## -0.2 -0.2 0.0 0.0 0.8
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 0.2000 0.1512 1.323 0.227
## M -0.2000 0.2268 -0.882 0.407
##
## Residual standard error: 0.3381 on 7 degrees of freedom
## (121 observations deleted due to missingness)
## Multiple R-squared: 0.1, Adjusted R-squared: -0.02857
## F-statistic: 0.7778 on 1 and 7 DF, p-value: 0.4071
summary( loggleason_pato)
##
## Call:
## lm(formula = linfocele_sintomatico ~ gleason_pato, data = data,
## family = binomial)
##
## Residuals:
## Min 1Q Median 3Q Max
## -0.3333 0.0000 0.0000 0.0000 0.6667
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 0.44444 0.24125 1.842 0.108
## gleason_pato -0.11111 0.07274 -1.528 0.170
##
## Residual standard error: 0.3086 on 7 degrees of freedom
## (121 observations deleted due to missingness)
## Multiple R-squared: 0.25, Adjusted R-squared: 0.1429
## F-statistic: 2.333 on 1 and 7 DF, p-value: 0.1705
summary( logno_ganglios)
##
## Call:
## lm(formula = linfocele_sintomatico ~ no_ganglios, data = data,
## family = binomial)
##
## Residuals:
## Min 1Q Median 3Q Max
## -0.20616 -0.19534 -0.08705 -0.02207 0.82632
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) -0.29196 0.56537 -0.516 0.621
## no_ganglios 0.01083 0.01487 0.728 0.490
##
## Residual standard error: 0.3436 on 7 degrees of freedom
## (121 observations deleted due to missingness)
## Multiple R-squared: 0.07039, Adjusted R-squared: -0.06241
## F-statistic: 0.53 on 1 and 7 DF, p-value: 0.4902
#summary( logganglios_positivos)
summary( logbordes)
##
## Call:
## lm(formula = linfocele_sintomatico ~ bordes, data = data, family = binomial)
##
## Residuals:
## Min 1Q Median 3Q Max
## -0.125 -0.125 -0.125 -0.125 0.875
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 0.125 0.125 1.000 0.351
## bordes -0.125 0.375 -0.333 0.749
##
## Residual standard error: 0.3536 on 7 degrees of freedom
## (121 observations deleted due to missingness)
## Multiple R-squared: 0.01563, Adjusted R-squared: -0.125
## F-statistic: 0.1111 on 1 and 7 DF, p-value: 0.7486
summary( logpsa_control)
##
## Call:
## lm(formula = linfocele_sintomatico ~ psa_control, data = data,
## family = binomial)
##
## Residuals:
## 39 46 82 91 108
## 0 0 0 0 0
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 0 0 NaN NaN
## psa_control 0 0 NaN NaN
##
## Residual standard error: 0 on 3 degrees of freedom
## (125 observations deleted due to missingness)
## Multiple R-squared: NaN, Adjusted R-squared: NaN
## F-statistic: NaN on 1 and 3 DF, p-value: NA
summary( logclavien_dindo)
##
## Call:
## lm(formula = linfocele_sintomatico ~ clavien_dindo, data = data,
## family = binomial)
##
## Residuals:
## 39 46 83 107
## -0.45455 0.09091 0.54545 -0.18182
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 0.7273 0.6098 1.193 0.355
## clavien_dindo -0.2727 0.3149 -0.866 0.478
##
## Residual standard error: 0.5222 on 2 degrees of freedom
## (126 observations deleted due to missingness)
## Multiple R-squared: 0.2727, Adjusted R-squared: -0.09091
## F-statistic: 0.75 on 1 and 2 DF, p-value: 0.4778
summary( logcomplicaciones_mas30)
##
## Call:
## lm(formula = linfocele_sintomatico ~ complicaciones_mas30, data = data,
## family = binomial)
##
## Residuals:
## 82 91 108 111 112
## 0 0 0 0 0
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 0 0 NaN NaN
## complicaciones_mas30 0 0 NaN NaN
##
## Residual standard error: 0 on 3 degrees of freedom
## (125 observations deleted due to missingness)
## Multiple R-squared: NaN, Adjusted R-squared: NaN
## F-statistic: NaN on 1 and 3 DF, p-value: NA
summary( loglinfocele_sintomatico)
##
## Call:
## lm(formula = linfocele_sintomatico ~ linfocele_sintomatico, data = data,
## family = binomial)
##
## Residuals:
## Min 1Q Median 3Q Max
## -0.1111 -0.1111 -0.1111 -0.1111 0.8889
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 0.1111 0.1111 1 0.347
##
## Residual standard error: 0.3333 on 8 degrees of freedom
## (121 observations deleted due to missingness)
summary( logtiempo__pop_presentacion)
##
## Call:
## lm(formula = linfocele_sintomatico ~ tiempo__pop_presentacion,
## data = data, family = binomial)
##
## Residuals:
## Min 1Q Median 3Q Max
## -0.19186 -0.19186 -0.10465 -0.01744 0.80814
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 0.25000 0.20101 1.244 0.254
## tiempo__pop_presentacion -0.05814 0.06952 -0.836 0.431
##
## Residual standard error: 0.3398 on 7 degrees of freedom
## (121 observations deleted due to missingness)
## Multiple R-squared: 0.09084, Adjusted R-squared: -0.03904
## F-statistic: 0.6994 on 1 and 7 DF, p-value: 0.4306
summary( logimagen_linfocele)
##
## Call:
## lm(formula = linfocele_sintomatico ~ imagen_linfocele, data = data,
## family = binomial)
##
## Residuals:
## Min 1Q Median 3Q Max
## -0.1429 -0.1429 -0.1429 0.0000 0.8571
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 5.727e-17 2.474e-01 0.000 1.000
## imagen_linfocele 1.429e-01 2.806e-01 0.509 0.626
##
## Residual standard error: 0.3499 on 7 degrees of freedom
## (121 observations deleted due to missingness)
## Multiple R-squared: 0.03571, Adjusted R-squared: -0.102
## F-statistic: 0.2593 on 1 and 7 DF, p-value: 0.6263
summary( loglocalizacion)
##
## Call:
## lm(formula = linfocele_sintomatico ~ localizacion, data = data,
## family = binomial)
##
## Residuals:
## Min 1Q Median 3Q Max
## -0.15385 -0.11538 -0.11538 -0.07692 0.88462
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 0.15385 0.26086 0.590 0.574
## localizacion -0.03846 0.20915 -0.184 0.859
##
## Residual standard error: 0.3555 on 7 degrees of freedom
## (121 observations deleted due to missingness)
## Multiple R-squared: 0.004808, Adjusted R-squared: -0.1374
## F-statistic: 0.03382 on 1 and 7 DF, p-value: 0.8593
summary( logvolumen)
##
## Call:
## lm(formula = linfocele_sintomatico ~ volumen, data = data, family = binomial)
##
## Residuals:
## Min 1Q Median 3Q Max
## -0.27332 -0.18711 -0.08461 0.03622 0.77012
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 0.3072638 0.2381180 1.290 0.244
## volumen -0.0006788 0.0007510 -0.904 0.401
##
## Residual standard error: 0.3583 on 6 degrees of freedom
## (122 observations deleted due to missingness)
## Multiple R-squared: 0.1199, Adjusted R-squared: -0.02683
## F-statistic: 0.8171 on 1 and 6 DF, p-value: 0.4009
summary( logmanejo)
##
## Call:
## lm(formula = linfocele_sintomatico ~ manejo, data = data, family = binomial)
##
## Residuals:
## Min 1Q Median 3Q Max
## -0.22222 -0.22222 -0.05556 -0.05556 0.77778
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 0.2222 0.1571 1.414 0.200
## manejo -0.1667 0.1667 -1.000 0.351
##
## Residual standard error: 0.3333 on 7 degrees of freedom
## (121 observations deleted due to missingness)
## Multiple R-squared: 0.125, Adjusted R-squared: 0
## F-statistic: 1 on 1 and 7 DF, p-value: 0.3506
summary( logdrenaje_punciones)
##
## Call:
## lm(formula = linfocele_sintomatico ~ drenaje_punciones, data = data,
## family = binomial)
##
## Residuals:
## 46 82 91 111
## 0 0 0 0
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 0 0 NaN NaN
## drenaje_punciones 0 0 NaN NaN
##
## Residual standard error: 0 on 2 degrees of freedom
## (126 observations deleted due to missingness)
## Multiple R-squared: NaN, Adjusted R-squared: NaN
## F-statistic: NaN on 1 and 2 DF, p-value: NA
summary( logescleroterapia)
##
## Call:
## lm(formula = linfocele_sintomatico ~ escleroterapia, data = data,
## family = binomial)
##
## Residuals:
## ALL 1 residuals are 0: no residual degrees of freedom!
##
## Coefficients: (1 not defined because of singularities)
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 0 NaN NaN NaN
## escleroterapia NA NA NA NA
##
## Residual standard error: NaN on 0 degrees of freedom
## (129 observations deleted due to missingness)
summary( logcultivo)
##
## Call:
## lm(formula = linfocele_sintomatico ~ cultivo, data = data, family = binomial)
##
## Residuals:
## ALL 2 residuals are 0: no residual degrees of freedom!
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 0 NaN NaN NaN
## cultivo 0 NaN NaN NaN
##
## Residual standard error: NaN on 0 degrees of freedom
## (128 observations deleted due to missingness)
## Multiple R-squared: NaN, Adjusted R-squared: NaN
## F-statistic: NaN on 1 and 0 DF, p-value: NA
summary( logblee)
##
## Call:
## lm(formula = linfocele_sintomatico ~ blee, data = data, family = binomial)
##
## Residuals:
## ALL 1 residuals are 0: no residual degrees of freedom!
##
## Coefficients: (1 not defined because of singularities)
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 0 NaN NaN NaN
## blee NA NA NA NA
##
## Residual standard error: NaN on 0 degrees of freedom
## (129 observations deleted due to missingness)
sjPlot::tab_model(
logage_dx,
logPSA_inicial,
logIMC,
logASA,
logcomorb,
logdrugs,
logbloque_hormonal,
loggleason_prec0,
lognccn,
logtiempo_cx,
logsangrado,
logtiempo_consola,
logduracion_estancia,
logpT,
logN,
logM,
loggleason_pato,
logno_ganglios,
logbordes,
logpsa_control,
logclavien_dindo,
logcomplicaciones_mas30,
loglinfocele_sintomatico,
logtiempo__pop_presentacion,
logimagen_linfocele,
loglocalizacion,
logvolumen,
logmanejo,
logdrenaje_punciones,
logescleroterapia,
logcultivo,
logblee, collapse.ci = TRUE, transform = "exp")
## Warning: Model matrix is rank deficient. Parameters N were not estimable.
## Warning: Model matrix is rank deficient. Parameters escleroterapia were not
## estimable.
## Warning: Model has zero degrees of freedom!
## Warning: Model has zero degrees of freedom!
## Warning: Model has zero degrees of freedom!
## Warning: Model has zero degrees of freedom!
## Warning: Model has zero degrees of freedom!
## Warning: Model has zero degrees of freedom!
## Warning: Model matrix is rank deficient. Parameters blee were not estimable.
## Warning: Model has zero degrees of freedom!
## Warning: Model has zero degrees of freedom!
## Warning: Model has zero degrees of freedom!
| linfocele_sintomatico | linfocele_sintomatico | linfocele_sintomatico | linfocele_sintomatico | linfocele_sintomatico | linfocele_sintomatico | linfocele_sintomatico | linfocele_sintomatico | linfocele_sintomatico | linfocele_sintomatico | linfocele_sintomatico | linfocele_sintomatico | linfocele_sintomatico | linfocele_sintomatico | linfocele_sintomatico | linfocele_sintomatico | linfocele_sintomatico | linfocele_sintomatico | linfocele_sintomatico | linfocele_sintomatico | linfocele_sintomatico | linfocele_sintomatico | linfocele_sintomatico | linfocele_sintomatico | linfocele_sintomatico | linfocele_sintomatico | linfocele_sintomatico | linfocele_sintomatico | linfocele_sintomatico | linfocele_sintomatico | linfocele_sintomatico | linfocele_sintomatico | |||||||||||||||||||||||||||||||||
|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|
| Predictors | Estimates | p | Estimates | p | Estimates | p | Estimates | p | Estimates | p | Estimates | p | Estimates | p | Estimates | p | Estimates | p | Estimates | p | Estimates | p | Estimates | p | Estimates | p | Estimates | p | Estimates | p | Estimates | p | Estimates | p | Estimates | p | Estimates | p | Estimates | p | Estimates | p | Estimates | p | Estimates | p | Estimates | p | Estimates | p | Estimates | p | Estimates | p | Estimates | p | Estimates | p | Estimates | p | Estimates | p | Estimates | p |
| (Intercept) |
2.78 (0.05 – 142.60) |
0.559 |
1.16 (0.73 – 1.82) |
0.472 |
0.47 (0.03 – 6.54) |
0.516 |
1.65 (0.42 – 6.51) |
0.418 |
1.00 (0.56 – 1.80) |
1.000 |
1.00 (0.43 – 2.31) |
1.000 |
1.13 (0.84 – 1.52) |
0.351 |
1.08 (0.58 – 2.01) |
0.782 |
1.18 (0.61 – 2.27) |
0.580 |
0.98 (0.70 – 1.37) |
0.899 |
1.17 (0.60 – 2.29) |
0.595 |
0.89 (0.06 – 12.22) |
0.916 |
1.40 (0.62 – 3.16) |
0.366 |
1.48 (0.73 – 2.99) |
0.235 |
1.12 (0.86 – 1.44) |
0.347 |
1.22 (0.85 – 1.75) |
0.227 |
1.56 (0.88 – 2.76) |
0.108 |
0.75 (0.20 – 2.84) |
0.621 |
1.13 (0.84 – 1.52) |
0.351 |
1.00 (1.00 – 1.00) |
NaN |
2.07 (0.15 – 28.54) |
0.355 |
1.00 (1.00 – 1.00) |
NaN |
1.12 (0.86 – 1.44) |
0.347 |
1.28 (0.80 – 2.07) |
0.254 |
1.00 (0.56 – 1.80) |
1.000 |
1.17 (0.63 – 2.16) |
0.574 |
1.36 (0.76 – 2.43) |
0.244 |
1.25 (0.86 – 1.81) |
0.200 |
1.00 (1.00 – 1.00) |
NaN |
1.00 (NaN – NaN) |
NaN |
1.00 (NaN – NaN) |
NaN |
1.00 (NaN – NaN) |
NaN |
| age dx |
0.99 (0.93 – 1.05) |
0.600 | ||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
| PSA inicial |
1.00 (0.95 – 1.04) |
0.824 | ||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
| IMC |
1.03 (0.94 – 1.14) |
0.457 | ||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
| ASA |
0.85 (0.48 – 1.51) |
0.516 | ||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
| comorb |
1.15 (0.59 – 2.24) |
0.626 | ||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
| drugs [1] |
1.13 (0.47 – 2.75) |
0.749 | ||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
| bloque hormonal |
0.88 (0.36 – 2.14) |
0.749 | ||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
| gleason prec0 |
1.01 (0.83 – 1.24) |
0.886 | ||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
| nccn |
0.98 (0.82 – 1.18) |
0.847 | ||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
| tiempo cx |
1.00 (1.00 – 1.00) |
0.209 | ||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
| sangrado |
1.00 (1.00 – 1.00) |
0.862 | ||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
| tiempo consola |
1.00 (0.99 – 1.02) |
0.839 | ||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
| duracion estancia |
0.85 (0.48 – 1.51) |
0.516 | ||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
| pT |
0.85 (0.57 – 1.26) |
0.351 | ||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
| M |
0.82 (0.48 – 1.40) |
0.407 | ||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
| gleason pato |
0.89 (0.75 – 1.06) |
0.170 | ||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
| no ganglios |
1.01 (0.98 – 1.05) |
0.490 | ||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
| bordes |
0.88 (0.36 – 2.14) |
0.749 | ||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
| psa control |
1.00 (1.00 – 1.00) |
NaN | ||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
| clavien dindo |
0.76 (0.20 – 2.95) |
0.478 | ||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
| complicaciones mas30 |
1.00 (1.00 – 1.00) |
NaN | ||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
| tiempo pop presentacion |
0.94 (0.80 – 1.11) |
0.431 | ||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
| imagen linfocele |
1.15 (0.59 – 2.24) |
0.626 | ||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
| localizacion |
0.96 (0.59 – 1.58) |
0.859 | ||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
| volumen |
1.00 (1.00 – 1.00) |
0.401 | ||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
| manejo |
0.85 (0.57 – 1.26) |
0.351 | ||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
| drenaje punciones |
1.00 (1.00 – 1.00) |
NaN | ||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
| cultivo |
1.00 (NaN – NaN) |
NaN | ||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
| Observations | 9 | 9 | 9 | 9 | 9 | 9 | 9 | 9 | 9 | 9 | 9 | 9 | 9 | 9 | 9 | 9 | 9 | 9 | 9 | 5 | 4 | 5 | 9 | 9 | 9 | 9 | 8 | 9 | 4 | 1 | 2 | 1 | ||||||||||||||||||||||||||||||||
| R2 / R2 adjusted | 0.041 / -0.096 | 0.008 / -0.134 | 0.081 / -0.050 | 0.062 / -0.071 | 0.036 / -0.102 | 0.016 / -0.125 | 0.016 / -0.125 | 0.003 / -0.139 | 0.006 / -0.136 | 0.215 / 0.102 | 0.005 / -0.138 | 0.006 / -0.136 | 0.063 / -0.071 | 0.125 / 0.000 | 0.000 / 0.000 | 0.100 / -0.029 | 0.250 / 0.143 | 0.070 / -0.062 | 0.016 / -0.125 | NA | 0.273 / -0.091 | NA | 0.000 / 0.000 | 0.091 / -0.039 | 0.036 / -0.102 | 0.005 / -0.137 | 0.120 / -0.027 | 0.125 / 0.000 | NA | 0.000 / 0.000 | NA | 0.000 / 0.000 | ||||||||||||||||||||||||||||||||