Compendio_ejmplo 1 EDA

Author

Angel

Importar base

library(readr)
blood_storage <- read_csv("C:/Users/David/Downloads/blood_storage.csv")
New names:
Rows: 316 Columns: 21
── Column specification
──────────────────────────────────────────────────────── Delimiter: "," dbl
(21): ...1, RBC.Age.Group, Median.RBC.Age, Age, AA, FamHx, PVol, TVol, T...
ℹ Use `spec()` to retrieve the full column specification for this data. ℹ
Specify the column types or set `show_col_types = FALSE` to quiet this message.
• `` -> `...1`
View(blood_storage)
library("RColorBrewer")

Resumen de base de datos

summary(blood_storage)
      ...1        RBC.Age.Group   Median.RBC.Age       Age       
 Min.   :  1.00   Min.   :1.000   Min.   :10.00   Min.   :38.40  
 1st Qu.: 79.75   1st Qu.:1.000   1st Qu.:10.00   1st Qu.:56.20  
 Median :158.50   Median :2.000   Median :15.00   Median :61.85  
 Mean   :158.50   Mean   :2.003   Mean   :16.71   Mean   :61.16  
 3rd Qu.:237.25   3rd Qu.:3.000   3rd Qu.:25.00   3rd Qu.:66.10  
 Max.   :316.00   Max.   :3.000   Max.   :25.00   Max.   :79.00  
                                                                 
       AA             FamHx             PVol             TVol      
 Min.   :0.0000   Min.   :0.0000   Min.   : 19.40   Min.   :1.000  
 1st Qu.:0.0000   1st Qu.:0.0000   1st Qu.: 40.85   1st Qu.:2.000  
 Median :0.0000   Median :0.0000   Median : 49.00   Median :2.000  
 Mean   :0.1741   Mean   :0.2152   Mean   : 56.45   Mean   :2.094  
 3rd Qu.:0.0000   3rd Qu.:0.0000   3rd Qu.: 64.05   3rd Qu.:3.000  
 Max.   :1.0000   Max.   :1.0000   Max.   :274.00   Max.   :3.000  
                                   NA's   :9        NA's   :6      
    T.Stage           bGS           BN+          OrganConfined   
 Min.   :1.000   Min.   :1.0   Min.   :0.00000   Min.   :0.0000  
 1st Qu.:1.000   1st Qu.:1.0   1st Qu.:0.00000   1st Qu.:0.0000  
 Median :1.000   Median :1.0   Median :0.00000   Median :1.0000  
 Mean   :1.112   Mean   :1.5   Mean   :0.05696   Mean   :0.6551  
 3rd Qu.:1.000   3rd Qu.:2.0   3rd Qu.:0.00000   3rd Qu.:1.0000  
 Max.   :2.000   Max.   :3.0   Max.   :1.00000   Max.   :1.0000  
 NA's   :13      NA's   :2                                       
    PreopPSA       PreopTherapy        Units             sGS       
 Min.   : 1.300   Min.   :0.0000   Min.   : 1.000   Min.   :1.000  
 1st Qu.: 4.980   1st Qu.:0.0000   1st Qu.: 2.000   1st Qu.:2.000  
 Median : 6.200   Median :0.0000   Median : 2.000   Median :3.000  
 Mean   : 8.185   Mean   :0.1203   Mean   : 2.456   Mean   :2.557  
 3rd Qu.: 9.000   3rd Qu.:0.0000   3rd Qu.: 2.000   3rd Qu.:3.000  
 Max.   :40.100   Max.   :1.0000   Max.   :19.000   Max.   :4.000  
 NA's   :3                                                         
 AnyAdjTherapy     AdjRadTherapy        Recurrence         Censor      
 Min.   :0.00000   Min.   :0.000000   Min.   :0.0000   Min.   :0.0000  
 1st Qu.:0.00000   1st Qu.:0.000000   1st Qu.:0.0000   1st Qu.:1.0000  
 Median :0.00000   Median :0.000000   Median :0.0000   Median :1.0000  
 Mean   :0.02215   Mean   :0.003165   Mean   :0.1709   Mean   :0.8291  
 3rd Qu.:0.00000   3rd Qu.:0.000000   3rd Qu.:0.0000   3rd Qu.:1.0000  
 Max.   :1.00000   Max.   :1.000000   Max.   :1.0000   Max.   :1.0000  
                                                                       
 TimeToRecurrence 
 Min.   :  0.270  
 1st Qu.:  7.585  
 Median : 25.300  
 Mean   : 32.918  
 3rd Qu.: 52.035  
 Max.   :103.600  
 NA's   :1        

