The next data set was obtained from Asenjo Intitute of neurosurgery. Two states (target) of the brain aneurysms are presented: previously ruputured and previously unruptured, where different simulations were performed on ANSYS software using FSI (fluid-structure interaction) methodology. Several biologics, morphologics and fluidynamics parameters are presented such as age and gender of the people, the Womersley number, the maximun and mean WSS, OSI, RRT and others ones. The next analysis gives different relationships that we can have combining differents parameters.

Lectura del dataset

library(readr)
library("plotly")
## Warning: package 'plotly' was built under R version 3.5.3
## Loading required package: ggplot2
## 
## Attaching package: 'plotly'
## The following object is masked from 'package:ggplot2':
## 
##     last_plot
## The following object is masked from 'package:stats':
## 
##     filter
## The following object is masked from 'package:graphics':
## 
##     layout
dataset <- read_delim("C:/Users/aarandan/Downloads/dataset.csv", 
                      ";", escape_double = FALSE, col_types = cols(estado = col_factor(levels = c()), 
                                                                   genero = col_factor(levels = c())), 
                      trim_ws = TRUE)

To analyze the data, I transform state and gender as factors

dataset$estado <- as.factor(dataset$estado)
dataset$genero <- as.factor(dataset$genero)

The dimmension of the dataset is

dim(dataset)
## [1] 60 34

Statistics and summary of the variables

summary(subset(dataset,select = c("N_womersley", "mh","ar","strain_von_mises","rrt"))[dataset$estado == "ROTO",])
##   N_womersley          mh               ar        strain_von_mises  
##  Min.   :1.404   Min.   : 2.049   Min.   :0.854   Min.   :0.003564  
##  1st Qu.:2.423   1st Qu.: 5.178   1st Qu.:1.294   1st Qu.:0.045179  
##  Median :2.963   Median : 6.942   Median :1.690   Median :0.083676  
##  Mean   :2.871   Mean   : 7.050   Mean   :1.930   Mean   :0.078094  
##  3rd Qu.:3.285   3rd Qu.: 8.188   3rd Qu.:2.303   3rd Qu.:0.104223  
##  Max.   :4.104   Max.   :22.885   Max.   :5.279   Max.   :0.171142  
##       rrt          
##  Min.   :0.002920  
##  1st Qu.:0.003549  
##  Median :0.004924  
##  Mean   :0.006242  
##  3rd Qu.:0.008020  
##  Max.   :0.019494
summary(subset(dataset,select = c("N_womersley", "mh","ar","strain_von_mises","rrt"))[dataset$estado == "NOROTO",])
##   N_womersley          mh               ar        strain_von_mises  
##  Min.   :0.196   Min.   : 1.510   Min.   :0.634   Min.   :0.002251  
##  1st Qu.:2.687   1st Qu.: 3.197   1st Qu.:1.054   1st Qu.:0.012778  
##  Median :3.030   Median : 5.153   Median :1.341   Median :0.022302  
##  Mean   :3.004   Mean   : 5.655   Mean   :1.388   Mean   :0.022748  
##  3rd Qu.:3.362   3rd Qu.: 7.117   3rd Qu.:1.551   3rd Qu.:0.030048  
##  Max.   :3.985   Max.   :21.321   Max.   :3.860   Max.   :0.049397  
##       rrt          
##  Min.   :0.003992  
##  1st Qu.:0.005864  
##  Median :0.008866  
##  Mean   :0.009630  
##  3rd Qu.:0.010123  
##  Max.   :0.046385

ANOVA analysis of the variables

res.aov <- aov(estado_bin ~ edad + N_womersley  +mh +  ar+bf + strain_von_mises + rrt, data = dataset)
summary(res.aov)
##                  Df Sum Sq Mean Sq F value   Pr(>F)    
## edad              1  0.197   0.197   2.033  0.15993    
## N_womersley       1  0.151   0.151   1.561  0.21715    
## mh                1  0.827   0.827   8.535  0.00514 ** 
## ar                1  0.981   0.981  10.117  0.00248 ** 
## bf                1  0.002   0.002   0.024  0.87850    
## strain_von_mises  1  7.227   7.227  74.545 1.29e-11 ***
## rrt               1  0.573   0.573   5.913  0.01851 *  
## Residuals        52  5.041   0.097                     
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

How is the histogram of the age?

## Warning: package 'bindrcpp' was built under R version 3.5.2

Now, we study how the statistics between wss, ar and age is

Same case, we study how the statistics between wss, ar and state is

Many studies mentions that the WSS is correlated with the AR

## The correlation between AR and WSS considering ruptured aneurysms is -0.8822437
## The correlation between AR and WSS considering unruptured aneurysms is -0.7570823

For more information you can see: