Phillips, A., Rodrígue, S., Rojas, M.

Universidad Nacional de Costa Rica, Heredia, Costa Rica, Facultad de Ciencias Exactas y Naturales, Escuela de Ciencias Biologicas.

Objetivo General:

Evaluar la distribución poblacional (espacial y temporal) de las especies Orcinus orca, Globicephala macrorhynchus, Kogia breviceps y Peponocephala electra en Isla Guadalupe, México (IGM), Isla Revillagedo, México (IR), Isla del Coco, Costa Rica (IC), Isla Galápagos, Ecuador (IGE).

Objetivos Específicos:

  1. Comparar la abundancia de cada especie según el sitio, la estación y el año para cada sitio de muestreo.
  2. Diferenciar los hábitos de profundidad según el momento del día para cada especie (usando hoja experimento) .
  3. Correlacionar tanto temperatura y abundancia como salinidad y abundancia para conocer el hábitat de las ballenas.

Materiales y Métodos:

Se evaluó por 2 años, la distribución poblacional y de tamaños de las especies en 4 diferentes sitios de monitoreo a 4 islas del Pacífico: Isla Guadalupe, México (IGM), Isla Revillagedo, México (IR), Isla del Coco, Costa Rica (IC), Isla Galápagos, Ecuador (IGE). En cada sitio se realizaron 10 transectos (A-J) de busqueda, de 30 km^2 cada uno.

Se efectuó un experimento, para conocer la presencia de la especie a diferentes profundidades, con marcas acústicas, tanto de día como de noche, se calculó su densidad promedio a diferentes profundidades, según los conteos de las marcas.

Se realizaron regreciones lineales par ver si existe una relación entre las la salinidad y la abundancia de de cada una de las 4 especies(Orcinus orca, Globicephala macrorhynchus, Kogia breviceps y Peponocephala electra). De la misma manera se repitió el procedimiento para analizar la relación entre la temperatura y la abundancia de las mismas especies.Posteriormente se buscó una correlación entre la abundancia deOrcinus orca y Globicephala macrorhynchus, Peponocephala electra y Kogia breviceps, y por último en Orcinus orca y Peponocephala electra con el fin de descubrir si la abundancia de una se relaciona con la abundancia de la otra.

Resultados

library(lmtest)
library(car)
library(ggplot2)
library(PerformanceAnalytics)
library(outliers)
proyecbio<-read.table("Data/BD_Muestreo.txt",header = TRUE, dec = ".", sep ="\t" )

REGRECIÓN LINEAL

Los resultados de los modelos de regreción lineal se obtuvieron utilizando como variables independientes la tempretura y la salinidad y como variable dependiente la abundancia de cada una de las especies. También se analizó en un modelo de regreción lineal la salinidad en función de la temperatura.

ORCtem<-na.omit(proyecbio$Temperatura)[proyecbio$Especies=="ORC_ORC"]
ORCabu<-na.omit(proyecbio$Abundancia)[proyecbio$Especies=="ORC_ORC"]
ORCAbuTem<-data.frame(ORCabu,ORCtem)
ORClmAbuTem<-lm(ORCabu~ORCtem,data=ORCAbuTem)
summary(ORClmAbuTem)
## 
## Call:
## lm(formula = ORCabu ~ ORCtem, data = ORCAbuTem)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -5.8234 -2.6296 -0.3064  2.6979  5.7260 
## 
## Coefficients:
##             Estimate Std. Error t value Pr(>|t|)    
## (Intercept)  8.03437    1.51888   5.290 1.87e-07 ***
## ORCtem      -0.06654    0.06500  -1.024    0.307    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.359 on 478 degrees of freedom
## Multiple R-squared:  0.002187,   Adjusted R-squared:  9.994e-05 
## F-statistic: 1.048 on 1 and 478 DF,  p-value: 0.3065
# (Intercept)  8.03437
# ORCtem      -0.06654 
# R-squared:  0.002187
# p-value: 0.3065
# 
dwtest(lm(ORCabu~ORCtem))#1.99
## 
##  Durbin-Watson test
## 
## data:  lm(ORCabu ~ ORCtem)
## DW = 1.9961, p-value = 0.4655
## alternative hypothesis: true autocorrelation is greater than 0
shapiro.test(ORClmAbuTem$residuals)#p-value = 7.293e-11
## 
##  Shapiro-Wilk normality test
## 
## data:  ORClmAbuTem$residuals
## W = 0.95541, p-value = 7.293e-11
ncvTest(ORClmAbuTem)#p = 0.16132
## Non-constant Variance Score Test 
## Variance formula: ~ fitted.values 
## Chisquare = 1.961848, Df = 1, p = 0.16132
ggplot(ORClmAbuTem, aes(x=ORCtem, y=ORCabu )) +
    geom_point(shape=1) +    
    geom_smooth(method=lm)+
    labs(x="Temperatura", y="Abundancia")