Recodificación de variables

str(blood_storage)
spc_tbl_ [316 × 21] (S3: spec_tbl_df/tbl_df/tbl/data.frame)
 $ ...1            : num [1:316] 1 2 3 4 5 6 7 8 9 10 ...
 $ RBC.Age.Group   : num [1:316] 3 3 3 2 2 3 3 1 1 2 ...
 $ Median.RBC.Age  : num [1:316] 25 25 25 15 15 25 25 10 10 15 ...
 $ Age             : num [1:316] 72.1 73.6 67.5 65.8 63.2 65.4 65.5 67.1 63.9 63 ...
 $ AA              : num [1:316] 0 0 0 0 0 0 1 0 0 1 ...
 $ FamHx           : num [1:316] 0 0 0 0 0 0 0 0 0 0 ...
 $ PVol            : num [1:316] 54 43.2 102.7 46 60 ...
 $ TVol            : num [1:316] 3 3 1 1 2 2 2 3 2 2 ...
 $ T.Stage         : num [1:316] 1 2 1 1 1 1 1 1 1 1 ...
 $ bGS             : num [1:316] 3 2 3 1 2 1 1 1 1 2 ...
 $ BN+             : num [1:316] 0 0 0 0 0 0 0 0 0 0 ...
 $ OrganConfined   : num [1:316] 0 1 1 1 1 0 1 0 1 1 ...
 $ PreopPSA        : num [1:316] 14.08 10.5 6.98 4.4 21.4 ...
 $ PreopTherapy    : num [1:316] 1 0 1 0 0 0 0 0 0 0 ...
 $ Units           : num [1:316] 6 2 1 2 3 1 2 4 1 2 ...
 $ sGS             : num [1:316] 1 3 1 3 3 3 3 3 3 3 ...
 $ AnyAdjTherapy   : num [1:316] 0 0 0 0 0 0 0 0 0 0 ...
 $ AdjRadTherapy   : num [1:316] 0 0 0 0 0 0 0 0 0 0 ...
 $ Recurrence      : num [1:316] 1 1 0 0 0 0 0 1 0 0 ...
 $ Censor          : num [1:316] 0 0 1 1 1 1 1 0 1 1 ...
 $ TimeToRecurrence: num [1:316] 2.67 47.63 14.1 59.47 1.23 ...
 - attr(*, "spec")=
  .. cols(
  ..   ...1 = col_double(),
  ..   RBC.Age.Group = col_double(),
  ..   Median.RBC.Age = col_double(),
  ..   Age = col_double(),
  ..   AA = col_double(),
  ..   FamHx = col_double(),
  ..   PVol = col_double(),
  ..   TVol = col_double(),
  ..   T.Stage = col_double(),
  ..   bGS = col_double(),
  ..   `BN+` = col_double(),
  ..   OrganConfined = col_double(),
  ..   PreopPSA = col_double(),
  ..   PreopTherapy = col_double(),
  ..   Units = col_double(),
  ..   sGS = col_double(),
  ..   AnyAdjTherapy = col_double(),
  ..   AdjRadTherapy = col_double(),
  ..   Recurrence = col_double(),
  ..   Censor = col_double(),
  ..   TimeToRecurrence = col_double()
  .. )
 - attr(*, "problems")=<externalptr> 
blood_storage$RBC.Age.Group<-factor(blood_storage$RBC.Age.Group, levels = c(1,2,3), 
                                    labels = c("younger", "middle", "older"))
blood_storage$AA<-factor(blood_storage$AA,levels = c(0,1),
                         labels = c("other", "African american"))
blood_storage$FamHx<-factor(blood_storage$FamHx, levels = c(0,1), labels = c("No", "Yes"))
blood_storage$TVol<-factor(blood_storage$TVol, levels = c(1,2,3), 
                           labels = c("Low", "Medium", "Extensive"))
blood_storage$T.Stage<-factor(blood_storage$T.Stage, levels = c(1,2), 
                              labels = c("T1-T2a", "T2b-T3"))
blood_storage$bGS<-factor(blood_storage$bGS, levels = c(1,2,3), labels = c("0-6", "7", "8-10"))
blood_storage$`BN+`<-factor(blood_storage$`BN+`, levels = c(0,1), labels = c("No", "Yes"))
blood_storage$OrganConfined<-factor(blood_storage$OrganConfined, levels = c(0,1), 
                                    labels = c("No", "Yes"))
blood_storage$PreopTherapy<-factor(blood_storage$PreopTherapy, 
                                   levels = c(0,1), labels = c("No", "Yes"))
