rm(list = ls())
exp1=read.csv("escenarios experiment_1-table.csv",skip=6)
names(exp1)
## [1] "X.run.number." "pasosmax"      "angulomax"     "X.step."      
## [5] "restoverde"    "restoalimento" "tiempo"
library(ggplot2)

base=ggplot(data=exp1) 
base + geom_point(aes(x=pasosmax,y=restoalimento))

base + geom_point(aes(x=angulomax,y=restoalimento))

summary(lm(restoalimento~pasosmax+angulomax,data=exp1))
## 
## Call:
## lm(formula = restoalimento ~ pasosmax + angulomax, data = exp1)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -72.785 -12.829  -0.826  12.109  78.174 
## 
## Coefficients:
##               Estimate Std. Error t value Pr(>|t|)    
## (Intercept)  1.008e+02  4.007e-01 251.502   <2e-16 ***
## pasosmax     1.176e-02  2.045e-02   0.575    0.565    
## angulomax   -3.250e-05  1.444e-03  -0.023    0.982    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 18.38 on 15997 degrees of freedom
## Multiple R-squared:  2.07e-05,   Adjusted R-squared:  -0.0001043 
## F-statistic: 0.1656 on 2 and 15997 DF,  p-value: 0.8474