Elaboraremos curvas de acumulación con los resultantes que se brindan en EstimateS (http://viceroy.colorado.edu/estimates/)
Para esto deberá tener los resultados que brinda el programa EstimateS.
library("DT") # Crea cuadros interactivos HTML
` ### Cargando multiples de datos
En nuestro caso hemos renombrado cada una de las variables. “S” se refire a la “S(est)”, “sob_inf” a “95% CI Lower Bound” y “sob_sup” a “95% CI Upper Bound”
simple<-read.csv("Base_para R_simple.csv", h=T, sep=";")
datatable(simple)
Recordemos que esta base de datos fue guardada en “csv”.
library(ggplot2)
names(simple) #Verificamos el nombre de las variables.
## [1] "Samples" "S" "sob_inf" "sob_sup"
str(simple)#Verificamos la estrutura de las variables.
## 'data.frame': 22 obs. of 4 variables:
## $ Samples: int 1 2 3 4 5 6 7 8 9 10 ...
## $ S : num 5.64 9.31 11.83 13.65 15.03 ...
## $ sob_inf: num 4.01 7.03 9.32 11.09 12.48 ...
## $ sob_sup: num 7.26 11.58 14.34 16.22 17.58 ...
#Grupo Simple
ggplot(simple, aes(x=Samples, y=S)) +
xlab("Esfuerzo de Muestreo")+ ylab("Sob")+
geom_errorbar(aes(ymin=sob_inf, ymax=sob_sup)) +
geom_line() +
geom_point()
## Warning in plyr::split_indices(scale_id, n): '.Random.seed' is not an
## integer vector but of type 'NULL', so ignored
multiple<-read.csv("Base para R_EstimateMultiple.csv", h=T, sep=";")
datatable(multiple)
library(ggplot2)
ggplot(multiple, aes(x=Samples, y=S, group=Com., col=Com.)) +
geom_line() +
geom_point()+
geom_errorbar(aes(ymin=sob_inf, ymax=sob_sup), width=.2)
library('ggplot2')
names(multiple)
## [1] "Samples" "S" "sob_inf" "sob_sup" "Com." "Habitat"
ggplot( data = multiple,mapping = aes(x=Samples, y=S,
ymin = sob_inf,ymax = sob_sup, colour = Com.,
group = Com.)) + geom_line() + geom_pointrange() +
geom_errorbar(aes(ymin=sob_inf, ymax=sob_sup), width=.2)+
facet_grid(~Com., scales = "free_y")