blood_storage$sGS<-factor(blood_storage$sGS, levels = c(1,2,3,4), 
                          labels = c("NA", "7", "8-10", "0-6"))
blood_storage$AnyAdjTherapy<-factor(blood_storage$AnyAdjTherapy, levels = c(0,1),
                                    labels = c("No", "Yes"))
blood_storage$AdjRadTherapy<-factor(blood_storage$AdjRadTherapy, levels = c(0,1),
                                    labels = c("No", "Yes"))
blood_storage$Recurrence<-factor(blood_storage$Recurrence, levels = c(0,1), 
                                 labels = c("No", "Yes"))
blood_storage$Censor<-factor(blood_storage$Censor, levels = c(0,1), labels = c("No", "Yes"))
str(blood_storage)
spc_tbl_ [316 × 21] (S3: spec_tbl_df/tbl_df/tbl/data.frame)
 $ ...1            : num [1:316] 1 2 3 4 5 6 7 8 9 10 ...
 $ RBC.Age.Group   : Factor w/ 3 levels "younger","middle",..: 3 3 3 2 2 3 3 1 1 2 ...
 $ Median.RBC.Age  : num [1:316] 25 25 25 15 15 25 25 10 10 15 ...
 $ Age             : num [1:316] 72.1 73.6 67.5 65.8 63.2 65.4 65.5 67.1 63.9 63 ...
 $ AA              : Factor w/ 2 levels "other","African american": 1 1 1 1 1 1 2 1 1 2 ...
 $ FamHx           : Factor w/ 2 levels "No","Yes": 1 1 1 1 1 1 1 1 1 1 ...
 $ PVol            : num [1:316] 54 43.2 102.7 46 60 ...
 $ TVol            : Factor w/ 3 levels "Low","Medium",..: 3 3 1 1 2 2 2 3 2 2 ...
 $ T.Stage         : Factor w/ 2 levels "T1-T2a","T2b-T3": 1 2 1 1 1 1 1 1 1 1 ...
 $ bGS             : Factor w/ 3 levels "0-6","7","8-10": 3 2 3 1 2 1 1 1 1 2 ...
 $ BN+             : Factor w/ 2 levels "No","Yes": 1 1 1 1 1 1 1 1 1 1 ...
 $ OrganConfined   : Factor w/ 2 levels "No","Yes": 1 2 2 2 2 1 2 1 2 2 ...
 $ PreopPSA        : num [1:316] 14.08 10.5 6.98 4.4 21.4 ...
 $ PreopTherapy    : Factor w/ 2 levels "No","Yes": 2 1 2 1 1 1 1 1 1 1 ...
 $ Units           : num [1:316] 6 2 1 2 3 1 2 4 1 2 ...
 $ sGS             : Factor w/ 4 levels "NA","7","8-10",..: 1 3 1 3 3 3 3 3 3 3 ...
 $ AnyAdjTherapy   : Factor w/ 2 levels "No","Yes": 1 1 1 1 1 1 1 1 1 1 ...
 $ AdjRadTherapy   : Factor w/ 2 levels "No","Yes": 1 1 1 1 1 1 1 1 1 1 ...
 $ Recurrence      : Factor w/ 2 levels "No","Yes": 2 2 1 1 1 1 1 2 1 1 ...
 $ Censor          : Factor w/ 2 levels "No","Yes": 1 1 2 2 2 2 2 1 2 2 ...
 $ TimeToRecurrence: num [1:316] 2.67 47.63 14.1 59.47 1.23 ...
 - attr(*, "spec")=
  .. cols(
  ..   ...1 = col_double(),
  ..   RBC.Age.Group = col_double(),
  ..   Median.RBC.Age = col_double(),
  ..   Age = col_double(),
  ..   AA = col_double(),
  ..   FamHx = col_double(),
  ..   PVol = col_double(),
  ..   TVol = col_double(),
  ..   T.Stage = col_double(),
  ..   bGS = col_double(),
  ..   `BN+` = col_double(),
  ..   OrganConfined = col_double(),
  ..   PreopPSA = col_double(),
  ..   PreopTherapy = col_double(),
  ..   Units = col_double(),
  ..   sGS = col_double(),
  ..   AnyAdjTherapy = col_double(),
  ..   AdjRadTherapy = col_double(),
  ..   Recurrence = col_double(),
  ..   Censor = col_double(),
  ..   TimeToRecurrence = col_double()
  .. )
 - attr(*, "problems")=<externalptr> 

identificación de errores