## `geom_smooth()` using formula 'y ~ x'

Figura 1.Modelo lineal de la abundancia de la especie Orcinus orca en función de la temperatura.

GLOtem<-na.omit(proyecbio$Temperatura)[proyecbio$Especies=="GLO_MAC"]
GLOabu<-na.omit(proyecbio$Abundancia)[proyecbio$Especies=="GLO_MAC"]
GLOAbuTem<-data.frame(GLOabu,GLOtem)
GLOlmAbuTem<-lm(GLOabu~GLOtem, data=GLOAbuTem)
summary(GLOlmAbuTem)
## 
## Call:
## lm(formula = GLOabu ~ GLOtem, data = GLOAbuTem)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -4.5700 -2.4829  0.4514  2.4842  4.5457 
## 
## Coefficients:
##             Estimate Std. Error t value Pr(>|t|)    
## (Intercept)  5.82315    1.24857   4.664 4.03e-06 ***
## GLOtem      -0.01406    0.05335  -0.263    0.792    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 2.733 on 478 degrees of freedom
## Multiple R-squared:  0.0001452,  Adjusted R-squared:  -0.001947 
## F-statistic: 0.06942 on 1 and 478 DF,  p-value: 0.7923
#Intercept  5.82315
#GLOtem     -0.01406
#R-squared: 0.0001452
# p-value: 0.7923

dwtest(lm(GLOabu~GLOtem))#DW = 2.0979
## 
##  Durbin-Watson test
## 
## data:  lm(GLOabu ~ GLOtem)
## DW = 2.0979, p-value = 0.8489
## alternative hypothesis: true autocorrelation is greater than 0
shapiro.test(GLOlmAbuTem$residuals)#p-value = 1.491e-11
## 
##  Shapiro-Wilk normality test
## 
## data:  GLOlmAbuTem$residuals
## W = 0.95076, p-value = 1.491e-11
ncvTest(GLOlmAbuTem)# p = 0.84443
## Non-constant Variance Score Test 
## Variance formula: ~ fitted.values 
## Chisquare = 0.0385087, Df = 1, p = 0.84443
ggplot(GLOlmAbuTem, aes(x=GLOabu, y=GLOtem)) +
    geom_point(shape=1) +  
    geom_smooth(method=lm)+
    labs(x="Temperatura", y="Abundancia")
## `geom_smooth()` using formula 'y ~ x'

Figura 2.Modelo lineal de la abundancia de la especie Globicephala macrorhyncus en función de la temperatura

KOGtem<-na.omit(proyecbio$Temperatura)[proyecbio$Especies=="KOG_BRE"]
KOGabu<-na.omit(proyecbio$Abundancia)[proyecbio$Especies=="KOG_BRE"]
KOGAbuTem<-data.frame(KOGabu,KOGtem)
KOGlmAbuTem<-lm(KOGabu~KOGtem,data=KOGAbuTem)
summary(KOGlmAbuTem)
## 
## Call:
## lm(formula = KOGabu ~ KOGtem, data = KOGAbuTem)
## 
## Residuals:
##      Min       1Q   Median       3Q      Max 
## -16.9973  -8.8470  -0.6818   9.0760  17.4721 
## 
## Coefficients:
##             Estimate Std. Error t value Pr(>|t|)    
## (Intercept) 16.51887    4.62515   3.572 0.000391 ***
## KOGtem       0.05675    0.19803   0.287 0.774566    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 10.25 on 478 degrees of freedom
## Multiple R-squared:  0.0001718,  Adjusted R-squared:  -0.00192 
## F-statistic: 0.08212 on 1 and 478 DF,  p-value: 0.7746
#(Intercept) 16.51887
#KOGtem      0.05675
#R-squared: 0.0001718
#p-value: 0.7746