#Indentificación de errores y valores perdidos
summary(blood_storage)
      ...1        RBC.Age.Group Median.RBC.Age       Age       
 Min.   :  1.00   younger:106   Min.   :10.00   Min.   :38.40  
 1st Qu.: 79.75   middle :103   1st Qu.:10.00   1st Qu.:56.20  
 Median :158.50   older  :107   Median :15.00   Median :61.85  
 Mean   :158.50                 Mean   :16.71   Mean   :61.16  
 3rd Qu.:237.25                 3rd Qu.:25.00   3rd Qu.:66.10  
 Max.   :316.00                 Max.   :25.00   Max.   :79.00  
                                                               
                AA      FamHx          PVol               TVol       T.Stage   
 other           :261   No :248   Min.   : 19.40   Low      : 64   T1-T2a:269  
 African american: 55   Yes: 68   1st Qu.: 40.85   Medium   :153   T2b-T3: 34  
                                  Median : 49.00   Extensive: 93   NA's  : 13  
                                  Mean   : 56.45   NA's     :  6               
                                  3rd Qu.: 64.05                               
                                  Max.   :274.00                               
                                  NA's   :9                                    
   bGS       BN+      OrganConfined    PreopPSA      PreopTherapy
 0-6 :189   No :298   No :109       Min.   : 1.300   No :278     
 7   : 93   Yes: 18   Yes:207       1st Qu.: 4.980   Yes: 38     
 8-10: 32                           Median : 6.200               
 NA's:  2                           Mean   : 8.185               
                                    3rd Qu.: 9.000               
                                    Max.   :40.100               
                                    NA's   :3                    
     Units          sGS      AnyAdjTherapy AdjRadTherapy Recurrence Censor   
 Min.   : 1.000   NA  : 38   No :309       No :315       No :262    No : 54  
 1st Qu.: 2.000   7   : 85   Yes:  7       Yes:  1       Yes: 54    Yes:262  
 Median : 2.000   8-10:172                                                   
 Mean   : 2.456   0-6 : 21                                                   
 3rd Qu.: 2.000                                                              
 Max.   :19.000                                                              
                                                                             
 TimeToRecurrence 
 Min.   :  0.270  
 1st Qu.:  7.585  
 Median : 25.300  
 Mean   : 32.918  
 3rd Qu.: 52.035  
 Max.   :103.600  
 NA's   :1        
#remover NA en caso de haberlos
apply(X=blood_storage, MARGIN=2, FUN=mean, na.rm=T)
Warning in mean.default(newX[, i], ...): argument is not numeric or logical:
returning NA

Warning in mean.default(newX[, i], ...): argument is not numeric or logical:
returning NA

Warning in mean.default(newX[, i], ...): argument is not numeric or logical:
returning NA

Warning in mean.default(newX[, i], ...): argument is not numeric or logical:
returning NA

Warning in mean.default(newX[, i], ...): argument is not numeric or logical:
returning NA

Warning in mean.default(newX[, i], ...): argument is not numeric or logical:
returning NA

Warning in mean.default(newX[, i], ...): argument is not numeric or logical:
returning NA

Warning in mean.default(newX[, i], ...): argument is not numeric or logical:
returning NA

Warning in mean.default(newX[, i], ...): argument is not numeric or logical:
returning NA

Warning in mean.default(newX[, i], ...): argument is not numeric or logical:
returning NA

Warning in mean.default(newX[, i], ...): argument is not numeric or logical:
returning NA

Warning in mean.default(newX[, i], ...): argument is not numeric or logical:
returning NA

Warning in mean.default(newX[, i], ...): argument is not numeric or logical:
returning NA

Warning in mean.default(newX[, i], ...): argument is not numeric or logical:
returning NA

Warning in mean.default(newX[, i], ...): argument is not numeric or logical:
returning NA

Warning in mean.default(newX[, i], ...): argument is not numeric or logical:
returning NA

Warning in mean.default(newX[, i], ...): argument is not numeric or logical:
returning NA

Warning in mean.default(newX[, i], ...): argument is not numeric or logical:
returning NA

Warning in mean.default(newX[, i], ...): argument is not numeric or logical:
returning NA

Warning in mean.default(newX[, i], ...): argument is not numeric or logical:
returning NA

Warning in mean.default(newX[, i], ...): argument is not numeric or logical:
returning NA
            ...1    RBC.Age.Group   Median.RBC.Age              Age 
              NA               NA               NA               NA 
              AA            FamHx             PVol             TVol 
              NA               NA               NA               NA 
         T.Stage              bGS              BN+    OrganConfined 
              NA               NA               NA               NA 
        PreopPSA     PreopTherapy            Units              sGS 
              NA               NA               NA               NA 
   AnyAdjTherapy    AdjRadTherapy       Recurrence           Censor 
              NA               NA               NA               NA 
TimeToRecurrence 
              NA 
#mejor fomar es el lapply la otra funcion aplica para todo el conjunto
lapply(X=blood_storage[,1:21], FUN=mean, na.rm=T)
Warning in mean.default(X[[i]], ...): argument is not numeric or logical:
returning NA
Warning in mean.default(X[[i]], ...): argument is not numeric or logical:
returning NA

Warning in mean.default(X[[i]], ...): argument is not numeric or logical:
returning NA

Warning in mean.default(X[[i]], ...): argument is not numeric or logical:
returning NA

Warning in mean.default(X[[i]], ...): argument is not numeric or logical:
returning NA

Warning in mean.default(X[[i]], ...): argument is not numeric or logical:
returning NA

Warning in mean.default(X[[i]], ...): argument is not numeric or logical:
returning NA

Warning in mean.default(X[[i]], ...): argument is not numeric or logical:
returning NA

Warning in mean.default(X[[i]], ...): argument is not numeric or logical:
returning NA

Warning in mean.default(X[[i]], ...): argument is not numeric or logical:
returning NA

Warning in mean.default(X[[i]], ...): argument is not numeric or logical:
returning NA

Warning in mean.default(X[[i]], ...): argument is not numeric or logical:
returning NA

Warning in mean.default(X[[i]], ...): argument is not numeric or logical:
returning NA

Warning in mean.default(X[[i]], ...): argument is not numeric or logical:
returning NA
$...1
[1] 158.5

$RBC.Age.Group
[1] NA

$Median.RBC.Age
[1] 16.70886

$Age
[1] 61.15728

$AA
[1] NA

$FamHx
[1] NA

$PVol
[1] 56.44821

$TVol
[1] NA

$T.Stage
[1] NA

$bGS
[1] NA

$`BN+`
[1] NA

$OrganConfined
[1] NA

$PreopPSA
[1] 8.185144

$PreopTherapy
[1] NA

$Units
[1] 2.455696

$sGS
[1] NA

$AnyAdjTherapy
[1] NA

$AdjRadTherapy
[1] NA

$Recurrence
[1] NA

$Censor
[1] NA

$TimeToRecurrence
[1] 32.91787
#---REVISAR WARNINGS QUE ARROJA, aparentemenete son de las variables que son factor---
lapply(blood_storage, is.na)|>table()
, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = FALSE, TVol = FALSE, T.Stage = FALSE, bGS = FALSE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = FALSE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = FALSE

       RBC.Age.Group
...1    FALSE
  FALSE   287

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = TRUE, TVol = FALSE, T.Stage = FALSE, bGS = FALSE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = FALSE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = FALSE

       RBC.Age.Group
...1    FALSE
  FALSE     8

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = FALSE, TVol = TRUE, T.Stage = FALSE, bGS = FALSE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = FALSE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = FALSE

       RBC.Age.Group
...1    FALSE
  FALSE     5

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = TRUE, TVol = TRUE, T.Stage = FALSE, bGS = FALSE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = FALSE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = FALSE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = FALSE, TVol = FALSE, T.Stage = TRUE, bGS = FALSE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = FALSE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = FALSE

       RBC.Age.Group
...1    FALSE
  FALSE    12

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = TRUE, TVol = FALSE, T.Stage = TRUE, bGS = FALSE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = FALSE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = FALSE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = FALSE, TVol = TRUE, T.Stage = TRUE, bGS = FALSE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = FALSE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = FALSE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = TRUE, TVol = TRUE, T.Stage = TRUE, bGS = FALSE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = FALSE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = FALSE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = FALSE, TVol = FALSE, T.Stage = FALSE, bGS = TRUE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = FALSE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = FALSE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = TRUE, TVol = FALSE, T.Stage = FALSE, bGS = TRUE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = FALSE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = FALSE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = FALSE, TVol = TRUE, T.Stage = FALSE, bGS = TRUE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = FALSE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = FALSE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = TRUE, TVol = TRUE, T.Stage = FALSE, bGS = TRUE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = FALSE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = FALSE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = FALSE, TVol = FALSE, T.Stage = TRUE, bGS = TRUE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = FALSE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = FALSE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = TRUE, TVol = FALSE, T.Stage = TRUE, bGS = TRUE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = FALSE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = FALSE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = FALSE, TVol = TRUE, T.Stage = TRUE, bGS = TRUE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = FALSE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = FALSE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = TRUE, TVol = TRUE, T.Stage = TRUE, bGS = TRUE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = FALSE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = FALSE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = FALSE, TVol = FALSE, T.Stage = FALSE, bGS = FALSE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = TRUE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = FALSE

       RBC.Age.Group