dwtest(lm(KOGabu~KOGtem))#DW = 2.0307
## 
##  Durbin-Watson test
## 
## data:  lm(KOGabu ~ KOGtem)
## DW = 2.0307, p-value = 0.6153
## alternative hypothesis: true autocorrelation is greater than 0
shapiro.test(KOGlmAbuTem$residuals)# p-value = 1.447e-11
## 
##  Shapiro-Wilk normality test
## 
## data:  KOGlmAbuTem$residuals
## W = 0.95067, p-value = 1.447e-11
ncvTest(KOGlmAbuTem)#p = 0.28879
## Non-constant Variance Score Test 
## Variance formula: ~ fitted.values 
## Chisquare = 1.125262, Df = 1, p = 0.28879
ggplot(KOGlmAbuTem, aes(x=KOGtem, y=KOGabu)) +
    geom_point(shape=1) +    # genera circulos en el grafico
    geom_smooth(method=lm)+
    labs(x="Temperatura", y="Abundancia")
## `geom_smooth()` using formula 'y ~ x'

Figura 3.Modemo lineal de la abundancia de la especie Kogia breviceps en función de la temperatura.

PEPtem<-na.omit(proyecbio$Temperatura)[proyecbio$Especies=="PEP_ELE"]
PEPabu<-na.omit(proyecbio$Abundancia)[proyecbio$Especies=="PEP_ELE"]
PEPAbuTem<-data.frame(PEPabu,PEPtem)
PEPlmAbuTem<-lm(PEPabu~PEPtem,data=PEPAbuTem)
summary(PEPlmAbuTem)
## 
## Call:
## lm(formula = PEPabu ~ PEPtem, data = PEPAbuTem)
## 
## Residuals:
##      Min       1Q   Median       3Q      Max 
## -20.4829  -9.7663   0.2352   9.0507  21.1795 
## 
## Coefficients:
##             Estimate Std. Error t value Pr(>|t|)  
## (Intercept)  10.9202     5.0411   2.166   0.0308 *
## PEPtem        0.4030     0.2157   1.869   0.0623 .
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 11.27 on 478 degrees of freedom
## Multiple R-squared:  0.007253,   Adjusted R-squared:  0.005176 
## F-statistic: 3.492 on 1 and 478 DF,  p-value: 0.06226
#(Intercept)  10.9202 
#PEPtem        0.4030 
#R-squared:  0.007253
#p-value: 0.06226

dwtest(lm(PEPabu~PEPtem))#DW = 1.8506
## 
##  Durbin-Watson test
## 
## data:  lm(PEPabu ~ PEPtem)
## DW = 1.8506, p-value = 0.04611
## alternative hypothesis: true autocorrelation is greater than 0
shapiro.test(PEPlmAbuTem$residuals)# p-value=7.844e-10
## 
##  Shapiro-Wilk normality test
## 
## data:  PEPlmAbuTem$residuals
## W = 0.96182, p-value = 7.844e-10
ncvTest(PEPlmAbuTem)#p = 0.54434
## Non-constant Variance Score Test 
## Variance formula: ~ fitted.values 
## Chisquare = 0.3675565, Df = 1, p = 0.54434
ggplot(PEPlmAbuTem, aes(x=PEPtem, y=PEPabu)) +
    geom_point(shape=1) +    # genera circulos en el grafico
    geom_smooth(method=lm)+
    labs(x="Temperatura", y="Abundancia")
## `geom_smooth()` using formula 'y ~ x'

Figura 4.Modelo lineal de la abundancia de la especie Peponocephala electra en función de la temperatura

Las figuras de la 1 a la 4, posees un p-value>0.05 y valore de R2 < 0.007253 por lo que los modelos lineales de abundancia en función de la temperatura no son significativos para las especies Orcinus orca (y= -0.06654x + 8.03437), Globicephala macrorhynchus (y= -0.01406x + 5.82315), Kogia breviceps (y= 0.05675x + 16.51887) y Peponocephala electra (y= 0.4030x+ 10.9202). Lo que se ve fundamentado por el hecho de que son animales que habitan desde los trópicos hasta los subpolos.A execpción de Peponocephala electra la cual, puede llegar a encontrarse en regiones subtropicales de hasta 15°C, demostrando estar capacitados para vivir en diversos rangos de temperatura. (Heckel, Ruiz Mar, Schramm, & Gorter, 2018)