...1    FALSE
  FALSE     1

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = TRUE, TVol = FALSE, T.Stage = FALSE, bGS = FALSE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = TRUE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = FALSE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = FALSE, TVol = TRUE, T.Stage = FALSE, bGS = FALSE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = TRUE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = FALSE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = TRUE, TVol = TRUE, T.Stage = FALSE, bGS = FALSE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = TRUE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = FALSE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = FALSE, TVol = FALSE, T.Stage = TRUE, bGS = FALSE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = TRUE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = FALSE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = TRUE, TVol = FALSE, T.Stage = TRUE, bGS = FALSE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = TRUE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = FALSE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = FALSE, TVol = TRUE, T.Stage = TRUE, bGS = FALSE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = TRUE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = FALSE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = TRUE, TVol = TRUE, T.Stage = TRUE, bGS = FALSE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = TRUE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = FALSE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = FALSE, TVol = FALSE, T.Stage = FALSE, bGS = TRUE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = TRUE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = FALSE

       RBC.Age.Group
...1    FALSE
  FALSE     1

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = TRUE, TVol = FALSE, T.Stage = FALSE, bGS = TRUE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = TRUE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = FALSE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = FALSE, TVol = TRUE, T.Stage = FALSE, bGS = TRUE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = TRUE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = FALSE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = TRUE, TVol = TRUE, T.Stage = FALSE, bGS = TRUE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = TRUE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = FALSE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = FALSE, TVol = FALSE, T.Stage = TRUE, bGS = TRUE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = TRUE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = FALSE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = TRUE, TVol = FALSE, T.Stage = TRUE, bGS = TRUE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = TRUE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = FALSE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = FALSE, TVol = TRUE, T.Stage = TRUE, bGS = TRUE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = TRUE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = FALSE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = TRUE, TVol = TRUE, T.Stage = TRUE, bGS = TRUE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = TRUE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = FALSE

       RBC.Age.Group
...1    FALSE
  FALSE     1

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = FALSE, TVol = FALSE, T.Stage = FALSE, bGS = FALSE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = FALSE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = TRUE

       RBC.Age.Group
...1    FALSE
  FALSE     1

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = TRUE, TVol = FALSE, T.Stage = FALSE, bGS = FALSE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = FALSE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = TRUE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = FALSE, TVol = TRUE, T.Stage = FALSE, bGS = FALSE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = FALSE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = TRUE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = TRUE, TVol = TRUE, T.Stage = FALSE, bGS = FALSE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = FALSE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = TRUE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = FALSE, TVol = FALSE, T.Stage = TRUE, bGS = FALSE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = FALSE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = TRUE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = TRUE, TVol = FALSE, T.Stage = TRUE, bGS = FALSE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = FALSE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = TRUE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = FALSE, TVol = TRUE, T.Stage = TRUE, bGS = FALSE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = FALSE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = TRUE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = TRUE, TVol = TRUE, T.Stage = TRUE, bGS = FALSE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = FALSE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = TRUE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = FALSE, TVol = FALSE, T.Stage = FALSE, bGS = TRUE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = FALSE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = TRUE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = TRUE, TVol = FALSE, T.Stage = FALSE, bGS = TRUE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = FALSE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = TRUE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = FALSE, TVol = TRUE, T.Stage = FALSE, bGS = TRUE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = FALSE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = TRUE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = TRUE, TVol = TRUE, T.Stage = FALSE, bGS = TRUE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = FALSE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = TRUE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = FALSE, TVol = FALSE, T.Stage = TRUE, bGS = TRUE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = FALSE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = TRUE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = TRUE, TVol = FALSE, T.Stage = TRUE, bGS = TRUE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = FALSE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = TRUE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = FALSE, TVol = TRUE, T.Stage = TRUE, bGS = TRUE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = FALSE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = TRUE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = TRUE, TVol = TRUE, T.Stage = TRUE, bGS = TRUE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = FALSE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = TRUE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = FALSE, TVol = FALSE, T.Stage = FALSE, bGS = FALSE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = TRUE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = TRUE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = TRUE, TVol = FALSE, T.Stage = FALSE, bGS = FALSE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = TRUE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = TRUE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = FALSE, TVol = TRUE, T.Stage = FALSE, bGS = FALSE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = TRUE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = TRUE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = TRUE, TVol = TRUE, T.Stage = FALSE, bGS = FALSE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = TRUE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = TRUE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = FALSE, TVol = FALSE, T.Stage = TRUE, bGS = FALSE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = TRUE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = TRUE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = TRUE, TVol = FALSE, T.Stage = TRUE, bGS = FALSE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = TRUE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = TRUE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = FALSE, TVol = TRUE, T.Stage = TRUE, bGS = FALSE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = TRUE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = TRUE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = TRUE, TVol = TRUE, T.Stage = TRUE, bGS = FALSE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = TRUE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = TRUE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = FALSE, TVol = FALSE, T.Stage = FALSE, bGS = TRUE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = TRUE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = TRUE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = TRUE, TVol = FALSE, T.Stage = FALSE, bGS = TRUE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = TRUE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = TRUE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = FALSE, TVol = TRUE, T.Stage = FALSE, bGS = TRUE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = TRUE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = TRUE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = TRUE, TVol = TRUE, T.Stage = FALSE, bGS = TRUE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = TRUE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = TRUE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = FALSE, TVol = FALSE, T.Stage = TRUE, bGS = TRUE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = TRUE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = TRUE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = TRUE, TVol = FALSE, T.Stage = TRUE, bGS = TRUE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = TRUE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = TRUE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = FALSE, TVol = TRUE, T.Stage = TRUE, bGS = TRUE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = TRUE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = TRUE

       RBC.Age.Group