ORCsal<-na.omit(proyecbio$Salinidad)[proyecbio$Especies=="ORC_ORC"]
ORCabu<-na.omit(proyecbio$Abundancia)[proyecbio$Especies=="ORC_ORC"]
ORCAbuSal<-data.frame(ORCabu,ORCsal)
ORClmAbuSal<-lm(ORCabu~ORCsal,data=ORCAbuSal)
summary(ORClmAbuSal)
## 
## Call:
## lm(formula = ORCabu ~ ORCsal, data = ORCAbuSal)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -5.5670 -2.5381 -0.4493  2.5719  5.6030 
## 
## Coefficients:
##             Estimate Std. Error t value Pr(>|t|)
## (Intercept)  8.08095    6.12459   1.319    0.188
## ORCsal      -0.04488    0.17244  -0.260    0.795
## 
## Residual standard error: 3.362 on 478 degrees of freedom
## Multiple R-squared:  0.0001417,  Adjusted R-squared:  -0.00195 
## F-statistic: 0.06773 on 1 and 478 DF,  p-value: 0.7948
#(Intercept)  8.08095
#ORCsal      -0.04488 
#R-squared:  0.0001417
#p-value: 0.7948

dwtest(lm(ORCabu~ORCsal))#DW = 1.9929
## 
##  Durbin-Watson test
## 
## data:  lm(ORCabu ~ ORCsal)
## DW = 1.9929, p-value = 0.4535
## alternative hypothesis: true autocorrelation is greater than 0
shapiro.test(ORClmAbuSal$residuals)#p-value = 8.188e-12
## 
##  Shapiro-Wilk normality test
## 
## data:  ORClmAbuSal$residuals
## W = 0.94893, p-value = 8.188e-12
ncvTest(ORClmAbuSal)#p = 0.24567
## Non-constant Variance Score Test 
## Variance formula: ~ fitted.values 
## Chisquare = 1.347785, Df = 1, p = 0.24567
ggplot(ORClmAbuSal, aes(x=ORCsal, y=ORCabu )) +
    geom_point(shape=1) +    
    geom_smooth(method=lm)+
    labs(x="Salinidad", y="Abundancia")
## `geom_smooth()` using formula 'y ~ x'

Figura 5. Modelo lineal de la abundancia de Orcinus orca en función de la salinidad

GLOsal<-na.omit(proyecbio$Salinidad)[proyecbio$Especies=="GLO_MAC"]
GLOabu<-na.omit(proyecbio$Abundancia)[proyecbio$Especies=="GLO_MAC"]
GLOAbuSal<-data.frame(GLOabu,GLOtem)
GLOlmAbuSal<-lm(GLOabu~GLOsal, data=GLOAbuSal)
summary(GLOlmAbuSal)
## 
## Call:
## lm(formula = GLOabu ~ GLOsal, data = GLOAbuSal)
## 
## Residuals:
##    Min     1Q Median     3Q    Max 
## -4.719 -2.427  0.327  2.397  4.793 
## 
## Coefficients:
##             Estimate Std. Error t value Pr(>|t|)
## (Intercept)   0.2752     4.8296   0.057    0.955
## GLOsal        0.1471     0.1360   1.081    0.280
## 
## Residual standard error: 2.73 on 478 degrees of freedom
## Multiple R-squared:  0.00244,    Adjusted R-squared:  0.0003532 
## F-statistic: 1.169 on 1 and 478 DF,  p-value: 0.2801
#(Intercept)   0.2752
#GLOsal        0.1471
#R-squared:  0.00244
#p-value: 0.2801

dwtest(lm(GLOabu~GLOsal))#DW = 2.0948 
## 
##  Durbin-Watson test
## 
## data:  lm(GLOabu ~ GLOsal)
## DW = 2.0948, p-value = 0.8416
## alternative hypothesis: true autocorrelation is greater than 0
shapiro.test(GLOlmAbuSal$residuals)#p-value = 2.229e-10
## 
##  Shapiro-Wilk normality test
## 
## data:  GLOlmAbuSal$residuals
## W = 0.9585, p-value = 2.229e-10
ncvTest(GLOlmAbuSal)# p = 0.7335 
## Non-constant Variance Score Test 
## Variance formula: ~ fitted.values 
## Chisquare = 0.1159264, Df = 1, p = 0.7335
ggplot(GLOlmAbuSal, aes(x=GLOabu, y=GLOsal)) +
    geom_point(shape=1) +  
    geom_smooth(method=lm)+
    labs(x="Salinidad", y="Abundancia")
## `geom_smooth()` using formula 'y ~ x'

Figura 6. Modelo lineal de la abundancia de Globicephala macrorhyncus en función de la salinidad

KOGsal<-na.omit(proyecbio$Salinidad)[proyecbio$Especies=="KOG_BRE"]
KOGabu<-na.omit(proyecbio$Abundancia)[proyecbio$Especies=="KOG_BRE"]
KOGAbuSal<-data.frame(KOGabu,KOGsal)
KOGlmAbuSal<-lm(KOGabu~KOGsal,data=KOGAbuSal)
summary(KOGlmAbuSal)
## 
## Call:
## lm(formula = KOGabu ~ KOGsal, data = KOGAbuSal)
## 
## Residuals:
##      Min       1Q   Median       3Q      Max 
## -17.1902  -8.6616  -0.6769   8.9540  17.7991 
## 
## Coefficients:
##             Estimate Std. Error t value Pr(>|t|)
## (Intercept)   4.7313    18.3969   0.257    0.797
## KOGsal        0.3691     0.5180   0.713    0.476
## 
## Residual standard error: 10.25 on 478 degrees of freedom
## Multiple R-squared:  0.001061,   Adjusted R-squared:  -0.001028 
## F-statistic: 0.5079 on 1 and 478 DF,  p-value: 0.4764
#(Intercept)   4.7313
#KOGsal        0.3691
#p-value: 0.4764
#R-squared:  0.001061

dwtest(lm(KOGabu~KOGsal))#DW = 2.0291
## 
##  Durbin-Watson test
## 
## data:  lm(KOGabu ~ KOGsal)
## DW = 2.0291, p-value = 0.6099
## alternative hypothesis: true autocorrelation is greater than 0
shapiro.test(KOGlmAbuSal$residuals)# p-value = 2.627e-11
## 
##  Shapiro-Wilk normality test
## 
## data:  KOGlmAbuSal$residuals
## W = 0.95245, p-value = 2.627e-11
ncvTest(KOGlmAbuSal)#p = 0.85059
## Non-constant Variance Score Test 
## Variance formula: ~ fitted.values 
## Chisquare = 0.03548289, Df = 1, p = 0.85059
ggplot(KOGlmAbuTem, aes(x=KOGsal, y=KOGabu)) +
    geom_point(shape=1) + 
    geom_smooth(method=lm)+
    labs(x="Salinidad", y="Abundancia")
## `geom_smooth()` using formula 'y ~ x'

Figura 7. Modelo lineal de la abundancia de Kogia breviceps en función de la salinidad

PEPsal<-na.omit(proyecbio$Salinidad)[proyecbio$Especies=="PEP_ELE"]
PEPabu<-na.omit(proyecbio$Abundancia)[proyecbio$Especies=="PEP_ELE"]
PEPAbuSal<-data.frame(PEPabu,PEPsal)
PEPlmAbuSal<-lm(PEPabu~PEPsal,data=PEPAbuSal)
summary(PEPlmAbuSal)
## 
## Call:
## lm(formula = PEPabu ~ PEPsal, data = PEPAbuSal)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -20.401  -9.766  -0.004   9.427  20.614 
## 
## Coefficients:
##             Estimate Std. Error t value Pr(>|t|)  
## (Intercept)  46.2980    20.0348   2.311   0.0213 *
## PEPsal       -0.7329     0.5644  -1.298   0.1947  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 11.3 on 478 degrees of freedom
## Multiple R-squared:  0.003515,   Adjusted R-squared:  0.00143 
## F-statistic: 1.686 on 1 and 478 DF,  p-value: 0.1947
#(Intercept)  46.2980
#PEPsal       -0.7329 
#R-squared:  0.003515
#p-value: 0.1947