...1    FALSE
  FALSE     0

, , Median.RBC.Age = FALSE, Age = FALSE, AA = FALSE, FamHx = FALSE, PVol = TRUE, TVol = TRUE, T.Stage = TRUE, bGS = TRUE, BN+ = FALSE, OrganConfined = FALSE, PreopPSA = TRUE, PreopTherapy = FALSE, Units = FALSE, sGS = FALSE, AnyAdjTherapy = FALSE, AdjRadTherapy = FALSE, Recurrence = FALSE, Censor = FALSE, TimeToRecurrence = TRUE

       RBC.Age.Group
...1    FALSE
  FALSE     0

Evaluación de normalidad

car::qqPlot(blood_storage$Age, 
            main="Normalidad para la variable edad")

[1] 291  26
#distribucion normal
car::qqPlot(blood_storage$PVol, 
            main="Normalidad para variable PVol")

[1] 250 210
#distribucion fuera de normalidad
car::qqPlot(blood_storage$PreopPSA, 
            main="Niveles de preoperatorios de antigeno prostatico")

[1] 285 287
#distribucion fuera de normalidad
car::qqPlot(blood_storage$TimeToRecurrence, 
            main="Tiempo de remision")

[1] 128  35
#distribucion fuera de normalidad
car::qqPlot(blood_storage$Median.RBC.Age, 
            main="Normalidad para median RBC")

[1] 1 2

Exploracion grafica

variables cualitativas

barplot(table(blood_storage$RBC.Age.Group), 
        col=brewer.pal(n = 3, name = "Accent"), 
        main= "RBC age exposure group")

barplot(table(blood_storage$Median.RBC.Age), 
        col=brewer.pal(n = 3, name = "Accent"), 
        main= "Niveles medios de RBC")

#Error en esta variable cambió todo a NA
boxplot(table(blood_storage$AA), 
        col=brewer.pal(n = 3, name = "Accent"), 
        main= "Race")

barplot(table(blood_storage$FamHx), 
        col=brewer.pal(n = 3, name = "Accent"), 
        main= "Historia familiar")

barplot(table(blood_storage$TVol), 
        col=brewer.pal(n = 3, name = "Accent"), 
        main= "Volumen de tumor")

barplot(table(blood_storage$T.Stage), 
        col=brewer.pal(n = 3, name = "Accent"), 
        main= "Clinical T category")

barplot(table(blood_storage$bGS), 
        col=brewer.pal(n = 3, name = "Accent"), 
        main= "Biopsy Gleason score")

barplot(table(blood_storage$OrganConfined), 
       col=brewer.pal(n = 3, name = "Accent"), 
        main= "Organconfined")

barplot(table(blood_storage$PreopTherapy), 
        col=brewer.pal(n = 3, name = "Accent"), 
        main= "Terapia preoperatoria")

#revisar en conjunto con otra variable
barplot(table(blood_storage$Units), 
        col=brewer.pal(n = 3, name = "Accent"), 
        main= "Unidades")