dwtest(lm(PEPabu~PEPsal))#DW = 1.8506
## 
##  Durbin-Watson test
## 
## data:  lm(PEPabu ~ PEPsal)
## DW = 1.8365, p-value = 0.0332
## alternative hypothesis: true autocorrelation is greater than 0
shapiro.test(PEPlmAbuSal$residuals)# p-value=5.009e-10
## 
##  Shapiro-Wilk normality test
## 
## data:  PEPlmAbuSal$residuals
## W = 0.96066, p-value = 5.009e-10
ncvTest(PEPlmAbuSal)#p =p = 0.56726
## Non-constant Variance Score Test 
## Variance formula: ~ fitted.values 
## Chisquare = 0.3272803, Df = 1, p = 0.56726
ggplot(PEPlmAbuSal, aes(x=PEPsal, y=PEPabu)) +
    geom_point(shape=1) +    # genera circulos en el grafico
    geom_smooth(method=lm)+
    labs(x="Salinidad", y="Abundancia")
## `geom_smooth()` using formula 'y ~ x'

Figura 8. Modelo lineal de la abundancia de Peponocephala electra en función de la salinidad.

Las figuras de la 5 a la 8, posees un p-value>0.1 y valores de R2 < 0.003515 por lo que los modelos lineales de la abundancia en función de la salinidad no son significativos para las especies Orcinus orca (y= -0.04488x + 8.08095), Globicephala macrorhynchus (y= 0.1471x + 0.2752), Kogia breviceps (y= 0.3691x+ 4.7313) y Peponocephala electra (y= -0.7329x + 46.2980). Lo que se vwe fundamentado por los hábitos cosmopolitas de las cuatro especies, quienes son encontradas a variables distancias de las costas y variables profundidades sonde los porcentajes de salinidad pueden fácilmente ser distintos unos de otros. (Heckel, Ruiz Mar, Schramm, & Gorter, 2018)

orcatemperat<-na.omit(proyecbio$Temperatura)[proyecbio$Especies=="ORC_ORC"]
orcasali<-na.omit(proyecbio$Salinidad)[proyecbio$Especies=="ORC_ORC"]
comparacion<-data.frame(orcatemperat,orcasali)
temvssali<-lm(orcasali~orcatemperat,data=comparacion)
summary(temvssali)
## 
## Call:
## lm(formula = orcasali ~ orcatemperat, data = comparacion)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -1.5083 -0.4542 -0.1355  0.3719  1.8122 
## 
## Coefficients:
##              Estimate Std. Error t value Pr(>|t|)    
## (Intercept)  41.26345    0.30423  135.63   <2e-16 ***
## orcatemperat -0.24769    0.01302  -19.02   <2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 0.6727 on 478 degrees of freedom
## Multiple R-squared:  0.4309, Adjusted R-squared:  0.4297 
## F-statistic: 361.9 on 1 and 478 DF,  p-value: < 2.2e-16
dwtest(lm(orcasali~orcatemperat))#0.46865
## 
##  Durbin-Watson test
## 
## data:  lm(orcasali ~ orcatemperat)
## DW = 0.46865, p-value < 2.2e-16
## alternative hypothesis: true autocorrelation is greater than 0
shapiro.test(temvssali$residuals)#p-value = 6.123e-08
## 
##  Shapiro-Wilk normality test
## 
## data:  temvssali$residuals
## W = 0.97204, p-value = 6.123e-08
ncvTest(temvssali)#p = 0.020329
## Non-constant Variance Score Test 
## Variance formula: ~ fitted.values 
## Chisquare = 5.383398, Df = 1, p = 0.020329
ggplot(comparacion, aes(x=orcatemperat, y=orcasali)) +
    geom_point(shape=1) +
    geom_smooth(method=lm)+
    labs(x="Temperatura", y="Salinidad")
## `geom_smooth()` using formula 'y ~ x'

Figura 9.Modelo de regreción lineal de la salinidad en función de la temperatura para la especie Orcinus orca

En la prueba de regresión lineal donde se comparó de la salinidad en función de la temperatura, para las 4 especies como resultado se obtuvo que si cumplen con el modelo establecido dado que la pendiente es diferente de cero sin embargo no se cumple ningún supuesto del modelo de regresión lineal, en el caso de Orcinus orca suponiendo que los datos cumplen con los requisitos del modelo de regresión lineal, en promedio cada incremento en una unidad de la temperatura equivale a un deceso del -0.24769 de salinidad La ecuación de la recta es y= 41.26345+ -0.24769X o vista de otra forma Salinidad =41.26345-0.24769*temperatura

CORRELACIÓN

Debido a la aucencia de normalidad en los datos demostrada por la prueba de Shapiro(p<0.05), las pruebas de correlación se llevaron a cabo por el método de Kendall (tau)