barplot(table(blood_storage$sGS), 
       col=brewer.pal(n = 3, name = "Accent"), 
        main= "Surgical Gleason score")

barplot(table(blood_storage$AnyAdjTherapy), 
       col=brewer.pal(n = 3, name = "Accent"), 
        main= "Adjuvant Therapy")

barplot(table(blood_storage$AdjRadTherapy), 
        col=brewer.pal(n = 3, name = "Accent"), 
        main= "Adjuvant radiation therapy")

barplot(table(blood_storage$Recurrence), 
        col=brewer.pal(n = 3, name = "Accent"), 
        main= "Recurrence")

barplot(table(blood_storage$Censor), 
        col=brewer.pal(n = 3, name = "Accent"), 
        main= "Censor")

variables cuantitativas

Graficos.Cuanti <-  function(x, y, z){
  print(y)
  par(mfrow = c(1,2))
  boxplot(x, main="Gráfico de boxplot", ylab="", xlab="", col=z)
  hist(x, main="Histograma", ylab="", xlab="", col=z)
  vioplot::vioplot(x, main="Gráfico de violín", ylab="", xlab="", col=z)
}
Graficos.Cuanti(blood_storage$PVol, "Graficos para edad", brewer.pal(n = 3, name = "Accent"))
[1] "Graficos para edad"

Graficos.Cuanti(blood_storage$Age, "Edad de pacientes", brewer.pal(n = 3, name = "Accent"))

[1] "Edad de pacientes"

Graficos.Cuanti(blood_storage$PreopPSA, "PreopPSA", brewer.pal(n = 3, name = "Accent"))

[1] "PreopPSA"

Graficos.Cuanti(blood_storage$TimeToRecurrence, "Tiempo de remición", brewer.pal(n = 3, name = "Accent"))

[1] "Tiempo de remición"

Identificación de relaciones y formulacion de hipotesis

variables cualitativas

mosaicplot(prop.table(table(blood_storage$AA, blood_storage$RBC.Age.Group)), main="Relación de tiempo de almacenamiento y el grupo étnico de las pacientes", col= brewer.pal(n = 3, name = "Accent"))

# grapica separada en 2

table(blood_storage$AA, blood_storage$sGS)|>
  prop.table(2)|>
  barplot(beside = T, ylab = "Proporciones", xlab = "",  col= brewer.pal(n = 3, name = "Accent"),
          legend.text = T)

variables cuantitativas

par(mfrow = c(1,2))
boxplot(blood_storage$TimeToRecurrence~blood_storage$RBC.Age.Group,
        main="Relacion entre tiempo de almacenamiento de RBC y la recurrencia del cancer de prostata", 
        ylab= "Tiempo de recurrencia",
        xlab= "Periodo de almacenamiento",
       col= brewer.pal(n = 3, name = "Accent"))

vioplot::vioplot(blood_storage$TimeToRecurrence~blood_storage$RBC.Age.Group,
        main="Relacion entre tiempo de almacenamiento de RBC y la recurrencia del cancer de prostata", 
        ylab= "Tiempo de recurrencia",
        xlab= "Periodo de almacenamiento",
       col= brewer.pal(n = 3, name = "Accent"))

boxplot(blood_storage$PVol~blood_storage$RBC.Age.Group,
        main="Relacion entre tiempo de almacenamiento de RBC y el volumen de PSA", 
        ylab= "Volumen de PSA",
        xlab= "Periodo de almacenamiento",
        col = c(2:4))
vioplot::vioplot(blood_storage$PVol~blood_storage$RBC.Age.Group,
        main="Relacion entre tiempo de almacenamiento de RBC y el volumen de PSA", 
        ylab= "Volumen de PSA",
        xlab= "Periodo de almacenamiento",
        col = c(2:4))

boxplot(blood_storage$PVol~blood_storage$RBC.Age.Group,
        main="Relacion entre tiempo de almacenamiento de RBC y el volumen de prostata", 
        ylab= "Volumen de prostata",
        xlab= "Periodo de almacenamiento",
        col = c(2:4))
vioplot::vioplot(blood_storage$PVol~blood_storage$RBC.Age.Group,
        main="Relacion entre tiempo de almacenamiento de RBC y el volumen de prostata", 
        ylab= "Volumen de prostata",
        xlab= "Periodo de almacenamiento",
        col = c(2:4))

boxplot(blood_storage$bGS~blood_storage$RBC.Age.Group,
        main="Relacion entre tiempo de almacenamiento de RBC y Gleason score", 
        ylab= "Biopsy Gleason score",
        xlab= "Periodo de almacenamiento",
        col = c(2:4))