CORRELACÓN ENTRE LA ABUNDANCIA DE Orcinus orca y Globicephala macrorhyncus

ORCcor<-proyecbio$Abundancia[proyecbio$Especies=="ORC_ORC"]
GLOcor<-proyecbio$Abundancia[proyecbio$Especies=="GLO_MAC"]

shapiro.test(ORCcor)#p-value = 3.686e-12
## 
##  Shapiro-Wilk normality test
## 
## data:  ORCcor
## W = 0.94642, p-value = 3.686e-12
shapiro.test(GLOcor)# p-value = 5.873e-12
## 
##  Shapiro-Wilk normality test
## 
## data:  GLOcor
## W = 0.94789, p-value = 5.873e-12
cor.test(ORCcor,GLOcor, method = "kendall")
## 
##  Kendall's rank correlation tau
## 
## data:  ORCcor and GLOcor
## z = -1.0321, p-value = 0.302
## alternative hypothesis: true tau is not equal to 0
## sample estimates:
##         tau 
## -0.03438618
#tau -0.03438618
#p-value = 0.302

CORRELACÓN ENTRE LA ABUNDANCIA DE Orcinus orca y Peponocephala electra

ORCcor<-proyecbio$Abundancia[proyecbio$Especies=="ORC_ORC"]
PEPcor<-proyecbio$Abundancia[proyecbio$Especies=="PEP_ELE"]

shapiro.test(PEPcor)#p-value = 1.581e-10
## 
##  Shapiro-Wilk normality test
## 
## data:  PEPcor
## W = 0.95756, p-value = 1.581e-10
cor.test(ORCcor,PEPcor,method = "kendall")
## 
##  Kendall's rank correlation tau
## 
## data:  ORCcor and PEPcor
## z = -1.3881, p-value = 0.1651
## alternative hypothesis: true tau is not equal to 0
## sample estimates:
##         tau 
## -0.04464638
#tau  -0.04464638
#p-value = 0.1651

CCORRELACÓN ENTRE LA ABUNDANCIA DE Peponocephala electra y Kogia breviceps

KOGcor<-proyecbio$Abundancia[proyecbio$Especies=="KOG_BRE"]
PEPcor<-proyecbio$Abundancia[proyecbio$Especies=="PEP_ELE"]

shapiro.test(KOGcor)#p-value = 1.031e-11
## 
##  Shapiro-Wilk normality test
## 
## data:  KOGcor
## W = 0.94964, p-value = 1.031e-11
cor.test(KOGcor,PEPcor, method = "kendall")
## 
##  Kendall's rank correlation tau
## 
## data:  KOGcor and PEPcor
## z = 0.49582, p-value = 0.62
## alternative hypothesis: true tau is not equal to 0
## sample estimates:
##       tau 
## 0.0155537
#tau 0.0155537
#p-value = 0.62
corfinal <- data.frame(ORCcor,GLOcor,KOGcor,PEPcor)
chart.Correlation(corfinal, method = "kendall")

Figura 10. Correlación de la abundancia de las especies Orcinus orca, Globicephala macrorhynchus, Kogia breviceps y Peponocephala electra.

La prueba de correlación entre Orcinus orca y Globicephala macrorhynchus dio como resultado que es una correlación no significativa y negativa débil, esto se debe a la ausencia de casos reportados de la depredación de Globicephala macrorhynchus sin embargo, esta especie puede ser una presa ocasional de Orcinus orca (Olson et al., 2008), lo cual podría explicar porque es una correlación negativa débil. Por otro lado al analizar la correlación entre Orcinus orca y Peponocephala electra esta es negativa débil, por lo que cuando la abundancia de una especie aumenta la otra disminuye de una forma no significativa. Uno de los principales depredadores de Peponocephala electra es Orcinus orca, sin embargo, esto no se ve reflejado de forma significativa por los datos obtenidos en las zonas de muestreo (Bradford, A. L.; et al., 2017). La correlación entre Kogia breviceps y Peponocephala electra es positiva no significativa, esto es debido a que, aunque ambas poseen hábitos alimenticios similares, su distribución espacial es diferente, Peponocephala electra se distribuye en aguas tropicales y subtropicales (Perryman, W.L.; K. Danil, 2018) mientras que Kogia breviceps se encuentra en latitudes tropicales y templadas de todo el mundo (Bloodworth, B.E. & Odell, D.K., 2008).