Notes from Kelsea:

- behavioral measures from the EZM (DV) are altered by my PNN/PV measures (IV) and modulated by Rearing and/or Housing.

- centered all of my PNN/PV measures around the means to solve any potential problems with multicolinearity.

- splitting the analyses by Sex because all of the literature warns me against running regressions with 4 IVs lol.

- run an interaction analysis (so I can actually say whether MS and/or SI changed the relationship between PNN/PV count/intensity and behavioral outcomes), so I created interaction terms by multiplying each of my PNN/PV measures by my categorical Rearing and Housing variables. I have interaction terms for PNN/PV measure X Rearing X Housing (three-way), PNN/PV measure X Rearing (two-way), and PNN/PV measure X Housing (two-way).

Loop Notes:

- run the regressions with every behavioral measure (5) with every PNN/PV measure (7 each for PL and IL)

- Algorithm: [behavioral measure] ~ [centered PNN/PV measure] + Rearing + Housing + [centered PNN/PV measure]:Rearing + [centered PNN/PV measure]:Housing + [centered PNN/PV measure]:Rearing:Housing separately for males and females

- a regression for each behavioral measure (time open, frequency to open, crossings, head pokes, and head poke duration) with each centered PNN/PV measure - the ones ending in "_c" - (PV count, PV intensity, PNN count, PNN intensity, PNN positive PV count, PNN positive PV intensity, PV positive PNN intensity) in the PL and IL ## - 140 regressions (5 behavior measure, 7 PNN/PV measures, 2 regions, 2 sexes)

Loading library, saving dataset, exploring data

# Loading library
library(foreign)
library(jtools)
## Warning: package 'jtools' was built under R version 4.0.2
library(interactions)
## Warning: package 'interactions' was built under R version 4.0.2
library(leaps)
## Warning: package 'leaps' was built under R version 4.0.2
library(dplyr)
## 
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
## 
##     filter, lag
## The following objects are masked from 'package:base':
## 
##     intersect, setdiff, setequal, union
# Saving SPSS file from my local computer (please update this address depending on where you save this file)
dataset <- read.spss(file = "/Users/alissavalentine/EZM_PNN_Regressions_min.sav", to.data.frame=TRUE)
# Reformating as a tibble
dataset <- as_tibble(dataset)
# checking out data values
summary(dataset)
##     Subject      Rearing  Housing     Sex       time_open        freq_open    
##  Min.   :70.01   Con:43   PH:40   Male  :43   Min.   :  0.00   Min.   : 0.00  
##  1st Qu.:70.22   MS :40   SI:43   Female:40   1st Qu.: 20.28   1st Qu.: 2.00  
##  Median :70.48                                Median : 42.46   Median : 4.00  
##  Mean   :70.48                                Mean   : 42.17   Mean   : 5.06  
##  3rd Qu.:70.72                                3rd Qu.: 63.88   3rd Qu.: 8.00  
##  Max.   :70.95                                Max.   :111.40   Max.   :16.00  
##    crossings        head_pokes    head_poke_duration PV_count_PL_c      
##  Min.   : 0.000   Min.   : 3.00   Min.   :  4.216    Min.   :-34.77209  
##  1st Qu.: 0.000   1st Qu.:10.00   1st Qu.: 50.839    1st Qu.: -7.06375  
##  Median : 2.000   Median :12.00   Median : 72.807    Median :  0.06124  
##  Mean   : 3.711   Mean   :12.52   Mean   : 74.927    Mean   :  0.00000  
##  3rd Qu.: 6.500   3rd Qu.:15.00   3rd Qu.: 94.308    3rd Qu.:  5.43625  
##  Max.   :16.976   Max.   :25.00   Max.   :184.694    Max.   : 31.31124  
##  PV_intensity_PL_c  PNN_count_PL_c     PNN_intensity_PL_c 
##  Min.   :-1.07087   Min.   :-15.9488   Min.   :-0.961380  
##  1st Qu.:-0.33852   1st Qu.: -5.9071   1st Qu.:-0.344334  
##  Median :-0.04075   Median : -0.6155   Median :-0.003504  
##  Mean   : 0.00000   Mean   :  0.0000   Mean   : 0.000000  
##  3rd Qu.: 0.31348   3rd Qu.:  5.1762   3rd Qu.: 0.300937  
##  Max.   : 1.74268   Max.   : 31.8845   Max.   : 1.460846  
##  PNN_pos_PV_count_PL_c PNN_pos_PV_intensity_PL_c PV_pos_PNN_intensity_PL_c
##  Min.   :-13.0575      Min.   :-1.53321          Min.   :-1.04919         
##  1st Qu.: -3.6825      1st Qu.:-0.49589          1st Qu.:-0.37096         
##  Median :  0.3592      Median :-0.04358          Median : 0.02485         
##  Mean   :  0.0000      Mean   : 0.00000          Mean   : 0.00000         
##  3rd Qu.:  3.6092      3rd Qu.: 0.43310          3rd Qu.: 0.30640         
##  Max.   : 13.2758      Max.   : 2.00368          Max.   : 1.58747         
##  PV_count_IL_c     PV_intensity_IL_c  PNN_count_IL_c    PNN_intensity_IL_c
##  Min.   :-25.619   Min.   :-0.67955   Min.   :-22.522   Min.   :-0.73263  
##  1st Qu.: -6.369   1st Qu.:-0.27013   1st Qu.: -4.938   1st Qu.:-0.25804  
##  Median : -1.119   Median :-0.08014   Median :  0.145   Median :-0.03373  
##  Mean   :  0.000   Mean   : 0.00000   Mean   :  0.000   Mean   : 0.00000  
##  3rd Qu.:  7.048   3rd Qu.: 0.22443   3rd Qu.:  6.562   3rd Qu.: 0.20849  
##  Max.   : 27.214   Max.   : 1.30479   Max.   : 30.478   Max.   : 1.16110  
##  PNN_pos_PV_count_IL_c PNN_pos_PV_intensity_IL_c PV_pos_PNN_intensity_IL_c
##  Min.   :-11.6755      Min.   :-0.9345           Min.   :-1.004613        
##  1st Qu.: -2.5922      1st Qu.:-0.3334           1st Qu.:-0.352438        
##  Median :  0.8245      Median :-0.1236           Median :-0.008913        
##  Mean   :  0.0000      Mean   : 0.0000           Mean   : 0.000000        
##  3rd Qu.:  3.9078      3rd Qu.: 0.2363           3rd Qu.: 0.338553        
##  Max.   : 10.1578      Max.   : 1.3111           Max.   : 1.415270

Creating Male and Female datasets

# Creating data set for males
dataset_males <- dataset %>%
  filter(dataset$'Sex' == "Male")
# Creating data set for females
dataset_females <- dataset %>%
  filter(dataset$'Sex' == "Female")

Creating/Running Trial Multiple Regression Algorithm for Interaction Terms with Male Data

Two graphs included that show differences in housing and rearing

# Creating male linear model for DV = time open; IV = PV_count_c; interaction terms: Housing, Rearing
maleslm_timeopen_PVcountPLc <- lm(time_open ~ PV_count_PL_c + Rearing + Housing + Rearing:Housing:PV_count_PL_c + PV_count_PL_c:Rearing + PV_count_PL_c:Housing, data = dataset_males)
# summary of linear model
summary(maleslm_timeopen_PVcountPLc)
## 
## Call:
## lm(formula = time_open ~ PV_count_PL_c + Rearing + Housing + 
##     Rearing:Housing:PV_count_PL_c + PV_count_PL_c:Rearing + PV_count_PL_c:Housing, 
##     data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -42.430 -18.464   2.095  14.378  51.721 
## 
## Coefficients:
##                                   Estimate Std. Error t value Pr(>|t|)   
## (Intercept)                       27.02373    7.83211   3.450  0.00145 **
## PV_count_PL_c                      0.09044    1.02130   0.089  0.92993   
## RearingMS                          7.14510    8.40628   0.850  0.40096   
## HousingSI                         16.60989    8.48236   1.958  0.05799 . 
## PV_count_PL_c:RearingMS            0.19929    1.45124   0.137  0.89154   
## PV_count_PL_c:HousingSI           -0.80013    1.27246  -0.629  0.53344   
## PV_count_PL_c:RearingMS:HousingSI -0.59539    1.77444  -0.336  0.73917   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 25.73 on 36 degrees of freedom
## Multiple R-squared:  0.2142, Adjusted R-squared:  0.08326 
## F-statistic: 1.636 on 6 and 36 DF,  p-value: 0.1657
# running anova on the model
anova(maleslm_timeopen_PVcountPLc)
# A pretty display of stats
summ(maleslm_timeopen_PVcountPLc)
## MODEL INFO:
## Observations: 43
## Dependent Variable: time_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.64, p = 0.17
## R² = 0.21
## Adj. R² = 0.08 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------
##                                            Est.   S.E.   t val.      p
## --------------------------------------- ------- ------ -------- ------
## (Intercept)                               27.02   7.83     3.45   0.00
## PV_count_PL_c                              0.09   1.02     0.09   0.93
## RearingMS                                  7.15   8.41     0.85   0.40
## HousingSI                                 16.61   8.48     1.96   0.06
## PV_count_PL_c:RearingMS                    0.20   1.45     0.14   0.89
## PV_count_PL_c:HousingSI                   -0.80   1.27    -0.63   0.53
## PV_count_PL_c:RearingMS:HousingSI         -0.60   1.77    -0.34   0.74
## ----------------------------------------------------------------------
# Plotting interaction with original scatter plot points, lines based off Rearing condition, and confidence bands with 95%
interact_plot(maleslm_timeopen_PVcountPLc, pred = PV_count_PL_c, modx = Rearing, mod2 = Housing, plot.points = TRUE, interval = TRUE, int.width = 0.95)

# Plotting the regression analysis
plot(maleslm_timeopen_PVcountPLc)

Creating/Running Trial Multiple Regression Algorithm for Interaction Terms with Female Data

Two graphs included that show differences in housing and rearing

# Creating female linear model for DV = time open; IV = PV_count_c; interaction terms: Housing, Rearing
femaleslm_timeopen_PVcountPLc <- lm(time_open ~ PV_count_PL_c + Rearing + Housing + Rearing:Housing:PV_count_PL_c + PV_count_PL_c:Rearing + PV_count_PL_c:Housing, data = dataset_females)
# summary of linear model
summary(femaleslm_timeopen_PVcountPLc)
## 
## Call:
## lm(formula = time_open ~ PV_count_PL_c + Rearing + Housing + 
##     Rearing:Housing:PV_count_PL_c + PV_count_PL_c:Rearing + PV_count_PL_c:Housing, 
##     data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -53.379 -13.063  -1.834  16.720  55.927 
## 
## Coefficients:
##                                   Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                       43.04566    8.69481   4.951 2.13e-05 ***
## PV_count_PL_c                      1.19534    1.22846   0.973    0.338    
## RearingMS                         -7.97890   10.34659  -0.771    0.446    
## HousingSI                          9.12843   10.35916   0.881    0.385    
## PV_count_PL_c:RearingMS            0.13423    1.51228   0.089    0.930    
## PV_count_PL_c:HousingSI           -1.07901    1.42652  -0.756    0.455    
## PV_count_PL_c:RearingMS:HousingSI  0.00247    1.92256   0.001    0.999    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 29.89 on 33 degrees of freedom
## Multiple R-squared:  0.126,  Adjusted R-squared:  -0.03291 
## F-statistic: 0.7929 on 6 and 33 DF,  p-value: 0.5821
# running anova on the model
anova(femaleslm_timeopen_PVcountPLc)
# A pretty display of stats
summ(femaleslm_timeopen_PVcountPLc)
## MODEL INFO:
## Observations: 40
## Dependent Variable: time_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 0.79, p = 0.58
## R² = 0.13
## Adj. R² = -0.03 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------
##                                            Est.    S.E.   t val.      p
## --------------------------------------- ------- ------- -------- ------
## (Intercept)                               43.05    8.69     4.95   0.00
## PV_count_PL_c                              1.20    1.23     0.97   0.34
## RearingMS                                 -7.98   10.35    -0.77   0.45
## HousingSI                                  9.13   10.36     0.88   0.38
## PV_count_PL_c:RearingMS                    0.13    1.51     0.09   0.93
## PV_count_PL_c:HousingSI                   -1.08    1.43    -0.76   0.45
## PV_count_PL_c:RearingMS:HousingSI          0.00    1.92     0.00   1.00
## -----------------------------------------------------------------------
# Plotting interaction with original scatter plot points, lines based off Rearing condition, and confidence bands with 95%
interact_plot(femaleslm_timeopen_PVcountPLc, pred = PV_count_PL_c, modx = Rearing, mod2 = Housing, plot.points = TRUE, interval = TRUE, int.width = 0.95)

# Plotting the regression analysis
plot(femaleslm_timeopen_PVcountPLc)

Preparing Variables for Running Multiple Regression

Creating new variables that hold the names of behavior and PNN/PV variables

# Saving column names for the behavior variables into 'behavior' list
behavior <- colnames(dataset_females[5:9])
# Saving column names for the PNN/PV variables into 'PNNPV' list
PNNPV <- colnames(dataset_females[10:23])

Running the Female Multiple Regression

# Female multiple regression loop using the following equation:
# linear model = *behavior measure*  ~  *PNN/PV measure* + Rearing + Housing + Rearing:Housing:*PNN/PV measure* + *PNN/PV measure*:Rearing + *PNN/PV measure*:Housing"

# This loop iterates through each behaviorial measure, running a mulitple linear regression with behavioral variable as DV, and each PNN/PV variable as the IV being iterated through the regression for each behavior variable (i.e. 5 behaviors x 14 PNN/PV variables = 70 regressions)
for (i in 1:length(behavior)){ # iterate through each behavior
  b <- behavior[i] # saving behavior variable name as 'b' for each iteration
  assign((paste("femalelm", b, sep = "_")), lapply(PNNPV, function(x){
    lm(as.formula(paste(b," ~ ", x," + Rearing + Housing + Rearing:Housing:", x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)})) # assigning the results from the multiple linear regression (where PNN/PV variables are iterating) to a list named 'femalelm' + name of behavioral measure
}

Running the Male Multiple Regression

# Male multiple regression loop using the following equation:
# linear model = *behavior measure*  ~  *PNN/PV measure* + Rearing + Housing + Rearing:Housing:*PNN/PV measure* + *PNN/PV measure*:Rearing + *PNN/PV measure*:Housing"

# This loop iterates through each behaviorial measure, running a mulitple linear regression with behavioral variable as DV, and each PNN/PV variable as the IV being iterated through the regression for each behavior variable (i.e. 5 behaviors x 14 PNN/PV variables = 70 regressions)
for (i in 1:length(behavior)){ # iterate through each behavior
  b <- behavior[i] # saving behavior variable name as 'b' for each iteration
  assign((paste("malelm", b, sep = "_")), lapply(PNNPV, function(x){
    lm(as.formula(paste(b," ~ ", x," + Rearing + Housing + Rearing:Housing:", x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)})) # assigning the results from the multiple linear regression (where PNN/PV variables are iterating) to a list named 'malelm' + name of behavioral measure
}

Accessing One Linear Model at a Time

Key to female/male linear model lists:

[[1]] - PV_count_PL_c

[[2]] - PV_intensity_PL_c

[[3]] - PNN_count_PL_c

[[4]] - PNN_intensity_PL_c

[[5]] - PNN_pos_PV_count_PL_c

[[6]] - PNN_pos_PV_intensity_PL_c

[[7]] - PV_pos_PNN_intensity_PL_c

[[8]] - PV_count_IL_c

[[9]] - PV_intensity_IL_c

[[10]] - PNN_count_IL_c

[[11]] - PNN_intensity_IL_c

[[12]] - PNN_pos_PV_count_IL_c

[[13]] - PNN_pos_PV_intensity_IL_c

[[14]] - PV_pos_PNN_intensity_IL_c

Example: How to access one linear model

Using Female, Head Pokes, PV_pos_PNN_intensity_PL_c data below for example

# This is returning the stats on DV: PV_pos_PNN_intensity_PL_c
# Use key above to identify which variable you want to look at and replace '7' with that number (that will select the correct data frame from the list that holds the data you want)
summary(femalelm_head_pokes[[7]]) 
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -7.8018 -2.0303 -0.0975  2.8142  8.8290 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                     13.607      1.322  10.290
## PV_pos_PNN_intensity_PL_c                       -2.710      3.377  -0.802
## RearingMS                                       -0.150      1.614  -0.093
## HousingSI                                       -2.408      1.573  -1.532
## PV_pos_PNN_intensity_PL_c:RearingMS              3.306      4.014   0.824
## PV_pos_PNN_intensity_PL_c:HousingSI              2.303      4.184   0.551
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI   -9.652      6.677  -1.446
##                                               Pr(>|t|)    
## (Intercept)                                   7.88e-12 ***
## PV_pos_PNN_intensity_PL_c                        0.428    
## RearingMS                                        0.927    
## HousingSI                                        0.135    
## PV_pos_PNN_intensity_PL_c:RearingMS              0.416    
## PV_pos_PNN_intensity_PL_c:HousingSI              0.586    
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI    0.158    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 4.106 on 33 degrees of freedom
## Multiple R-squared:   0.14,  Adjusted R-squared:  -0.01633 
## F-statistic: 0.8956 on 6 and 33 DF,  p-value: 0.5096
summ(femalelm_head_pokes[[7]])
## MODEL INFO:
## Observations: 40
## Dependent Variable: head_pokes
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 0.90, p = 0.51
## R² = 0.14
## Adj. R² = -0.02 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------------------
##                                                        Est.   S.E.   t val.      p
## --------------------------------------------------- ------- ------ -------- ------
## (Intercept)                                           13.61   1.32    10.29   0.00
## PV_pos_PNN_intensity_PL_c                             -2.71   3.38    -0.80   0.43
## RearingMS                                             -0.15   1.61    -0.09   0.93
## HousingSI                                             -2.41   1.57    -1.53   0.14
## PV_pos_PNN_intensity_PL_c:RearingMS                    3.31   4.01     0.82   0.42
## PV_pos_PNN_intensity_PL_c:HousingSI                    2.30   4.18     0.55   0.59
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI         -9.65   6.68    -1.45   0.16
## ----------------------------------------------------------------------------------
anova(femalelm_head_pokes[[7]])
plot(femalelm_head_pokes[[7]])

Statistics for Female Subjects

Female - Crossings

# Returning summary, summ, and anova stats for every linear model in the femalelm_crossings list
lapply(femalelm_crossings, function(x){
    print(summary(x))
    print(summ(x))
    print(anova(x))
    print(plot(x))
})
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -6.7345 -2.0891 -0.3739  2.4823  7.1868 
## 
## Coefficients:
##                                   Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                        3.78348    0.98812   3.829 0.000545 ***
## PV_count_PL_c                     -0.03476    0.13961  -0.249 0.804909    
## RearingMS                         -2.43856    1.17583  -2.074 0.045966 *  
## HousingSI                          2.32954    1.17726   1.979 0.056236 .  
## PV_count_PL_c:RearingMS            0.10550    0.17186   0.614 0.543532    
## PV_count_PL_c:HousingSI            0.20927    0.16212   1.291 0.205717    
## PV_count_PL_c:RearingMS:HousingSI -0.24175    0.21849  -1.106 0.276531    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.397 on 33 degrees of freedom
## Multiple R-squared:  0.3725, Adjusted R-squared:  0.2584 
## F-statistic: 3.265 on 6 and 33 DF,  p-value: 0.01244
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: crossings
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 3.26, p = 0.01
## R² = 0.37
## Adj. R² = 0.26 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------
##                                            Est.   S.E.   t val.      p
## --------------------------------------- ------- ------ -------- ------
## (Intercept)                                3.78   0.99     3.83   0.00
## PV_count_PL_c                             -0.03   0.14    -0.25   0.80
## RearingMS                                 -2.44   1.18    -2.07   0.05
## HousingSI                                  2.33   1.18     1.98   0.06
## PV_count_PL_c:RearingMS                    0.11   0.17     0.61   0.54
## PV_count_PL_c:HousingSI                    0.21   0.16     1.29   0.21
## PV_count_PL_c:RearingMS:HousingSI         -0.24   0.22    -1.11   0.28
## ----------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: crossings
##                               Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_count_PL_c                  1  61.48  61.476  5.3281 0.02739 *
## Rearing                        1  56.34  56.341  4.8830 0.03417 *
## Housing                        1  85.03  85.029  7.3695 0.01047 *
## PV_count_PL_c:Rearing          1   3.58   3.580  0.3103 0.58126  
## PV_count_PL_c:Housing          1   5.47   5.467  0.4738 0.49604  
## PV_count_PL_c:Rearing:Housing  1  14.13  14.125  1.2242 0.27653  
## Residuals                     33 380.76  11.538                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

## NULL
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -5.1691 -2.5525 -0.2538  2.3500  7.7617 
## 
## Coefficients:
##                                       Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                             4.1715     0.9966   4.186 0.000198 ***
## PV_intensity_PL_c                       0.5674     3.2391   0.175 0.862011    
## RearingMS                              -3.2004     1.1865  -2.697 0.010923 *  
## HousingSI                               2.9261     1.1813   2.477 0.018540 *  
## PV_intensity_PL_c:RearingMS            -0.9786     3.7546  -0.261 0.795999    
## PV_intensity_PL_c:HousingSI            -3.3363     4.1101  -0.812 0.422764    
## PV_intensity_PL_c:RearingMS:HousingSI   3.9552     5.4022   0.732 0.469247    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.574 on 33 degrees of freedom
## Multiple R-squared:  0.3052, Adjusted R-squared:  0.1788 
## F-statistic: 2.415 on 6 and 33 DF,  p-value: 0.04794
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: crossings
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 2.42, p = 0.05
## R² = 0.31
## Adj. R² = 0.18 
## 
## Standard errors: OLS
## --------------------------------------------------------------------------
##                                                Est.   S.E.   t val.      p
## ------------------------------------------- ------- ------ -------- ------
## (Intercept)                                    4.17   1.00     4.19   0.00
## PV_intensity_PL_c                              0.57   3.24     0.18   0.86
## RearingMS                                     -3.20   1.19    -2.70   0.01
## HousingSI                                      2.93   1.18     2.48   0.02
## PV_intensity_PL_c:RearingMS                   -0.98   3.75    -0.26   0.80
## PV_intensity_PL_c:HousingSI                   -3.34   4.11    -0.81   0.42
## PV_intensity_PL_c:RearingMS:HousingSI          3.96   5.40     0.73   0.47
## --------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: crossings
##                                   Df Sum Sq Mean Sq F value   Pr(>F)   
## PV_intensity_PL_c                  1   1.99   1.994  0.1560 0.695368   
## Rearing                            1  97.90  97.901  7.6628 0.009173 **
## Housing                            1  73.32  73.319  5.7388 0.022425 * 
## PV_intensity_PL_c:Rearing          1   3.15   3.154  0.2469 0.622588   
## PV_intensity_PL_c:Housing          1   1.94   1.945  0.1522 0.698931   
## PV_intensity_PL_c:Rearing:Housing  1   6.85   6.849  0.5360 0.469247   
## Residuals                         33 421.61  12.776                    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

## NULL
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -7.4812 -1.7023 -0.1948  1.9039  7.5753 
## 
## Coefficients:
##                                    Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                         3.68548    1.00708   3.660 0.000874 ***
## PNN_count_PL_c                     -0.03931    0.15628  -0.252 0.802950    
## RearingMS                          -2.36322    1.23001  -1.921 0.063368 .  
## HousingSI                           3.24739    1.21238   2.679 0.011438 *  
## PNN_count_PL_c:RearingMS            0.21878    0.23258   0.941 0.353717    
## PNN_count_PL_c:HousingSI            0.21903    0.20340   1.077 0.289359    
## PNN_count_PL_c:RearingMS:HousingSI -0.16081    0.34267  -0.469 0.641957    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.397 on 33 degrees of freedom
## Multiple R-squared:  0.3722, Adjusted R-squared:  0.2581 
## F-statistic: 3.261 on 6 and 33 DF,  p-value: 0.01251
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: crossings
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 3.26, p = 0.01
## R² = 0.37
## Adj. R² = 0.26 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------
##                                             Est.   S.E.   t val.      p
## ---------------------------------------- ------- ------ -------- ------
## (Intercept)                                 3.69   1.01     3.66   0.00
## PNN_count_PL_c                             -0.04   0.16    -0.25   0.80
## RearingMS                                  -2.36   1.23    -1.92   0.06
## HousingSI                                   3.25   1.21     2.68   0.01
## PNN_count_PL_c:RearingMS                    0.22   0.23     0.94   0.35
## PNN_count_PL_c:HousingSI                    0.22   0.20     1.08   0.29
## PNN_count_PL_c:RearingMS:HousingSI         -0.16   0.34    -0.47   0.64
## -----------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: crossings
##                                Df Sum Sq Mean Sq F value   Pr(>F)   
## PNN_count_PL_c                  1  40.48  40.478  3.5068 0.070000 . 
## Rearing                         1  66.19  66.190  5.7343 0.022473 * 
## Housing                         1  97.58  97.583  8.4540 0.006466 **
## PNN_count_PL_c:Rearing          1   7.32   7.320  0.6342 0.431526   
## PNN_count_PL_c:Housing          1  11.75  11.748  1.0178 0.320389   
## PNN_count_PL_c:Rearing:Housing  1   2.54   2.542  0.2202 0.641957   
## Residuals                      33 380.91  11.543                    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

## NULL
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -5.3586 -1.7342 -0.5229  2.1876  7.1725 
## 
## Coefficients:
##                                        Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                               3.901      1.075   3.629 0.000952 ***
## PNN_intensity_PL_c                       -2.321      3.237  -0.717 0.478496    
## RearingMS                                -2.398      1.351  -1.774 0.085209 .  
## HousingSI                                 2.624      1.313   1.999 0.053933 .  
## PNN_intensity_PL_c:RearingMS              2.900      3.785   0.766 0.449139    
## PNN_intensity_PL_c:HousingSI              7.375      3.976   1.855 0.072583 .  
## PNN_intensity_PL_c:RearingMS:HousingSI   -5.233      6.504  -0.805 0.426788    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.336 on 33 degrees of freedom
## Multiple R-squared:  0.3948, Adjusted R-squared:  0.2847 
## F-statistic: 3.588 on 6 and 33 DF,  p-value: 0.007568
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: crossings
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 3.59, p = 0.01
## R² = 0.39
## Adj. R² = 0.28 
## 
## Standard errors: OLS
## ---------------------------------------------------------------------------
##                                                 Est.   S.E.   t val.      p
## -------------------------------------------- ------- ------ -------- ------
## (Intercept)                                     3.90   1.07     3.63   0.00
## PNN_intensity_PL_c                             -2.32   3.24    -0.72   0.48
## RearingMS                                      -2.40   1.35    -1.77   0.09
## HousingSI                                       2.62   1.31     2.00   0.05
## PNN_intensity_PL_c:RearingMS                    2.90   3.79     0.77   0.45
## PNN_intensity_PL_c:HousingSI                    7.38   3.98     1.85   0.07
## PNN_intensity_PL_c:RearingMS:HousingSI         -5.23   6.50    -0.80   0.43
## ---------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: crossings
##                                    Df Sum Sq Mean Sq F value  Pr(>F)   
## PNN_intensity_PL_c                  1  18.86  18.859  1.6947 0.20200   
## Rearing                             1  78.01  78.007  7.0097 0.01233 * 
## Housing                             1  97.82  97.817  8.7898 0.00559 **
## PNN_intensity_PL_c:Rearing          1   1.23   1.227  0.1103 0.74190   
## PNN_intensity_PL_c:Housing          1  36.42  36.424  3.2731 0.07954 . 
## PNN_intensity_PL_c:Rearing:Housing  1   7.20   7.205  0.6474 0.42679   
## Residuals                          33 367.24  11.128                   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

## NULL
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -7.0428 -2.0126 -0.4087  2.4117  7.4525 
## 
## Coefficients:
##                                           Estimate Std. Error t value Pr(>|t|)
## (Intercept)                                3.72555    1.03759   3.591  0.00106
## PNN_pos_PV_count_PL_c                     -0.04009    0.25866  -0.155  0.87778
## RearingMS                                 -2.50802    1.26242  -1.987  0.05531
## HousingSI                                  2.79007    1.25448   2.224  0.03310
## PNN_pos_PV_count_PL_c:RearingMS            0.19140    0.31508   0.607  0.54770
## PNN_pos_PV_count_PL_c:HousingSI            0.33697    0.32072   1.051  0.30104
## PNN_pos_PV_count_PL_c:RearingMS:HousingSI -0.34748    0.44918  -0.774  0.44468
##                                             
## (Intercept)                               **
## PNN_pos_PV_count_PL_c                       
## RearingMS                                 . 
## HousingSI                                 * 
## PNN_pos_PV_count_PL_c:RearingMS             
## PNN_pos_PV_count_PL_c:HousingSI             
## PNN_pos_PV_count_PL_c:RearingMS:HousingSI   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.451 on 33 degrees of freedom
## Multiple R-squared:  0.3522, Adjusted R-squared:  0.2344 
## F-statistic:  2.99 on 6 and 33 DF,  p-value: 0.01915
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: crossings
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 2.99, p = 0.02
## R² = 0.35
## Adj. R² = 0.23 
## 
## Standard errors: OLS
## ------------------------------------------------------------------------------
##                                                    Est.   S.E.   t val.      p
## ----------------------------------------------- ------- ------ -------- ------
## (Intercept)                                        3.73   1.04     3.59   0.00
## PNN_pos_PV_count_PL_c                             -0.04   0.26    -0.15   0.88
## RearingMS                                         -2.51   1.26    -1.99   0.06
## HousingSI                                          2.79   1.25     2.22   0.03
## PNN_pos_PV_count_PL_c:RearingMS                    0.19   0.32     0.61   0.55
## PNN_pos_PV_count_PL_c:HousingSI                    0.34   0.32     1.05   0.30
## PNN_pos_PV_count_PL_c:RearingMS:HousingSI         -0.35   0.45    -0.77   0.44
## ------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: crossings
##                                       Df Sum Sq Mean Sq F value   Pr(>F)   
## PNN_pos_PV_count_PL_c                  1  38.65  38.654  3.2450 0.080784 . 
## Rearing                                1  65.85  65.853  5.5284 0.024834 * 
## Housing                                1  95.98  95.980  8.0576 0.007695 **
## PNN_pos_PV_count_PL_c:Rearing          1   0.04   0.037  0.0031 0.955618   
## PNN_pos_PV_count_PL_c:Housing          1   6.04   6.035  0.5067 0.481581   
## PNN_pos_PV_count_PL_c:Rearing:Housing  1   7.13   7.129  0.5984 0.444679   
## Residuals                             33 393.09  11.912                    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

## NULL
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -4.9579 -2.6642 -0.3638  2.3023  7.8654 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                     4.0084     1.0199   3.930
## PNN_pos_PV_intensity_PL_c                      -0.8377     2.8042  -0.299
## RearingMS                                      -2.9564     1.2080  -2.447
## HousingSI                                       3.0578     1.2006   2.547
## PNN_pos_PV_intensity_PL_c:RearingMS             0.4353     3.3163   0.131
## PNN_pos_PV_intensity_PL_c:HousingSI            -0.8308     3.3203  -0.250
## PNN_pos_PV_intensity_PL_c:RearingMS:HousingSI   2.2798     4.3905   0.519
##                                               Pr(>|t|)    
## (Intercept)                                    0.00041 ***
## PNN_pos_PV_intensity_PL_c                      0.76701    
## RearingMS                                      0.01988 *  
## HousingSI                                      0.01572 *  
## PNN_pos_PV_intensity_PL_c:RearingMS            0.89635    
## PNN_pos_PV_intensity_PL_c:HousingSI            0.80396    
## PNN_pos_PV_intensity_PL_c:RearingMS:HousingSI  0.60705    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.577 on 33 degrees of freedom
## Multiple R-squared:  0.304,  Adjusted R-squared:  0.1775 
## F-statistic: 2.402 on 6 and 33 DF,  p-value: 0.04897
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: crossings
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 2.40, p = 0.05
## R² = 0.30
## Adj. R² = 0.18 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------------------
##                                                        Est.   S.E.   t val.      p
## --------------------------------------------------- ------- ------ -------- ------
## (Intercept)                                            4.01   1.02     3.93   0.00
## PNN_pos_PV_intensity_PL_c                             -0.84   2.80    -0.30   0.77
## RearingMS                                             -2.96   1.21    -2.45   0.02
## HousingSI                                              3.06   1.20     2.55   0.02
## PNN_pos_PV_intensity_PL_c:RearingMS                    0.44   3.32     0.13   0.90
## PNN_pos_PV_intensity_PL_c:HousingSI                   -0.83   3.32    -0.25   0.80
## PNN_pos_PV_intensity_PL_c:RearingMS:HousingSI          2.28   4.39     0.52   0.61
## ----------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: crossings
##                                           Df Sum Sq Mean Sq F value   Pr(>F)   
## PNN_pos_PV_intensity_PL_c                  1   1.98   1.978  0.1546 0.696728   
## Rearing                                    1  97.65  97.653  7.6307 0.009306 **
## Housing                                    1  73.45  73.445  5.7391 0.022421 * 
## PNN_pos_PV_intensity_PL_c:Rearing          1   7.36   7.364  0.5754 0.453497   
## PNN_pos_PV_intensity_PL_c:Housing          1   0.57   0.571  0.0446 0.833982   
## PNN_pos_PV_intensity_PL_c:Rearing:Housing  1   3.45   3.450  0.2696 0.607048   
## Residuals                                 33 422.31  12.797                    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

## NULL
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -5.5102 -1.8809 -0.2913  2.2170  7.2580 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                      3.922      1.078   3.640
## PV_pos_PNN_intensity_PL_c                       -1.619      2.752  -0.588
## RearingMS                                       -2.543      1.315  -1.933
## HousingSI                                        2.726      1.281   2.128
## PV_pos_PNN_intensity_PL_c:RearingMS              2.339      3.270   0.715
## PV_pos_PNN_intensity_PL_c:HousingSI              6.044      3.409   1.773
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI   -4.548      5.440  -0.836
##                                               Pr(>|t|)    
## (Intercept)                                   0.000923 ***
## PV_pos_PNN_intensity_PL_c                     0.560245    
## RearingMS                                     0.061858 .  
## HousingSI                                     0.040932 *  
## PV_pos_PNN_intensity_PL_c:RearingMS           0.479534    
## PV_pos_PNN_intensity_PL_c:HousingSI           0.085499 .  
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI 0.409142    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.346 on 33 degrees of freedom
## Multiple R-squared:  0.3912, Adjusted R-squared:  0.2805 
## F-statistic: 3.534 on 6 and 33 DF,  p-value: 0.00821
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: crossings
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 3.53, p = 0.01
## R² = 0.39
## Adj. R² = 0.28 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------------------
##                                                        Est.   S.E.   t val.      p
## --------------------------------------------------- ------- ------ -------- ------
## (Intercept)                                            3.92   1.08     3.64   0.00
## PV_pos_PNN_intensity_PL_c                             -1.62   2.75    -0.59   0.56
## RearingMS                                             -2.54   1.32    -1.93   0.06
## HousingSI                                              2.73   1.28     2.13   0.04
## PV_pos_PNN_intensity_PL_c:RearingMS                    2.34   3.27     0.72   0.48
## PV_pos_PNN_intensity_PL_c:HousingSI                    6.04   3.41     1.77   0.09
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI         -4.55   5.44    -0.84   0.41
## ----------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: crossings
##                                           Df Sum Sq Mean Sq F value   Pr(>F)   
## PV_pos_PNN_intensity_PL_c                  1  18.80  18.801  1.6796 0.203973   
## Rearing                                    1  78.38  78.383  7.0023 0.012376 * 
## Housing                                    1 100.32 100.315  8.9616 0.005192 **
## PV_pos_PNN_intensity_PL_c:Rearing          1   1.12   1.125  0.1005 0.753269   
## PV_pos_PNN_intensity_PL_c:Housing          1  30.93  30.926  2.7628 0.105953   
## PV_pos_PNN_intensity_PL_c:Rearing:Housing  1   7.82   7.824  0.6990 0.409142   
## Residuals                                 33 369.40  11.194                    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

## NULL
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -8.2248 -2.1349 -0.3646  2.4395  6.4508 
## 
## Coefficients:
##                                   Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                         4.0809     0.9959   4.098 0.000255 ***
## PV_count_IL_c                      -0.1237     0.1149  -1.077 0.289406    
## RearingMS                          -2.5995     1.1933  -2.178 0.036620 *  
## HousingSI                           2.4267     1.1933   2.034 0.050099 .  
## PV_count_IL_c:RearingMS             0.1809     0.1958   0.924 0.362260    
## PV_count_IL_c:HousingSI             0.2147     0.1474   1.456 0.154777    
## PV_count_IL_c:RearingMS:HousingSI  -0.1632     0.2489  -0.656 0.516585    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.477 on 33 degrees of freedom
## Multiple R-squared:  0.3424, Adjusted R-squared:  0.2229 
## F-statistic: 2.864 on 6 and 33 DF,  p-value: 0.02336
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: crossings
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 2.86, p = 0.02
## R² = 0.34
## Adj. R² = 0.22 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------
##                                            Est.   S.E.   t val.      p
## --------------------------------------- ------- ------ -------- ------
## (Intercept)                                4.08   1.00     4.10   0.00
## PV_count_IL_c                             -0.12   0.11    -1.08   0.29
## RearingMS                                 -2.60   1.19    -2.18   0.04
## HousingSI                                  2.43   1.19     2.03   0.05
## PV_count_IL_c:RearingMS                    0.18   0.20     0.92   0.36
## PV_count_IL_c:HousingSI                    0.21   0.15     1.46   0.15
## PV_count_IL_c:RearingMS:HousingSI         -0.16   0.25    -0.66   0.52
## ----------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: crossings
##                               Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_count_IL_c                  1  41.24  41.237  3.4106 0.07376 .
## Rearing                        1  60.80  60.800  5.0286 0.03177 *
## Housing                        1  71.93  71.926  5.9489 0.02027 *
## PV_count_IL_c:Rearing          1   6.53   6.528  0.5400 0.46764  
## PV_count_IL_c:Housing          1  22.09  22.092  1.8272 0.18565  
## PV_count_IL_c:Rearing:Housing  1   5.20   5.198  0.4299 0.51659  
## Residuals                     33 398.99  12.091                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

## NULL
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -6.1390 -2.3260 -0.5298  2.4370  7.6275 
## 
## Coefficients:
##                                       Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                             4.2296     1.1379   3.717 0.000746 ***
## PV_intensity_IL_c                       0.1965     5.5909   0.035 0.972178    
## RearingMS                              -3.3399     1.2505  -2.671 0.011651 *  
## HousingSI                               2.6692     1.2516   2.133 0.040486 *  
## PV_intensity_IL_c:RearingMS             1.3883     6.5863   0.211 0.834355    
## PV_intensity_IL_c:HousingSI            -2.4838     7.1892  -0.345 0.731917    
## PV_intensity_IL_c:RearingMS:HousingSI  -1.3998     8.8516  -0.158 0.875307    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.599 on 33 degrees of freedom
## Multiple R-squared:  0.2955, Adjusted R-squared:  0.1674 
## F-statistic: 2.307 on 6 and 33 DF,  p-value: 0.05713
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: crossings
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 2.31, p = 0.06
## R² = 0.30
## Adj. R² = 0.17 
## 
## Standard errors: OLS
## --------------------------------------------------------------------------
##                                                Est.   S.E.   t val.      p
## ------------------------------------------- ------- ------ -------- ------
## (Intercept)                                    4.23   1.14     3.72   0.00
## PV_intensity_IL_c                              0.20   5.59     0.04   0.97
## RearingMS                                     -3.34   1.25    -2.67   0.01
## HousingSI                                      2.67   1.25     2.13   0.04
## PV_intensity_IL_c:RearingMS                    1.39   6.59     0.21   0.83
## PV_intensity_IL_c:HousingSI                   -2.48   7.19    -0.35   0.73
## PV_intensity_IL_c:RearingMS:HousingSI         -1.40   8.85    -0.16   0.88
## --------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: crossings
##                                   Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_intensity_IL_c                  1   0.32   0.315  0.0243 0.87700  
## Rearing                            1  92.73  92.733  7.1587 0.01152 *
## Housing                            1  76.71  76.708  5.9216 0.02054 *
## PV_intensity_IL_c:Rearing          1   1.50   1.501  0.1159 0.73568  
## PV_intensity_IL_c:Housing          1   7.72   7.717  0.5957 0.44571  
## PV_intensity_IL_c:Rearing:Housing  1   0.32   0.324  0.0250 0.87531  
## Residuals                         33 427.48  12.954                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

## NULL
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -6.9025 -1.8797 -0.0576  2.4451  7.0921 
## 
## Coefficients:
##                                    Estimate Std. Error t value Pr(>|t|)   
## (Intercept)                         3.75647    1.17212   3.205  0.00299 **
## PNN_count_IL_c                      0.01379    0.16718   0.082  0.93475   
## RearingMS                          -2.22691    1.31181  -1.698  0.09900 . 
## HousingSI                           3.12882    1.30308   2.401  0.02214 * 
## PNN_count_IL_c:RearingMS            0.13769    0.29096   0.473  0.63917   
## PNN_count_IL_c:HousingSI            0.10522    0.20069   0.524  0.60359   
## PNN_count_IL_c:RearingMS:HousingSI -0.07627    0.35523  -0.215  0.83132   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.496 on 33 degrees of freedom
## Multiple R-squared:  0.3351, Adjusted R-squared:  0.2142 
## F-statistic: 2.772 on 6 and 33 DF,  p-value: 0.02705
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: crossings
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 2.77, p = 0.03
## R² = 0.34
## Adj. R² = 0.21 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------
##                                             Est.   S.E.   t val.      p
## ---------------------------------------- ------- ------ -------- ------
## (Intercept)                                 3.76   1.17     3.20   0.00
## PNN_count_IL_c                              0.01   0.17     0.08   0.93
## RearingMS                                  -2.23   1.31    -1.70   0.10
## HousingSI                                   3.13   1.30     2.40   0.02
## PNN_count_IL_c:RearingMS                    0.14   0.29     0.47   0.64
## PNN_count_IL_c:HousingSI                    0.11   0.20     0.52   0.60
## PNN_count_IL_c:RearingMS:HousingSI         -0.08   0.36    -0.21   0.83
## -----------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: crossings
##                                Df Sum Sq Mean Sq F value   Pr(>F)   
## PNN_count_IL_c                  1  43.13  43.132  3.5281 0.069195 . 
## Rearing                         1  56.65  56.650  4.6339 0.038754 * 
## Housing                         1  95.66  95.657  7.8246 0.008533 **
## PNN_count_IL_c:Rearing          1   4.20   4.196  0.3432 0.561968   
## PNN_count_IL_c:Housing          1   3.14   3.144  0.2572 0.615450   
## PNN_count_IL_c:Rearing:Housing  1   0.56   0.564  0.0461 0.831321   
## Residuals                      33 403.43  12.225                    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

## NULL
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -5.7355 -2.1888 -0.0155  2.0933  7.2302 
## 
## Coefficients:
##                                        Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                               4.118      1.005   4.097 0.000256 ***
## PNN_intensity_IL_c                       -2.812      3.625  -0.776 0.443446    
## RearingMS                                -3.446      1.356  -2.541 0.015920 *  
## HousingSI                                 1.872      1.310   1.429 0.162382    
## PNN_intensity_IL_c:RearingMS              4.855      4.195   1.157 0.255492    
## PNN_intensity_IL_c:HousingSI             10.521      5.101   2.062 0.047109 *  
## PNN_intensity_IL_c:RearingMS:HousingSI  -15.977      7.692  -2.077 0.045639 *  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.341 on 33 degrees of freedom
## Multiple R-squared:  0.393,  Adjusted R-squared:  0.2826 
## F-statistic: 3.561 on 6 and 33 DF,  p-value: 0.007886
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: crossings
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 3.56, p = 0.01
## R² = 0.39
## Adj. R² = 0.28 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------------
##                                                  Est.   S.E.   t val.      p
## -------------------------------------------- -------- ------ -------- ------
## (Intercept)                                      4.12   1.01     4.10   0.00
## PNN_intensity_IL_c                              -2.81   3.63    -0.78   0.44
## RearingMS                                       -3.45   1.36    -2.54   0.02
## HousingSI                                        1.87   1.31     1.43   0.16
## PNN_intensity_IL_c:RearingMS                     4.85   4.20     1.16   0.26
## PNN_intensity_IL_c:HousingSI                    10.52   5.10     2.06   0.05
## PNN_intensity_IL_c:RearingMS:HousingSI         -15.98   7.69    -2.08   0.05
## ----------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: crossings
##                                    Df Sum Sq Mean Sq F value   Pr(>F)   
## PNN_intensity_IL_c                  1   6.37   6.368  0.5706 0.455391   
## Rearing                             1  86.97  86.970  7.7920 0.008658 **
## Housing                             1  88.56  88.555  7.9340 0.008128 **
## PNN_intensity_IL_c:Rearing          1   1.44   1.443  0.1293 0.721426   
## PNN_intensity_IL_c:Housing          1   6.95   6.947  0.6224 0.435771   
## PNN_intensity_IL_c:Rearing:Housing  1  48.16  48.161  4.3149 0.045639 * 
## Residuals                          33 368.33  11.161                    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

## NULL
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -7.5193 -2.0685 -0.4965  2.5159  7.5479 
## 
## Coefficients:
##                                           Estimate Std. Error t value Pr(>|t|)
## (Intercept)                                 4.0880     1.0978   3.724 0.000731
## PNN_pos_PV_count_IL_c                      -0.1913     0.3274  -0.584 0.562960
## RearingMS                                  -2.5488     1.2254  -2.080 0.045366
## HousingSI                                   2.5307     1.2251   2.066 0.046790
## PNN_pos_PV_count_IL_c:RearingMS             0.2916     0.4587   0.636 0.529401
## PNN_pos_PV_count_IL_c:HousingSI             0.5102     0.3872   1.317 0.196758
## PNN_pos_PV_count_IL_c:RearingMS:HousingSI  -0.3649     0.5757  -0.634 0.530551
##                                              
## (Intercept)                               ***
## PNN_pos_PV_count_IL_c                        
## RearingMS                                 *  
## HousingSI                                 *  
## PNN_pos_PV_count_IL_c:RearingMS              
## PNN_pos_PV_count_IL_c:HousingSI              
## PNN_pos_PV_count_IL_c:RearingMS:HousingSI    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.451 on 33 degrees of freedom
## Multiple R-squared:  0.3523, Adjusted R-squared:  0.2345 
## F-statistic: 2.991 on 6 and 33 DF,  p-value: 0.01911
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: crossings
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 2.99, p = 0.02
## R² = 0.35
## Adj. R² = 0.23 
## 
## Standard errors: OLS
## ------------------------------------------------------------------------------
##                                                    Est.   S.E.   t val.      p
## ----------------------------------------------- ------- ------ -------- ------
## (Intercept)                                        4.09   1.10     3.72   0.00
## PNN_pos_PV_count_IL_c                             -0.19   0.33    -0.58   0.56
## RearingMS                                         -2.55   1.23    -2.08   0.05
## HousingSI                                          2.53   1.23     2.07   0.05
## PNN_pos_PV_count_IL_c:RearingMS                    0.29   0.46     0.64   0.53
## PNN_pos_PV_count_IL_c:HousingSI                    0.51   0.39     1.32   0.20
## PNN_pos_PV_count_IL_c:RearingMS:HousingSI         -0.36   0.58    -0.63   0.53
## ------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: crossings
##                                       Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_count_IL_c                  1  52.61  52.610  4.4172 0.04329 *
## Rearing                                1  52.47  52.468  4.4053 0.04356 *
## Housing                                1  84.64  84.639  7.1065 0.01180 *
## PNN_pos_PV_count_IL_c:Rearing          1   0.30   0.304  0.0255 0.87406  
## PNN_pos_PV_count_IL_c:Housing          1  18.93  18.934  1.5897 0.21620  
## PNN_pos_PV_count_IL_c:Rearing:Housing  1   4.79   4.785  0.4018 0.53055  
## Residuals                             33 393.03  11.910                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

## NULL
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -5.8714 -2.3851 -0.4303  2.1885  7.7209 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                     4.2246     1.0131   4.170
## PNN_pos_PV_intensity_IL_c                      -1.0382     3.4054  -0.305
## RearingMS                                      -3.5021     1.1843  -2.957
## HousingSI                                       2.5379     1.1818   2.147
## PNN_pos_PV_intensity_IL_c:RearingMS             2.6264     4.0913   0.642
## PNN_pos_PV_intensity_IL_c:HousingSI            -0.1096     4.4189  -0.025
## PNN_pos_PV_intensity_IL_c:RearingMS:HousingSI  -6.0480     6.1337  -0.986
##                                               Pr(>|t|)    
## (Intercept)                                   0.000207 ***
## PNN_pos_PV_intensity_IL_c                     0.762393    
## RearingMS                                     0.005700 ** 
## HousingSI                                     0.039196 *  
## PNN_pos_PV_intensity_IL_c:RearingMS           0.525343    
## PNN_pos_PV_intensity_IL_c:HousingSI           0.980365    
## PNN_pos_PV_intensity_IL_c:RearingMS:HousingSI 0.331299    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.516 on 33 degrees of freedom
## Multiple R-squared:  0.3277, Adjusted R-squared:  0.2054 
## F-statistic:  2.68 on 6 and 33 DF,  p-value: 0.03132
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: crossings
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 2.68, p = 0.03
## R² = 0.33
## Adj. R² = 0.21 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------------------
##                                                        Est.   S.E.   t val.      p
## --------------------------------------------------- ------- ------ -------- ------
## (Intercept)                                            4.22   1.01     4.17   0.00
## PNN_pos_PV_intensity_IL_c                             -1.04   3.41    -0.30   0.76
## RearingMS                                             -3.50   1.18    -2.96   0.01
## HousingSI                                              2.54   1.18     2.15   0.04
## PNN_pos_PV_intensity_IL_c:RearingMS                    2.63   4.09     0.64   0.53
## PNN_pos_PV_intensity_IL_c:HousingSI                   -0.11   4.42    -0.02   0.98
## PNN_pos_PV_intensity_IL_c:RearingMS:HousingSI         -6.05   6.13    -0.99   0.33
## ----------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: crossings
##                                           Df Sum Sq Mean Sq F value  Pr(>F)   
## PNN_pos_PV_intensity_IL_c                  1   0.00   0.001  0.0001 0.99223   
## Rearing                                    1  94.41  94.411  7.6370 0.00928 **
## Housing                                    1  76.89  76.890  6.2197 0.01782 * 
## PNN_pos_PV_intensity_IL_c:Rearing          1   1.79   1.792  0.1450 0.70581   
## PNN_pos_PV_intensity_IL_c:Housing          1  13.70  13.705  1.1086 0.30004   
## PNN_pos_PV_intensity_IL_c:Rearing:Housing  1  12.02  12.019  0.9722 0.33130   
## Residuals                                 33 407.96  12.362                   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

## NULL
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -5.4959 -1.9934  0.0352  1.8528  7.0555 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                     4.2130     0.9977   4.223
## PV_pos_PNN_intensity_IL_c                      -1.9372     2.3586  -0.821
## RearingMS                                      -3.6180     1.3090  -2.764
## HousingSI                                       1.7809     1.2800   1.391
## PV_pos_PNN_intensity_IL_c:RearingMS             3.6769     2.8225   1.303
## PV_pos_PNN_intensity_IL_c:HousingSI             6.9768     3.4532   2.020
## PV_pos_PNN_intensity_IL_c:RearingMS:HousingSI -11.9314     5.3020  -2.250
##                                               Pr(>|t|)    
## (Intercept)                                   0.000178 ***
## PV_pos_PNN_intensity_IL_c                     0.417330    
## RearingMS                                     0.009268 ** 
## HousingSI                                     0.173424    
## PV_pos_PNN_intensity_IL_c:RearingMS           0.201686    
## PV_pos_PNN_intensity_IL_c:HousingSI           0.051521 .  
## PV_pos_PNN_intensity_IL_c:RearingMS:HousingSI 0.031212 *  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.339 on 33 degrees of freedom
## Multiple R-squared:  0.3938, Adjusted R-squared:  0.2836 
## F-statistic: 3.573 on 6 and 33 DF,  p-value: 0.007741
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: crossings
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 3.57, p = 0.01
## R² = 0.39
## Adj. R² = 0.28 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------------------
##                                                         Est.   S.E.   t val.      p
## --------------------------------------------------- -------- ------ -------- ------
## (Intercept)                                             4.21   1.00     4.22   0.00
## PV_pos_PNN_intensity_IL_c                              -1.94   2.36    -0.82   0.42
## RearingMS                                              -3.62   1.31    -2.76   0.01
## HousingSI                                               1.78   1.28     1.39   0.17
## PV_pos_PNN_intensity_IL_c:RearingMS                     3.68   2.82     1.30   0.20
## PV_pos_PNN_intensity_IL_c:HousingSI                     6.98   3.45     2.02   0.05
## PV_pos_PNN_intensity_IL_c:RearingMS:HousingSI         -11.93   5.30    -2.25   0.03
## -----------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: crossings
##                                           Df Sum Sq Mean Sq F value   Pr(>F)   
## PV_pos_PNN_intensity_IL_c                  1   6.51   6.511  0.5841 0.450146   
## Rearing                                    1  86.60  86.604  7.7695 0.008746 **
## Housing                                    1  85.47  85.466  7.6675 0.009154 **
## PV_pos_PNN_intensity_IL_c:Rearing          1   0.27   0.272  0.0244 0.876721   
## PV_pos_PNN_intensity_IL_c:Housing          1   3.64   3.637  0.3263 0.571738   
## PV_pos_PNN_intensity_IL_c:Rearing:Housing  1  56.45  56.448  5.0641 0.031212 * 
## Residuals                                 33 367.84  11.147                    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

## NULL
## [[1]]
## NULL
## 
## [[2]]
## NULL
## 
## [[3]]
## NULL
## 
## [[4]]
## NULL
## 
## [[5]]
## NULL
## 
## [[6]]
## NULL
## 
## [[7]]
## NULL
## 
## [[8]]
## NULL
## 
## [[9]]
## NULL
## 
## [[10]]
## NULL
## 
## [[11]]
## NULL
## 
## [[12]]
## NULL
## 
## [[13]]
## NULL
## 
## [[14]]
## NULL

Female - Frequency in the open

# Returning summary, summ, and anova stats for every linear model in the femalelm_freq_open list
lapply(femalelm_freq_open, function(x){
    print(summary(x))
    print(summ(x))
    print(anova(x))
})
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -8.1118 -2.1414 -0.2747  2.1177  8.7622 
## 
## Coefficients:
##                                   Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                        5.17154    1.05857   4.885 2.58e-05 ***
## PV_count_PL_c                     -0.07749    0.14956  -0.518   0.6078    
## RearingMS                         -2.16425    1.25967  -1.718   0.0951 .  
## HousingSI                          2.44923    1.26120   1.942   0.0607 .  
## PV_count_PL_c:RearingMS            0.24187    0.18412   1.314   0.1980    
## PV_count_PL_c:HousingSI            0.21536    0.17368   1.240   0.2237    
## PV_count_PL_c:RearingMS:HousingSI -0.34230    0.23407  -1.462   0.1531    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.639 on 33 degrees of freedom
## Multiple R-squared:  0.3231, Adjusted R-squared:  0.2001 
## F-statistic: 2.626 on 6 and 33 DF,  p-value: 0.03419
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: freq_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 2.63, p = 0.03
## R² = 0.32
## Adj. R² = 0.20 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------
##                                            Est.   S.E.   t val.      p
## --------------------------------------- ------- ------ -------- ------
## (Intercept)                                5.17   1.06     4.89   0.00
## PV_count_PL_c                             -0.08   0.15    -0.52   0.61
## RearingMS                                 -2.16   1.26    -1.72   0.10
## HousingSI                                  2.45   1.26     1.94   0.06
## PV_count_PL_c:RearingMS                    0.24   0.18     1.31   0.20
## PV_count_PL_c:HousingSI                    0.22   0.17     1.24   0.22
## PV_count_PL_c:RearingMS:HousingSI         -0.34   0.23    -1.46   0.15
## ----------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: freq_open
##                               Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_count_PL_c                  1  59.17  59.172  4.4685 0.04217 *
## Rearing                        1  34.52  34.525  2.6072 0.11590  
## Housing                        1  85.48  85.483  6.4554 0.01595 *
## PV_count_PL_c:Rearing          1   0.68   0.677  0.0511 0.82251  
## PV_count_PL_c:Housing          1   0.43   0.432  0.0327 0.85771  
## PV_count_PL_c:Rearing:Housing  1  28.32  28.320  2.1387 0.15309  
## Residuals                     33 436.99  13.242                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -5.9952 -2.4389 -0.5918  2.8682  8.6173 
## 
## Coefficients:
##                                       Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                             5.4977     1.0596   5.188 1.06e-05 ***
## PV_intensity_PL_c                       0.5710     3.4438   0.166   0.8693    
## RearingMS                              -2.8780     1.2615  -2.281   0.0291 *  
## HousingSI                               2.9360     1.2559   2.338   0.0256 *  
## PV_intensity_PL_c:RearingMS             0.3261     3.9920   0.082   0.9354    
## PV_intensity_PL_c:HousingSI            -4.0720     4.3700  -0.932   0.3582    
## PV_intensity_PL_c:RearingMS:HousingSI   2.5711     5.7438   0.448   0.6573    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.8 on 33 degrees of freedom
## Multiple R-squared:  0.2618, Adjusted R-squared:  0.1275 
## F-statistic:  1.95 on 6 and 33 DF,  p-value: 0.1017
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: freq_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 1.95, p = 0.10
## R² = 0.26
## Adj. R² = 0.13 
## 
## Standard errors: OLS
## --------------------------------------------------------------------------
##                                                Est.   S.E.   t val.      p
## ------------------------------------------- ------- ------ -------- ------
## (Intercept)                                    5.50   1.06     5.19   0.00
## PV_intensity_PL_c                              0.57   3.44     0.17   0.87
## RearingMS                                     -2.88   1.26    -2.28   0.03
## HousingSI                                      2.94   1.26     2.34   0.03
## PV_intensity_PL_c:RearingMS                    0.33   3.99     0.08   0.94
## PV_intensity_PL_c:HousingSI                   -4.07   4.37    -0.93   0.36
## PV_intensity_PL_c:RearingMS:HousingSI          2.57   5.74     0.45   0.66
## --------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: freq_open
##                                   Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_intensity_PL_c                  1   0.97   0.969  0.0671 0.79718  
## Rearing                            1  67.82  67.821  4.6959 0.03755 *
## Housing                            1  73.77  73.773  5.1080 0.03054 *
## PV_intensity_PL_c:Rearing          1  11.40  11.401  0.7894 0.38072  
## PV_intensity_PL_c:Housing          1  12.13  12.132  0.8400 0.36605  
## PV_intensity_PL_c:Rearing:Housing  1   2.89   2.894  0.2004 0.65734  
## Residuals                         33 476.61  14.443                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -8.6461 -1.8462 -0.1428  1.9623  8.9437 
## 
## Coefficients:
##                                    Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                         4.90757    1.08468   4.524 7.44e-05 ***
## PNN_count_PL_c                      0.02241    0.16833   0.133   0.8949    
## RearingMS                          -2.04025    1.32480  -1.540   0.1331    
## HousingSI                           3.33388    1.30580   2.553   0.0155 *  
## PNN_count_PL_c:RearingMS            0.28464    0.25051   1.136   0.2640    
## PNN_count_PL_c:HousingSI            0.11021    0.21907   0.503   0.6183    
## PNN_count_PL_c:RearingMS:HousingSI -0.22209    0.36907  -0.602   0.5515    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.659 on 33 degrees of freedom
## Multiple R-squared:  0.3156, Adjusted R-squared:  0.1911 
## F-statistic: 2.536 on 6 and 33 DF,  p-value: 0.0395
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: freq_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 2.54, p = 0.04
## R² = 0.32
## Adj. R² = 0.19 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------
##                                             Est.   S.E.   t val.      p
## ---------------------------------------- ------- ------ -------- ------
## (Intercept)                                 4.91   1.08     4.52   0.00
## PNN_count_PL_c                              0.02   0.17     0.13   0.89
## RearingMS                                  -2.04   1.32    -1.54   0.13
## HousingSI                                   3.33   1.31     2.55   0.02
## PNN_count_PL_c:RearingMS                    0.28   0.25     1.14   0.26
## PNN_count_PL_c:HousingSI                    0.11   0.22     0.50   0.62
## PNN_count_PL_c:RearingMS:HousingSI         -0.22   0.37    -0.60   0.55
## -----------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: freq_open
##                                Df Sum Sq Mean Sq F value   Pr(>F)   
## PNN_count_PL_c                  1  43.19  43.192  3.2256 0.081656 . 
## Rearing                         1  41.08  41.079  3.0678 0.089148 . 
## Housing                         1 100.77 100.769  7.5255 0.009757 **
## PNN_count_PL_c:Rearing          1  13.51  13.506  1.0086 0.322537   
## PNN_count_PL_c:Housing          1   0.32   0.325  0.0243 0.877189   
## PNN_count_PL_c:Rearing:Housing  1   4.85   4.849  0.3621 0.551453   
## Residuals                      33 441.88  13.390                    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -6.8523 -2.5046 -0.2855  2.1841  8.9550 
## 
## Coefficients:
##                                        Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                              5.0657     1.2070   4.197 0.000192 ***
## PNN_intensity_PL_c                      -0.6532     3.6349  -0.180 0.858486    
## RearingMS                               -1.8220     1.5170  -1.201 0.238292    
## HousingSI                                2.7551     1.4737   1.869 0.070450 .  
## PNN_intensity_PL_c:RearingMS             0.7559     4.2501   0.178 0.859922    
## PNN_intensity_PL_c:HousingSI             4.7753     4.4646   1.070 0.292564    
## PNN_intensity_PL_c:RearingMS:HousingSI  -2.3644     7.3024  -0.324 0.748145    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.745 on 33 degrees of freedom
## Multiple R-squared:  0.2829, Adjusted R-squared:  0.1526 
## F-statistic:  2.17 on 6 and 33 DF,  p-value: 0.07126
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: freq_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 2.17, p = 0.07
## R² = 0.28
## Adj. R² = 0.15 
## 
## Standard errors: OLS
## ---------------------------------------------------------------------------
##                                                 Est.   S.E.   t val.      p
## -------------------------------------------- ------- ------ -------- ------
## (Intercept)                                     5.07   1.21     4.20   0.00
## PNN_intensity_PL_c                             -0.65   3.63    -0.18   0.86
## RearingMS                                      -1.82   1.52    -1.20   0.24
## HousingSI                                       2.76   1.47     1.87   0.07
## PNN_intensity_PL_c:RearingMS                    0.76   4.25     0.18   0.86
## PNN_intensity_PL_c:HousingSI                    4.78   4.46     1.07   0.29
## PNN_intensity_PL_c:RearingMS:HousingSI         -2.36   7.30    -0.32   0.75
## ---------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: freq_open
##                                    Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_intensity_PL_c                  1  10.02  10.019  0.7142 0.40413  
## Rearing                             1  56.12  56.119  4.0004 0.05378 .
## Housing                             1  92.19  92.192  6.5719 0.01510 *
## PNN_intensity_PL_c:Rearing          1   3.30   3.301  0.2353 0.63080  
## PNN_intensity_PL_c:Housing          1  19.56  19.564  1.3946 0.24607  
## PNN_intensity_PL_c:Rearing:Housing  1   1.47   1.471  0.1048 0.74814  
## Residuals                          33 462.93  14.028                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##    Min     1Q Median     3Q    Max 
## -8.344 -2.165 -0.008  2.053  8.822 
## 
## Coefficients:
##                                           Estimate Std. Error t value Pr(>|t|)
## (Intercept)                                4.87416    1.11318   4.379 0.000114
## PNN_pos_PV_count_PL_c                      0.06829    0.27751   0.246 0.807143
## RearingMS                                 -2.14295    1.35439  -1.582 0.123137
## HousingSI                                  3.08289    1.34587   2.291 0.028508
## PNN_pos_PV_count_PL_c:RearingMS            0.21961    0.33804   0.650 0.520404
## PNN_pos_PV_count_PL_c:HousingSI            0.14961    0.34408   0.435 0.666521
## PNN_pos_PV_count_PL_c:RearingMS:HousingSI -0.29953    0.48190  -0.622 0.538506
##                                              
## (Intercept)                               ***
## PNN_pos_PV_count_PL_c                        
## RearingMS                                    
## HousingSI                                 *  
## PNN_pos_PV_count_PL_c:RearingMS              
## PNN_pos_PV_count_PL_c:HousingSI              
## PNN_pos_PV_count_PL_c:RearingMS:HousingSI    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.703 on 33 degrees of freedom
## Multiple R-squared:  0.2992, Adjusted R-squared:  0.1718 
## F-statistic: 2.348 on 6 and 33 DF,  p-value: 0.05346
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: freq_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 2.35, p = 0.05
## R² = 0.30
## Adj. R² = 0.17 
## 
## Standard errors: OLS
## ------------------------------------------------------------------------------
##                                                    Est.   S.E.   t val.      p
## ----------------------------------------------- ------- ------ -------- ------
## (Intercept)                                        4.87   1.11     4.38   0.00
## PNN_pos_PV_count_PL_c                              0.07   0.28     0.25   0.81
## RearingMS                                         -2.14   1.35    -1.58   0.12
## HousingSI                                          3.08   1.35     2.29   0.03
## PNN_pos_PV_count_PL_c:RearingMS                    0.22   0.34     0.65   0.52
## PNN_pos_PV_count_PL_c:HousingSI                    0.15   0.34     0.43   0.67
## PNN_pos_PV_count_PL_c:RearingMS:HousingSI         -0.30   0.48    -0.62   0.54
## ------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: freq_open
##                                       Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_count_PL_c                  1  46.28  46.277  3.3753 0.07520 .
## Rearing                                1  39.11  39.110  2.8525 0.10066  
## Housing                                1 101.20 101.204  7.3815 0.01041 *
## PNN_pos_PV_count_PL_c:Rearing          1   1.22   1.221  0.0891 0.76725  
## PNN_pos_PV_count_PL_c:Housing          1   0.04   0.042  0.0031 0.95611  
## PNN_pos_PV_count_PL_c:Rearing:Housing  1   5.30   5.297  0.3863 0.53851  
## Residuals                             33 452.45  13.711                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -5.8710 -2.6257 -0.2756  2.8681  8.0308 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                     5.2822     1.0826   4.879
## PNN_pos_PV_intensity_PL_c                      -1.5944     2.9766  -0.536
## RearingMS                                      -2.6210     1.2823  -2.044
## HousingSI                                       3.1067     1.2744   2.438
## PNN_pos_PV_intensity_PL_c:RearingMS             2.3697     3.5201   0.673
## PNN_pos_PV_intensity_PL_c:HousingSI            -0.7207     3.5244  -0.204
## PNN_pos_PV_intensity_PL_c:RearingMS:HousingSI   0.3762     4.6604   0.081
##                                               Pr(>|t|)    
## (Intercept)                                   2.63e-05 ***
## PNN_pos_PV_intensity_PL_c                       0.5958    
## RearingMS                                       0.0490 *  
## HousingSI                                       0.0203 *  
## PNN_pos_PV_intensity_PL_c:RearingMS             0.5055    
## PNN_pos_PV_intensity_PL_c:HousingSI             0.8392    
## PNN_pos_PV_intensity_PL_c:RearingMS:HousingSI   0.9362    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.797 on 33 degrees of freedom
## Multiple R-squared:  0.263,  Adjusted R-squared:  0.129 
## F-statistic: 1.962 on 6 and 33 DF,  p-value: 0.09974
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: freq_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 1.96, p = 0.10
## R² = 0.26
## Adj. R² = 0.13 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------------------
##                                                        Est.   S.E.   t val.      p
## --------------------------------------------------- ------- ------ -------- ------
## (Intercept)                                            5.28   1.08     4.88   0.00
## PNN_pos_PV_intensity_PL_c                             -1.59   2.98    -0.54   0.60
## RearingMS                                             -2.62   1.28    -2.04   0.05
## HousingSI                                              3.11   1.27     2.44   0.02
## PNN_pos_PV_intensity_PL_c:RearingMS                    2.37   3.52     0.67   0.51
## PNN_pos_PV_intensity_PL_c:HousingSI                   -0.72   3.52    -0.20   0.84
## PNN_pos_PV_intensity_PL_c:RearingMS:HousingSI          0.38   4.66     0.08   0.94
## ----------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: freq_open
##                                           Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_intensity_PL_c                  1   3.27   3.270  0.2268 0.63707  
## Rearing                                    1  69.37  69.366  4.8107 0.03544 *
## Housing                                    1  73.03  73.035  5.0651 0.03120 *
## PNN_pos_PV_intensity_PL_c:Rearing          1  23.32  23.323  1.6175 0.21233  
## PNN_pos_PV_intensity_PL_c:Housing          1   0.68   0.684  0.0474 0.82894  
## PNN_pos_PV_intensity_PL_c:Rearing:Housing  1   0.09   0.094  0.0065 0.93615  
## Residuals                                 33 475.83  14.419                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -7.0130 -2.7612 -0.1625  2.1697  8.9637 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                     5.0533     1.2087   4.181
## PV_pos_PNN_intensity_PL_c                      -0.1529     3.0870  -0.050
## RearingMS                                      -1.9582     1.4755  -1.327
## HousingSI                                       2.8712     1.4373   1.998
## PV_pos_PNN_intensity_PL_c:RearingMS             0.5402     3.6687   0.147
## PV_pos_PNN_intensity_PL_c:HousingSI             3.6970     3.8243   0.967
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI  -2.0707     6.1027  -0.339
##                                               Pr(>|t|)    
## (Intercept)                                   0.000201 ***
## PV_pos_PNN_intensity_PL_c                     0.960804    
## RearingMS                                     0.193575    
## HousingSI                                     0.054063 .  
## PV_pos_PNN_intensity_PL_c:RearingMS           0.883835    
## PV_pos_PNN_intensity_PL_c:HousingSI           0.340719    
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI 0.736530    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.753 on 33 degrees of freedom
## Multiple R-squared:   0.28,  Adjusted R-squared:  0.1491 
## F-statistic: 2.139 on 6 and 33 DF,  p-value: 0.07495
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: freq_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 2.14, p = 0.07
## R² = 0.28
## Adj. R² = 0.15 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------------------
##                                                        Est.   S.E.   t val.      p
## --------------------------------------------------- ------- ------ -------- ------
## (Intercept)                                            5.05   1.21     4.18   0.00
## PV_pos_PNN_intensity_PL_c                             -0.15   3.09    -0.05   0.96
## RearingMS                                             -1.96   1.48    -1.33   0.19
## HousingSI                                              2.87   1.44     2.00   0.05
## PV_pos_PNN_intensity_PL_c:RearingMS                    0.54   3.67     0.15   0.88
## PV_pos_PNN_intensity_PL_c:HousingSI                    3.70   3.82     0.97   0.34
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI         -2.07   6.10    -0.34   0.74
## ----------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: freq_open
##                                           Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_pos_PNN_intensity_PL_c                  1  10.75  10.752  0.7633 0.38860  
## Rearing                                    1  55.88  55.877  3.9670 0.05473 .
## Housing                                    1  95.09  95.086  6.7506 0.01390 *
## PV_pos_PNN_intensity_PL_c:Rearing          1   2.77   2.769  0.1966 0.66039  
## PV_pos_PNN_intensity_PL_c:Housing          1  14.67  14.668  1.0414 0.31492  
## PV_pos_PNN_intensity_PL_c:Rearing:Housing  1   1.62   1.622  0.1151 0.73653  
## Residuals                                 33 464.83  14.086                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -8.7635 -2.1502 -0.2573  2.4285  7.8057 
## 
## Coefficients:
##                                   Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                         5.5829     1.0597   5.269 8.35e-06 ***
## PV_count_IL_c                      -0.1615     0.1222  -1.321   0.1956    
## RearingMS                          -2.1465     1.2698  -1.690   0.1004    
## HousingSI                           2.4165     1.2698   1.903   0.0658 .  
## PV_count_IL_c:RearingMS             0.3381     0.2083   1.623   0.1142    
## PV_count_IL_c:HousingSI             0.2020     0.1568   1.288   0.2068    
## PV_count_IL_c:RearingMS:HousingSI  -0.2622     0.2649  -0.990   0.3295    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.7 on 33 degrees of freedom
## Multiple R-squared:  0.3002, Adjusted R-squared:  0.173 
## F-statistic:  2.36 on 6 and 33 DF,  p-value: 0.05244
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: freq_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 2.36, p = 0.05
## R² = 0.30
## Adj. R² = 0.17 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------
##                                            Est.   S.E.   t val.      p
## --------------------------------------- ------- ------ -------- ------
## (Intercept)                                5.58   1.06     5.27   0.00
## PV_count_IL_c                             -0.16   0.12    -1.32   0.20
## RearingMS                                 -2.15   1.27    -1.69   0.10
## HousingSI                                  2.42   1.27     1.90   0.07
## PV_count_IL_c:RearingMS                    0.34   0.21     1.62   0.11
## PV_count_IL_c:HousingSI                    0.20   0.16     1.29   0.21
## PV_count_IL_c:RearingMS:HousingSI         -0.26   0.26    -0.99   0.33
## ----------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: freq_open
##                               Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_count_IL_c                  1  27.37  27.373  1.9996 0.16671  
## Rearing                        1  43.06  43.055  3.1451 0.08539 .
## Housing                        1  72.65  72.648  5.3068 0.02768 *
## PV_count_IL_c:Rearing          1  27.46  27.462  2.0060 0.16605  
## PV_count_IL_c:Housing          1   9.89   9.887  0.7222 0.40154  
## PV_count_IL_c:Rearing:Housing  1  13.41  13.412  0.9797 0.32948  
## Residuals                     33 451.76  13.690                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -6.9072 -2.5486 -0.4516  2.9518  8.3029 
## 
## Coefficients:
##                                       Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                             5.4902     1.1929   4.602 5.93e-05 ***
## PV_intensity_IL_c                      -0.6425     5.8611  -0.110   0.9134    
## RearingMS                              -2.8854     1.3109  -2.201   0.0348 *  
## HousingSI                               2.7563     1.3121   2.101   0.0434 *  
## PV_intensity_IL_c:RearingMS             4.6714     6.9046   0.677   0.5034    
## PV_intensity_IL_c:HousingSI            -3.3894     7.5366  -0.450   0.6558    
## PV_intensity_IL_c:RearingMS:HousingSI  -3.3584     9.2793  -0.362   0.7197    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.773 on 33 degrees of freedom
## Multiple R-squared:  0.2723, Adjusted R-squared:   0.14 
## F-statistic: 2.058 on 6 and 33 DF,  p-value: 0.0854
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: freq_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 2.06, p = 0.09
## R² = 0.27
## Adj. R² = 0.14 
## 
## Standard errors: OLS
## --------------------------------------------------------------------------
##                                                Est.   S.E.   t val.      p
## ------------------------------------------- ------- ------ -------- ------
## (Intercept)                                    5.49   1.19     4.60   0.00
## PV_intensity_IL_c                             -0.64   5.86    -0.11   0.91
## RearingMS                                     -2.89   1.31    -2.20   0.03
## HousingSI                                      2.76   1.31     2.10   0.04
## PV_intensity_IL_c:RearingMS                    4.67   6.90     0.68   0.50
## PV_intensity_IL_c:HousingSI                   -3.39   7.54    -0.45   0.66
## PV_intensity_IL_c:RearingMS:HousingSI         -3.36   9.28    -0.36   0.72
## --------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: freq_open
##                                   Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_intensity_IL_c                  1   0.45   0.449  0.0315 0.86012  
## Rearing                            1  64.27  64.274  4.5149 0.04118 *
## Housing                            1  76.18  76.175  5.3509 0.02709 *
## PV_intensity_IL_c:Rearing          1  12.30  12.298  0.8639 0.35941  
## PV_intensity_IL_c:Housing          1  20.75  20.754  1.4579 0.23585  
## PV_intensity_IL_c:Rearing:Housing  1   1.86   1.865  0.1310 0.71972  
## Residuals                         33 469.78  14.236                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -8.1299 -2.2306 -0.6852  2.6132  8.4026 
## 
## Coefficients:
##                                    Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                         4.94617    1.27264   3.887 0.000464 ***
## PNN_count_IL_c                      0.05932    0.18152   0.327 0.745895    
## RearingMS                          -1.67233    1.42431  -1.174 0.248745    
## HousingSI                           3.17129    1.41483   2.241 0.031840 *  
## PNN_count_IL_c:RearingMS            0.14726    0.31591   0.466 0.644166    
## PNN_count_IL_c:HousingSI            0.02648    0.21791   0.122 0.903998    
## PNN_count_IL_c:RearingMS:HousingSI -0.07090    0.38570  -0.184 0.855272    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.796 on 33 degrees of freedom
## Multiple R-squared:  0.2633, Adjusted R-squared:  0.1294 
## F-statistic: 1.966 on 6 and 33 DF,  p-value: 0.09915
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: freq_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 1.97, p = 0.10
## R² = 0.26
## Adj. R² = 0.13 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------
##                                             Est.   S.E.   t val.      p
## ---------------------------------------- ------- ------ -------- ------
## (Intercept)                                 4.95   1.27     3.89   0.00
## PNN_count_IL_c                              0.06   0.18     0.33   0.75
## RearingMS                                  -1.67   1.42    -1.17   0.25
## HousingSI                                   3.17   1.41     2.24   0.03
## PNN_count_IL_c:RearingMS                    0.15   0.32     0.47   0.64
## PNN_count_IL_c:HousingSI                    0.03   0.22     0.12   0.90
## PNN_count_IL_c:RearingMS:HousingSI         -0.07   0.39    -0.18   0.86
## -----------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: freq_open
##                                Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_count_IL_c                  1  32.31  32.310  2.2419 0.14382  
## Rearing                         1  38.27  38.270  2.6555 0.11270  
## Housing                         1  94.26  94.257  6.5402 0.01533 *
## PNN_count_IL_c:Rearing          1   4.68   4.682  0.3249 0.57256  
## PNN_count_IL_c:Housing          1   0.00   0.000  0.0000 0.99841  
## PNN_count_IL_c:Rearing:Housing  1   0.49   0.487  0.0338 0.85527  
## Residuals                      33 475.59  14.412                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -6.8056 -2.1048 -0.2831  1.9546  8.6806 
## 
## Coefficients:
##                                        Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                              5.3999     1.1203   4.820 3.13e-05 ***
## PNN_intensity_IL_c                      -0.6507     4.0405  -0.161   0.8730    
## RearingMS                               -3.0348     1.5112  -2.008   0.0529 .  
## HousingSI                                1.9056     1.4599   1.305   0.2008    
## PNN_intensity_IL_c:RearingMS             2.4670     4.6757   0.528   0.6013    
## PNN_intensity_IL_c:HousingSI             7.1117     5.6858   1.251   0.2198    
## PNN_intensity_IL_c:RearingMS:HousingSI -12.9716     8.5729  -1.513   0.1398    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.724 on 33 degrees of freedom
## Multiple R-squared:  0.2913, Adjusted R-squared:  0.1624 
## F-statistic:  2.26 on 6 and 33 DF,  p-value: 0.06161
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: freq_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 2.26, p = 0.06
## R² = 0.29
## Adj. R² = 0.16 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------------
##                                                  Est.   S.E.   t val.      p
## -------------------------------------------- -------- ------ -------- ------
## (Intercept)                                      5.40   1.12     4.82   0.00
## PNN_intensity_IL_c                              -0.65   4.04    -0.16   0.87
## RearingMS                                       -3.03   1.51    -2.01   0.05
## HousingSI                                        1.91   1.46     1.31   0.20
## PNN_intensity_IL_c:RearingMS                     2.47   4.68     0.53   0.60
## PNN_intensity_IL_c:HousingSI                     7.11   5.69     1.25   0.22
## PNN_intensity_IL_c:RearingMS:HousingSI         -12.97   8.57    -1.51   0.14
## ----------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: freq_open
##                                    Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_intensity_IL_c                  1   3.60   3.601  0.2597 0.61371  
## Rearing                             1  61.24  61.236  4.4164 0.04331 *
## Housing                             1  86.26  86.262  6.2213 0.01781 *
## PNN_intensity_IL_c:Rearing          1   4.62   4.615  0.3328 0.56791  
## PNN_intensity_IL_c:Housing          1   0.57   0.574  0.0414 0.84008  
## PNN_intensity_IL_c:Rearing:Housing  1  31.75  31.745  2.2895 0.13977  
## Residuals                          33 457.57  13.866                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -8.6299 -2.5225 -0.3611  2.4645  9.1156 
## 
## Coefficients:
##                                           Estimate Std. Error t value Pr(>|t|)
## (Intercept)                                 5.3733     1.2058   4.456 9.07e-05
## PNN_pos_PV_count_IL_c                      -0.1471     0.3596  -0.409   0.6852
## RearingMS                                  -2.0724     1.3460  -1.540   0.1332
## HousingSI                                   2.6068     1.3457   1.937   0.0613
## PNN_pos_PV_count_IL_c:RearingMS             0.3176     0.5039   0.630   0.5328
## PNN_pos_PV_count_IL_c:HousingSI             0.3771     0.4254   0.887   0.3817
## PNN_pos_PV_count_IL_c:RearingMS:HousingSI  -0.3158     0.6324  -0.499   0.6209
##                                              
## (Intercept)                               ***
## PNN_pos_PV_count_IL_c                        
## RearingMS                                    
## HousingSI                                 .  
## PNN_pos_PV_count_IL_c:RearingMS              
## PNN_pos_PV_count_IL_c:HousingSI              
## PNN_pos_PV_count_IL_c:RearingMS:HousingSI    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.791 on 33 degrees of freedom
## Multiple R-squared:  0.2654, Adjusted R-squared:  0.1319 
## F-statistic: 1.988 on 6 and 33 DF,  p-value: 0.09577
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: freq_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 1.99, p = 0.10
## R² = 0.27
## Adj. R² = 0.13 
## 
## Standard errors: OLS
## ------------------------------------------------------------------------------
##                                                    Est.   S.E.   t val.      p
## ----------------------------------------------- ------- ------ -------- ------
## (Intercept)                                        5.37   1.21     4.46   0.00
## PNN_pos_PV_count_IL_c                             -0.15   0.36    -0.41   0.69
## RearingMS                                         -2.07   1.35    -1.54   0.13
## HousingSI                                          2.61   1.35     1.94   0.06
## PNN_pos_PV_count_IL_c:RearingMS                    0.32   0.50     0.63   0.53
## PNN_pos_PV_count_IL_c:HousingSI                    0.38   0.43     0.89   0.38
## PNN_pos_PV_count_IL_c:RearingMS:HousingSI         -0.32   0.63    -0.50   0.62
## ------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: freq_open
##                                       Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_count_IL_c                  1  38.20  38.204  2.6585 0.11251  
## Rearing                                1  35.86  35.861  2.4955 0.12371  
## Housing                                1  83.43  83.434  5.8059 0.02171 *
## PNN_pos_PV_count_IL_c:Rearing          1   1.80   1.798  0.1251 0.72581  
## PNN_pos_PV_count_IL_c:Housing          1   8.49   8.491  0.5909 0.44755  
## PNN_pos_PV_count_IL_c:Rearing:Housing  1   3.58   3.583  0.2493 0.62088  
## Residuals                             33 474.23  14.371                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##    Min     1Q Median     3Q    Max 
## -5.925 -2.299 -0.322  2.063  7.664 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                      5.519      1.032   5.346
## PNN_pos_PV_intensity_IL_c                       -1.817      3.470  -0.524
## RearingMS                                       -3.137      1.207  -2.599
## HousingSI                                        2.686      1.204   2.230
## PNN_pos_PV_intensity_IL_c:RearingMS              5.801      4.169   1.391
## PNN_pos_PV_intensity_IL_c:HousingSI             -1.120      4.503  -0.249
## PNN_pos_PV_intensity_IL_c:RearingMS:HousingSI   -7.811      6.250  -1.250
##                                               Pr(>|t|)    
## (Intercept)                                   6.64e-06 ***
## PNN_pos_PV_intensity_IL_c                       0.6041    
## RearingMS                                       0.0139 *  
## HousingSI                                       0.0326 *  
## PNN_pos_PV_intensity_IL_c:RearingMS             0.1734    
## PNN_pos_PV_intensity_IL_c:HousingSI             0.8051    
## PNN_pos_PV_intensity_IL_c:RearingMS:HousingSI   0.2202    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.583 on 33 degrees of freedom
## Multiple R-squared:  0.3438, Adjusted R-squared:  0.2245 
## F-statistic: 2.882 on 6 and 33 DF,  p-value: 0.02271
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: freq_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 2.88, p = 0.02
## R² = 0.34
## Adj. R² = 0.22 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------------------
##                                                        Est.   S.E.   t val.      p
## --------------------------------------------------- ------- ------ -------- ------
## (Intercept)                                            5.52   1.03     5.35   0.00
## PNN_pos_PV_intensity_IL_c                             -1.82   3.47    -0.52   0.60
## RearingMS                                             -3.14   1.21    -2.60   0.01
## HousingSI                                              2.69   1.20     2.23   0.03
## PNN_pos_PV_intensity_IL_c:RearingMS                    5.80   4.17     1.39   0.17
## PNN_pos_PV_intensity_IL_c:HousingSI                   -1.12   4.50    -0.25   0.81
## PNN_pos_PV_intensity_IL_c:RearingMS:HousingSI         -7.81   6.25    -1.25   0.22
## ----------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: freq_open
##                                           Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_intensity_IL_c                  1   0.10   0.104  0.0081 0.92879  
## Rearing                                    1  65.07  65.071  5.0690 0.03114 *
## Housing                                    1  76.27  76.266  5.9411 0.02035 *
## PNN_pos_PV_intensity_IL_c:Rearing          1  25.68  25.681  2.0005 0.16661  
## PNN_pos_PV_intensity_IL_c:Housing          1  34.81  34.808  2.7115 0.10912  
## PNN_pos_PV_intensity_IL_c:Rearing:Housing  1  20.05  20.046  1.5616 0.22023  
## Residuals                                 33 423.62  12.837                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##    Min     1Q Median     3Q    Max 
## -6.973 -1.697 -0.184  1.933  8.619 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                     5.4659     1.1082   4.932
## PV_pos_PNN_intensity_IL_c                      -0.6148     2.6198  -0.235
## RearingMS                                      -3.2369     1.4540  -2.226
## HousingSI                                       1.9020     1.4218   1.338
## PV_pos_PNN_intensity_IL_c:RearingMS             2.4752     3.1351   0.790
## PV_pos_PNN_intensity_IL_c:HousingSI             4.6083     3.8357   1.201
## PV_pos_PNN_intensity_IL_c:RearingMS:HousingSI -10.0280     5.8893  -1.703
##                                               Pr(>|t|)    
## (Intercept)                                   2.25e-05 ***
## PV_pos_PNN_intensity_IL_c                       0.8159    
## RearingMS                                       0.0329 *  
## HousingSI                                       0.1901    
## PV_pos_PNN_intensity_IL_c:RearingMS             0.4355    
## PV_pos_PNN_intensity_IL_c:HousingSI             0.2381    
## PV_pos_PNN_intensity_IL_c:RearingMS:HousingSI   0.0980 .  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.709 on 33 degrees of freedom
## Multiple R-squared:  0.297,  Adjusted R-squared:  0.1692 
## F-statistic: 2.324 on 6 and 33 DF,  p-value: 0.05559
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: freq_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 2.32, p = 0.06
## R² = 0.30
## Adj. R² = 0.17 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------------------
##                                                         Est.   S.E.   t val.      p
## --------------------------------------------------- -------- ------ -------- ------
## (Intercept)                                             5.47   1.11     4.93   0.00
## PV_pos_PNN_intensity_IL_c                              -0.61   2.62    -0.23   0.82
## RearingMS                                              -3.24   1.45    -2.23   0.03
## HousingSI                                               1.90   1.42     1.34   0.19
## PV_pos_PNN_intensity_IL_c:RearingMS                     2.48   3.14     0.79   0.44
## PV_pos_PNN_intensity_IL_c:HousingSI                     4.61   3.84     1.20   0.24
## PV_pos_PNN_intensity_IL_c:RearingMS:HousingSI         -10.03   5.89    -1.70   0.10
## -----------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: freq_open
##                                           Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_pos_PNN_intensity_IL_c                  1   5.35   5.351  0.3891 0.53707  
## Rearing                                    1  59.76  59.756  4.3449 0.04494 *
## Housing                                    1  85.75  85.754  6.2352 0.01769 *
## PV_pos_PNN_intensity_IL_c:Rearing          1   0.99   0.992  0.0721 0.78995  
## PV_pos_PNN_intensity_IL_c:Housing          1   0.02   0.023  0.0017 0.96750  
## PV_pos_PNN_intensity_IL_c:Rearing:Housing  1  39.87  39.875  2.8993 0.09802 .
## Residuals                                 33 453.85  13.753                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## [[1]]
## Analysis of Variance Table
## 
## Response: freq_open
##                               Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_count_PL_c                  1  59.17  59.172  4.4685 0.04217 *
## Rearing                        1  34.52  34.525  2.6072 0.11590  
## Housing                        1  85.48  85.483  6.4554 0.01595 *
## PV_count_PL_c:Rearing          1   0.68   0.677  0.0511 0.82251  
## PV_count_PL_c:Housing          1   0.43   0.432  0.0327 0.85771  
## PV_count_PL_c:Rearing:Housing  1  28.32  28.320  2.1387 0.15309  
## Residuals                     33 436.99  13.242                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[2]]
## Analysis of Variance Table
## 
## Response: freq_open
##                                   Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_intensity_PL_c                  1   0.97   0.969  0.0671 0.79718  
## Rearing                            1  67.82  67.821  4.6959 0.03755 *
## Housing                            1  73.77  73.773  5.1080 0.03054 *
## PV_intensity_PL_c:Rearing          1  11.40  11.401  0.7894 0.38072  
## PV_intensity_PL_c:Housing          1  12.13  12.132  0.8400 0.36605  
## PV_intensity_PL_c:Rearing:Housing  1   2.89   2.894  0.2004 0.65734  
## Residuals                         33 476.61  14.443                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[3]]
## Analysis of Variance Table
## 
## Response: freq_open
##                                Df Sum Sq Mean Sq F value   Pr(>F)   
## PNN_count_PL_c                  1  43.19  43.192  3.2256 0.081656 . 
## Rearing                         1  41.08  41.079  3.0678 0.089148 . 
## Housing                         1 100.77 100.769  7.5255 0.009757 **
## PNN_count_PL_c:Rearing          1  13.51  13.506  1.0086 0.322537   
## PNN_count_PL_c:Housing          1   0.32   0.325  0.0243 0.877189   
## PNN_count_PL_c:Rearing:Housing  1   4.85   4.849  0.3621 0.551453   
## Residuals                      33 441.88  13.390                    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[4]]
## Analysis of Variance Table
## 
## Response: freq_open
##                                    Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_intensity_PL_c                  1  10.02  10.019  0.7142 0.40413  
## Rearing                             1  56.12  56.119  4.0004 0.05378 .
## Housing                             1  92.19  92.192  6.5719 0.01510 *
## PNN_intensity_PL_c:Rearing          1   3.30   3.301  0.2353 0.63080  
## PNN_intensity_PL_c:Housing          1  19.56  19.564  1.3946 0.24607  
## PNN_intensity_PL_c:Rearing:Housing  1   1.47   1.471  0.1048 0.74814  
## Residuals                          33 462.93  14.028                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[5]]
## Analysis of Variance Table
## 
## Response: freq_open
##                                       Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_count_PL_c                  1  46.28  46.277  3.3753 0.07520 .
## Rearing                                1  39.11  39.110  2.8525 0.10066  
## Housing                                1 101.20 101.204  7.3815 0.01041 *
## PNN_pos_PV_count_PL_c:Rearing          1   1.22   1.221  0.0891 0.76725  
## PNN_pos_PV_count_PL_c:Housing          1   0.04   0.042  0.0031 0.95611  
## PNN_pos_PV_count_PL_c:Rearing:Housing  1   5.30   5.297  0.3863 0.53851  
## Residuals                             33 452.45  13.711                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[6]]
## Analysis of Variance Table
## 
## Response: freq_open
##                                           Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_intensity_PL_c                  1   3.27   3.270  0.2268 0.63707  
## Rearing                                    1  69.37  69.366  4.8107 0.03544 *
## Housing                                    1  73.03  73.035  5.0651 0.03120 *
## PNN_pos_PV_intensity_PL_c:Rearing          1  23.32  23.323  1.6175 0.21233  
## PNN_pos_PV_intensity_PL_c:Housing          1   0.68   0.684  0.0474 0.82894  
## PNN_pos_PV_intensity_PL_c:Rearing:Housing  1   0.09   0.094  0.0065 0.93615  
## Residuals                                 33 475.83  14.419                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[7]]
## Analysis of Variance Table
## 
## Response: freq_open
##                                           Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_pos_PNN_intensity_PL_c                  1  10.75  10.752  0.7633 0.38860  
## Rearing                                    1  55.88  55.877  3.9670 0.05473 .
## Housing                                    1  95.09  95.086  6.7506 0.01390 *
## PV_pos_PNN_intensity_PL_c:Rearing          1   2.77   2.769  0.1966 0.66039  
## PV_pos_PNN_intensity_PL_c:Housing          1  14.67  14.668  1.0414 0.31492  
## PV_pos_PNN_intensity_PL_c:Rearing:Housing  1   1.62   1.622  0.1151 0.73653  
## Residuals                                 33 464.83  14.086                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[8]]
## Analysis of Variance Table
## 
## Response: freq_open
##                               Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_count_IL_c                  1  27.37  27.373  1.9996 0.16671  
## Rearing                        1  43.06  43.055  3.1451 0.08539 .
## Housing                        1  72.65  72.648  5.3068 0.02768 *
## PV_count_IL_c:Rearing          1  27.46  27.462  2.0060 0.16605  
## PV_count_IL_c:Housing          1   9.89   9.887  0.7222 0.40154  
## PV_count_IL_c:Rearing:Housing  1  13.41  13.412  0.9797 0.32948  
## Residuals                     33 451.76  13.690                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[9]]
## Analysis of Variance Table
## 
## Response: freq_open
##                                   Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_intensity_IL_c                  1   0.45   0.449  0.0315 0.86012  
## Rearing                            1  64.27  64.274  4.5149 0.04118 *
## Housing                            1  76.18  76.175  5.3509 0.02709 *
## PV_intensity_IL_c:Rearing          1  12.30  12.298  0.8639 0.35941  
## PV_intensity_IL_c:Housing          1  20.75  20.754  1.4579 0.23585  
## PV_intensity_IL_c:Rearing:Housing  1   1.86   1.865  0.1310 0.71972  
## Residuals                         33 469.78  14.236                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[10]]
## Analysis of Variance Table
## 
## Response: freq_open
##                                Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_count_IL_c                  1  32.31  32.310  2.2419 0.14382  
## Rearing                         1  38.27  38.270  2.6555 0.11270  
## Housing                         1  94.26  94.257  6.5402 0.01533 *
## PNN_count_IL_c:Rearing          1   4.68   4.682  0.3249 0.57256  
## PNN_count_IL_c:Housing          1   0.00   0.000  0.0000 0.99841  
## PNN_count_IL_c:Rearing:Housing  1   0.49   0.487  0.0338 0.85527  
## Residuals                      33 475.59  14.412                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[11]]
## Analysis of Variance Table
## 
## Response: freq_open
##                                    Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_intensity_IL_c                  1   3.60   3.601  0.2597 0.61371  
## Rearing                             1  61.24  61.236  4.4164 0.04331 *
## Housing                             1  86.26  86.262  6.2213 0.01781 *
## PNN_intensity_IL_c:Rearing          1   4.62   4.615  0.3328 0.56791  
## PNN_intensity_IL_c:Housing          1   0.57   0.574  0.0414 0.84008  
## PNN_intensity_IL_c:Rearing:Housing  1  31.75  31.745  2.2895 0.13977  
## Residuals                          33 457.57  13.866                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[12]]
## Analysis of Variance Table
## 
## Response: freq_open
##                                       Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_count_IL_c                  1  38.20  38.204  2.6585 0.11251  
## Rearing                                1  35.86  35.861  2.4955 0.12371  
## Housing                                1  83.43  83.434  5.8059 0.02171 *
## PNN_pos_PV_count_IL_c:Rearing          1   1.80   1.798  0.1251 0.72581  
## PNN_pos_PV_count_IL_c:Housing          1   8.49   8.491  0.5909 0.44755  
## PNN_pos_PV_count_IL_c:Rearing:Housing  1   3.58   3.583  0.2493 0.62088  
## Residuals                             33 474.23  14.371                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[13]]
## Analysis of Variance Table
## 
## Response: freq_open
##                                           Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_intensity_IL_c                  1   0.10   0.104  0.0081 0.92879  
## Rearing                                    1  65.07  65.071  5.0690 0.03114 *
## Housing                                    1  76.27  76.266  5.9411 0.02035 *
## PNN_pos_PV_intensity_IL_c:Rearing          1  25.68  25.681  2.0005 0.16661  
## PNN_pos_PV_intensity_IL_c:Housing          1  34.81  34.808  2.7115 0.10912  
## PNN_pos_PV_intensity_IL_c:Rearing:Housing  1  20.05  20.046  1.5616 0.22023  
## Residuals                                 33 423.62  12.837                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[14]]
## Analysis of Variance Table
## 
## Response: freq_open
##                                           Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_pos_PNN_intensity_IL_c                  1   5.35   5.351  0.3891 0.53707  
## Rearing                                    1  59.76  59.756  4.3449 0.04494 *
## Housing                                    1  85.75  85.754  6.2352 0.01769 *
## PV_pos_PNN_intensity_IL_c:Rearing          1   0.99   0.992  0.0721 0.78995  
## PV_pos_PNN_intensity_IL_c:Housing          1   0.02   0.023  0.0017 0.96750  
## PV_pos_PNN_intensity_IL_c:Rearing:Housing  1  39.87  39.875  2.8993 0.09802 .
## Residuals                                 33 453.85  13.753                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

Female - Head poke duration

# Returning summary, summ, and anova stats for every linear model in the femalelm_head_poke_duration list
lapply(femalelm_head_poke_duration, function(x){
    print(summary(x))
    print(summ(x))
    print(anova(x))
})
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -43.742 -19.356  -1.821  16.929  68.845 
## 
## Coefficients:
##                                    Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                        69.76312    8.46496   8.241 1.62e-09 ***
## PV_count_PL_c                       0.99603    1.19599   0.833   0.4109    
## RearingMS                          19.56951   10.07308   1.943   0.0606 .  
## HousingSI                         -22.84480   10.08532  -2.265   0.0302 *  
## PV_count_PL_c:RearingMS            -1.29207    1.47230  -0.878   0.3865    
## PV_count_PL_c:HousingSI            -0.71726    1.38881  -0.516   0.6090    
## PV_count_PL_c:RearingMS:HousingSI  -0.01752    1.87174  -0.009   0.9926    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 29.1 on 33 degrees of freedom
## Multiple R-squared:  0.2727, Adjusted R-squared:  0.1405 
## F-statistic: 2.063 on 6 and 33 DF,  p-value: 0.08482
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: head_poke_duration
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 2.06, p = 0.08
## R² = 0.27
## Adj. R² = 0.14 
## 
## Standard errors: OLS
## ------------------------------------------------------------------------
##                                             Est.    S.E.   t val.      p
## --------------------------------------- -------- ------- -------- ------
## (Intercept)                                69.76    8.46     8.24   0.00
## PV_count_PL_c                               1.00    1.20     0.83   0.41
## RearingMS                                  19.57   10.07     1.94   0.06
## HousingSI                                 -22.84   10.09    -2.27   0.03
## PV_count_PL_c:RearingMS                    -1.29    1.47    -0.88   0.39
## PV_count_PL_c:HousingSI                    -0.72    1.39    -0.52   0.61
## PV_count_PL_c:RearingMS:HousingSI          -0.02    1.87    -0.01   0.99
## ------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                               Df  Sum Sq Mean Sq F value  Pr(>F)  
## PV_count_PL_c                  1   752.3   752.3  0.8884 0.35275  
## Rearing                        1  3760.1  3760.1  4.4405 0.04278 *
## Housing                        1  3898.6  3898.6  4.6041 0.03935 *
## PV_count_PL_c:Rearing          1  1500.0  1500.0  1.7715 0.19232  
## PV_count_PL_c:Housing          1   568.1   568.1  0.6709 0.41861  
## PV_count_PL_c:Rearing:Housing  1     0.1     0.1  0.0001 0.99259  
## Residuals                     33 27943.5   846.8                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -48.121 -18.188  -0.646  17.866  66.696 
## 
## Coefficients:
##                                       Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                             69.406      7.836   8.857 3.09e-10 ***
## PV_intensity_PL_c                       -5.216     25.468  -0.205   0.8390    
## RearingMS                               21.787      9.329   2.335   0.0258 *  
## HousingSI                              -23.423      9.288  -2.522   0.0167 *  
## PV_intensity_PL_c:RearingMS             12.371     29.522   0.419   0.6779    
## PV_intensity_PL_c:HousingSI             46.841     32.317   1.449   0.1567    
## PV_intensity_PL_c:RearingMS:HousingSI  -71.062     42.477  -1.673   0.1038    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 28.1 on 33 degrees of freedom
## Multiple R-squared:  0.3216, Adjusted R-squared:  0.1982 
## F-statistic: 2.607 on 6 and 33 DF,  p-value: 0.03521
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: head_poke_duration
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 2.61, p = 0.04
## R² = 0.32
## Adj. R² = 0.20 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------------
##                                                 Est.    S.E.   t val.      p
## ------------------------------------------- -------- ------- -------- ------
## (Intercept)                                    69.41    7.84     8.86   0.00
## PV_intensity_PL_c                              -5.22   25.47    -0.20   0.84
## RearingMS                                      21.79    9.33     2.34   0.03
## HousingSI                                     -23.42    9.29    -2.52   0.02
## PV_intensity_PL_c:RearingMS                    12.37   29.52     0.42   0.68
## PV_intensity_PL_c:HousingSI                    46.84   32.32     1.45   0.16
## PV_intensity_PL_c:RearingMS:HousingSI         -71.06   42.48    -1.67   0.10
## ----------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                   Df  Sum Sq Mean Sq F value  Pr(>F)  
## PV_intensity_PL_c                  1   476.9   476.9  0.6038 0.44267  
## Rearing                            1  4935.3  4935.3  6.2481 0.01758 *
## Housing                            1  3580.7  3580.7  4.5332 0.04080 *
## PV_intensity_PL_c:Rearing          1  1099.3  1099.3  1.3917 0.24655  
## PV_intensity_PL_c:Housing          1    53.6    53.6  0.0678 0.79613  
## PV_intensity_PL_c:Rearing:Housing  1  2210.7  2210.7  2.7988 0.10379  
## Residuals                         33 26066.3   789.9                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -40.701 -17.314  -4.796  17.825  68.721 
## 
## Coefficients:
##                                    Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                         74.2560     8.4658   8.771 3.88e-10 ***
## PNN_count_PL_c                      -0.6888     1.3138  -0.524  0.60358    
## RearingMS                           15.7616    10.3398   1.524  0.13694    
## HousingSI                          -28.1055    10.1915  -2.758  0.00941 ** 
## PNN_count_PL_c:RearingMS            -0.6790     1.9551  -0.347  0.73059    
## PNN_count_PL_c:HousingSI             1.6887     1.7098   0.988  0.33051    
## PNN_count_PL_c:RearingMS:HousingSI  -2.6668     2.8805  -0.926  0.36127    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 28.56 on 33 degrees of freedom
## Multiple R-squared:  0.2994, Adjusted R-squared:  0.1721 
## F-statistic: 2.351 on 6 and 33 DF,  p-value: 0.0532
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: head_poke_duration
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 2.35, p = 0.05
## R² = 0.30
## Adj. R² = 0.17 
## 
## Standard errors: OLS
## -------------------------------------------------------------------------
##                                              Est.    S.E.   t val.      p
## ---------------------------------------- -------- ------- -------- ------
## (Intercept)                                 74.26    8.47     8.77   0.00
## PNN_count_PL_c                              -0.69    1.31    -0.52   0.60
## RearingMS                                   15.76   10.34     1.52   0.14
## HousingSI                                  -28.11   10.19    -2.76   0.01
## PNN_count_PL_c:RearingMS                    -0.68    1.96    -0.35   0.73
## PNN_count_PL_c:HousingSI                     1.69    1.71     0.99   0.33
## PNN_count_PL_c:RearingMS:HousingSI          -2.67    2.88    -0.93   0.36
## -------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_count_PL_c                  1   662.8   662.8  0.8126 0.37390  
## Rearing                         1  3854.8  3854.8  4.7259 0.03699 *
## Housing                         1  4227.0  4227.0  5.1823 0.02943 *
## PNN_count_PL_c:Rearing          1  1844.2  1844.2  2.2610 0.14218  
## PNN_count_PL_c:Housing          1   217.7   217.7  0.2669 0.60887  
## PNN_count_PL_c:Rearing:Housing  1   699.1   699.1  0.8571 0.36127  
## Residuals                      33 26917.2   815.7                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -46.575 -21.331  -0.849  17.467  75.033 
## 
## Coefficients:
##                                        Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                              72.698      9.605   7.568 1.05e-08 ***
## PNN_intensity_PL_c                      -12.217     28.929  -0.422   0.6755    
## RearingMS                                14.569     12.073   1.207   0.2361    
## HousingSI                               -22.412     11.729  -1.911   0.0647 .  
## PNN_intensity_PL_c:RearingMS             25.127     33.824   0.743   0.4628    
## PNN_intensity_PL_c:HousingSI              9.973     35.531   0.281   0.7807    
## PNN_intensity_PL_c:RearingMS:HousingSI  -45.430     58.116  -0.782   0.4400    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 29.81 on 33 degrees of freedom
## Multiple R-squared:  0.2369, Adjusted R-squared:  0.09814 
## F-statistic: 1.707 on 6 and 33 DF,  p-value: 0.1503
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: head_poke_duration
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 1.71, p = 0.15
## R² = 0.24
## Adj. R² = 0.10 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------------
##                                                  Est.    S.E.   t val.      p
## -------------------------------------------- -------- ------- -------- ------
## (Intercept)                                     72.70    9.61     7.57   0.00
## PNN_intensity_PL_c                             -12.22   28.93    -0.42   0.68
## RearingMS                                       14.57   12.07     1.21   0.24
## HousingSI                                      -22.41   11.73    -1.91   0.06
## PNN_intensity_PL_c:RearingMS                    25.13   33.82     0.74   0.46
## PNN_intensity_PL_c:HousingSI                     9.97   35.53     0.28   0.78
## PNN_intensity_PL_c:RearingMS:HousingSI         -45.43   58.12    -0.78   0.44
## -----------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                    Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_intensity_PL_c                  1     7.2     7.2  0.0081 0.92869  
## Rearing                             1  4862.9  4862.9  5.4730 0.02551 *
## Housing                             1  3395.5  3395.5  3.8215 0.05911 .
## PNN_intensity_PL_c:Rearing          1   168.9   168.9  0.1901 0.66565  
## PNN_intensity_PL_c:Housing          1   124.3   124.3  0.1399 0.71080  
## PNN_intensity_PL_c:Rearing:Housing  1   543.0   543.0  0.6111 0.43996  
## Residuals                          33 29321.1   888.5                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -41.715 -20.143  -1.283  15.510  73.264 
## 
## Coefficients:
##                                           Estimate Std. Error t value Pr(>|t|)
## (Intercept)                                 73.948      8.743   8.458    9e-10
## PNN_pos_PV_count_PL_c                       -1.172      2.180  -0.538   0.5944
## RearingMS                                   15.327     10.638   1.441   0.1591
## HousingSI                                  -27.777     10.571  -2.628   0.0129
## PNN_pos_PV_count_PL_c:RearingMS              0.973      2.655   0.366   0.7164
## PNN_pos_PV_count_PL_c:HousingSI              2.210      2.703   0.818   0.4194
## PNN_pos_PV_count_PL_c:RearingMS:HousingSI   -4.702      3.785  -1.242   0.2229
##                                              
## (Intercept)                               ***
## PNN_pos_PV_count_PL_c                        
## RearingMS                                    
## HousingSI                                 *  
## PNN_pos_PV_count_PL_c:RearingMS              
## PNN_pos_PV_count_PL_c:HousingSI              
## PNN_pos_PV_count_PL_c:RearingMS:HousingSI    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 29.08 on 33 degrees of freedom
## Multiple R-squared:  0.2735, Adjusted R-squared:  0.1415 
## F-statistic: 2.071 on 6 and 33 DF,  p-value: 0.08367
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: head_poke_duration
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 2.07, p = 0.08
## R² = 0.27
## Adj. R² = 0.14 
## 
## Standard errors: OLS
## --------------------------------------------------------------------------------
##                                                     Est.    S.E.   t val.      p
## ----------------------------------------------- -------- ------- -------- ------
## (Intercept)                                        73.95    8.74     8.46   0.00
## PNN_pos_PV_count_PL_c                              -1.17    2.18    -0.54   0.59
## RearingMS                                          15.33   10.64     1.44   0.16
## HousingSI                                         -27.78   10.57    -2.63   0.01
## PNN_pos_PV_count_PL_c:RearingMS                     0.97    2.66     0.37   0.72
## PNN_pos_PV_count_PL_c:HousingSI                     2.21    2.70     0.82   0.42
## PNN_pos_PV_count_PL_c:RearingMS:HousingSI          -4.70    3.79    -1.24   0.22
## --------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                       Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_count_PL_c                  1   629.9   629.9  0.7447 0.39438  
## Rearing                                1  3866.9  3866.9  4.5717 0.04000 *
## Housing                                1  4165.6  4165.6  4.9248 0.03346 *
## PNN_pos_PV_count_PL_c:Rearing          1   512.1   512.1  0.6054 0.44207  
## PNN_pos_PV_count_PL_c:Housing          1    30.4    30.4  0.0360 0.85069  
## PNN_pos_PV_count_PL_c:Rearing:Housing  1  1305.4  1305.4  1.5433 0.22288  
## Residuals                             33 27912.5   845.8                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -46.081 -20.677  -1.364  14.200  67.059 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                     71.610      8.075   8.868
## PNN_pos_PV_intensity_PL_c                       14.046     22.201   0.633
## RearingMS                                       19.218      9.564   2.009
## HousingSI                                      -24.816      9.505  -2.611
## PNN_pos_PV_intensity_PL_c:RearingMS            -12.599     26.255  -0.480
## PNN_pos_PV_intensity_PL_c:HousingSI             10.500     26.287   0.399
## PNN_pos_PV_intensity_PL_c:RearingMS:HousingSI  -31.450     34.760  -0.905
##                                               Pr(>|t|)    
## (Intercept)                                   2.99e-10 ***
## PNN_pos_PV_intensity_PL_c                       0.5313    
## RearingMS                                       0.0527 .  
## HousingSI                                       0.0135 *  
## PNN_pos_PV_intensity_PL_c:RearingMS             0.6345    
## PNN_pos_PV_intensity_PL_c:HousingSI             0.6921    
## PNN_pos_PV_intensity_PL_c:RearingMS:HousingSI   0.3721    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 28.32 on 33 degrees of freedom
## Multiple R-squared:  0.3111, Adjusted R-squared:  0.1858 
## F-statistic: 2.484 on 6 and 33 DF,  p-value: 0.04296
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: head_poke_duration
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 2.48, p = 0.04
## R² = 0.31
## Adj. R² = 0.19 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------------
##                                                         Est.    S.E.   t val.
## --------------------------------------------------- -------- ------- --------
## (Intercept)                                            71.61    8.07     8.87
## PNN_pos_PV_intensity_PL_c                              14.05   22.20     0.63
## RearingMS                                              19.22    9.56     2.01
## HousingSI                                             -24.82    9.51    -2.61
## PNN_pos_PV_intensity_PL_c:RearingMS                   -12.60   26.26    -0.48
## PNN_pos_PV_intensity_PL_c:HousingSI                    10.50   26.29     0.40
## PNN_pos_PV_intensity_PL_c:RearingMS:HousingSI         -31.45   34.76    -0.90
## -----------------------------------------------------------------------------
##  
## ----------------------------------------------------------
##                                                          p
## --------------------------------------------------- ------
## (Intercept)                                           0.00
## PNN_pos_PV_intensity_PL_c                             0.53
## RearingMS                                             0.05
## HousingSI                                             0.01
## PNN_pos_PV_intensity_PL_c:RearingMS                   0.63
## PNN_pos_PV_intensity_PL_c:HousingSI                   0.69
## PNN_pos_PV_intensity_PL_c:RearingMS:HousingSI         0.37
## ----------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                           Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_intensity_PL_c                  1   344.4   344.4  0.4293 0.51686  
## Rearing                                    1  4859.1  4859.1  6.0577 0.01924 *
## Housing                                    1  3612.7  3612.7  4.5039 0.04141 *
## PNN_pos_PV_intensity_PL_c:Rearing          1  2335.9  2335.9  2.9121 0.09731 .
## PNN_pos_PV_intensity_PL_c:Housing          1   143.8   143.8  0.1793 0.67469  
## PNN_pos_PV_intensity_PL_c:Rearing:Housing  1   656.7   656.7  0.8187 0.37213  
## Residuals                                 33 26470.2   802.1                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -47.918 -18.996  -1.529  16.898  74.881 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                     73.141      9.607   7.613
## PV_pos_PNN_intensity_PL_c                      -13.534     24.537  -0.552
## RearingMS                                       15.181     11.728   1.294
## HousingSI                                      -22.748     11.425  -1.991
## PV_pos_PNN_intensity_PL_c:RearingMS             23.157     29.160   0.794
## PV_pos_PNN_intensity_PL_c:HousingSI             12.360     30.398   0.407
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI  -39.542     48.507  -0.815
##                                               Pr(>|t|)    
## (Intercept)                                   9.23e-09 ***
## PV_pos_PNN_intensity_PL_c                       0.5850    
## RearingMS                                       0.2045    
## HousingSI                                       0.0548 .  
## PV_pos_PNN_intensity_PL_c:RearingMS             0.4328    
## PV_pos_PNN_intensity_PL_c:HousingSI             0.6869    
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI   0.4208    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 29.83 on 33 degrees of freedom
## Multiple R-squared:  0.2357, Adjusted R-squared:  0.09672 
## F-statistic: 1.696 on 6 and 33 DF,  p-value: 0.1531
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: head_poke_duration
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 1.70, p = 0.15
## R² = 0.24
## Adj. R² = 0.10 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------------
##                                                         Est.    S.E.   t val.
## --------------------------------------------------- -------- ------- --------
## (Intercept)                                            73.14    9.61     7.61
## PV_pos_PNN_intensity_PL_c                             -13.53   24.54    -0.55
## RearingMS                                              15.18   11.73     1.29
## HousingSI                                             -22.75   11.42    -1.99
## PV_pos_PNN_intensity_PL_c:RearingMS                    23.16   29.16     0.79
## PV_pos_PNN_intensity_PL_c:HousingSI                    12.36   30.40     0.41
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI         -39.54   48.51    -0.82
## -----------------------------------------------------------------------------
##  
## ----------------------------------------------------------
##                                                          p
## --------------------------------------------------- ------
## (Intercept)                                           0.00
## PV_pos_PNN_intensity_PL_c                             0.58
## RearingMS                                             0.20
## HousingSI                                             0.05
## PV_pos_PNN_intensity_PL_c:RearingMS                   0.43
## PV_pos_PNN_intensity_PL_c:HousingSI                   0.69
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI         0.42
## ----------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                           Df  Sum Sq Mean Sq F value  Pr(>F)  
## PV_pos_PNN_intensity_PL_c                  1     2.4     2.4  0.0027 0.95874  
## Rearing                                    1  4798.1  4798.1  5.3917 0.02655 *
## Housing                                    1  3474.3  3474.3  3.9040 0.05658 .
## PV_pos_PNN_intensity_PL_c:Rearing          1   142.8   142.8  0.1605 0.69131  
## PV_pos_PNN_intensity_PL_c:Housing          1    46.6    46.6  0.0523 0.82050  
## PV_pos_PNN_intensity_PL_c:Rearing:Housing  1   591.4   591.4  0.6645 0.42081  
## Residuals                                 33 29367.2   889.9                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -46.872 -15.668  -1.014  11.026  69.977 
## 
## Coefficients:
##                                   Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                        69.1411     8.1164   8.519 7.63e-10 ***
## PV_count_IL_c                       1.3510     0.9364   1.443   0.1585    
## RearingMS                          21.0671     9.7258   2.166   0.0376 *  
## HousingSI                         -21.3748     9.7258  -2.198   0.0351 *  
## PV_count_IL_c:RearingMS            -0.7965     1.5958  -0.499   0.6210    
## PV_count_IL_c:HousingSI            -1.2353     1.2014  -1.028   0.3113    
## PV_count_IL_c:RearingMS:HousingSI  -0.6778     2.0290  -0.334   0.7405    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 28.34 on 33 degrees of freedom
## Multiple R-squared:  0.3102, Adjusted R-squared:  0.1848 
## F-statistic: 2.473 on 6 and 33 DF,  p-value: 0.04366
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: head_poke_duration
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 2.47, p = 0.04
## R² = 0.31
## Adj. R² = 0.18 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------
##                                             Est.   S.E.   t val.      p
## --------------------------------------- -------- ------ -------- ------
## (Intercept)                                69.14   8.12     8.52   0.00
## PV_count_IL_c                               1.35   0.94     1.44   0.16
## RearingMS                                  21.07   9.73     2.17   0.04
## HousingSI                                 -21.37   9.73    -2.20   0.04
## PV_count_IL_c:RearingMS                    -0.80   1.60    -0.50   0.62
## PV_count_IL_c:HousingSI                    -1.24   1.20    -1.03   0.31
## PV_count_IL_c:RearingMS:HousingSI          -0.68   2.03    -0.33   0.74
## -----------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                               Df  Sum Sq Mean Sq F value  Pr(>F)  
## PV_count_IL_c                  1   632.9   632.9  0.7880 0.38112  
## Rearing                        1  3841.2  3841.2  4.7827 0.03594 *
## Housing                        1  3817.2  3817.2  4.7529 0.03649 *
## PV_count_IL_c:Rearing          1  1414.9  1414.9  1.7617 0.19352  
## PV_count_IL_c:Housing          1  2123.2  2123.2  2.6436 0.11348  
## PV_count_IL_c:Rearing:Housing  1    89.6    89.6  0.1116 0.74046  
## Residuals                     33 26503.7   803.1                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -47.432 -21.803  -0.152  17.598  60.749 
## 
## Coefficients:
##                                       Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                             68.390      9.348   7.316 2.13e-08 ***
## PV_intensity_IL_c                       -6.747     45.927  -0.147   0.8841    
## RearingMS                               23.609     10.272   2.298   0.0280 *  
## HousingSI                              -18.879     10.281  -1.836   0.0753 .  
## PV_intensity_IL_c:RearingMS            -20.367     54.104  -0.376   0.7090    
## PV_intensity_IL_c:HousingSI             29.047     59.056   0.492   0.6261    
## PV_intensity_IL_c:RearingMS:HousingSI   12.386     72.712   0.170   0.8658    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 29.57 on 33 degrees of freedom
## Multiple R-squared:  0.2493, Adjusted R-squared:  0.1128 
## F-statistic: 1.826 on 6 and 33 DF,  p-value: 0.1243
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: head_poke_duration
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 1.83, p = 0.12
## R² = 0.25
## Adj. R² = 0.11 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------------
##                                                 Est.    S.E.   t val.      p
## ------------------------------------------- -------- ------- -------- ------
## (Intercept)                                    68.39    9.35     7.32   0.00
## PV_intensity_IL_c                              -6.75   45.93    -0.15   0.88
## RearingMS                                      23.61   10.27     2.30   0.03
## HousingSI                                     -18.88   10.28    -1.84   0.08
## PV_intensity_IL_c:RearingMS                   -20.37   54.10    -0.38   0.71
## PV_intensity_IL_c:HousingSI                    29.05   59.06     0.49   0.63
## PV_intensity_IL_c:RearingMS:HousingSI          12.39   72.71     0.17   0.87
## ----------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                   Df  Sum Sq Mean Sq F value  Pr(>F)  
## PV_intensity_IL_c                  1   170.1   170.1  0.1946 0.66201  
## Rearing                            1  4337.0  4337.0  4.9616 0.03285 *
## Housing                            1  3761.6  3761.6  4.3034 0.04591 *
## PV_intensity_IL_c:Rearing          1   360.0   360.0  0.4119 0.52544  
## PV_intensity_IL_c:Housing          1   923.1   923.1  1.0560 0.31161  
## PV_intensity_IL_c:Rearing:Housing  1    25.4    25.4  0.0290 0.86578  
## Residuals                         33 28845.7   874.1                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -40.289 -20.955  -1.462  16.902  75.002 
## 
## Coefficients:
##                                    Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                         72.1037     9.9154   7.272 2.42e-08 ***
## PNN_count_IL_c                      -0.1528     1.4143  -0.108    0.915    
## RearingMS                           16.9599    11.0971   1.528    0.136    
## HousingSI                          -23.9637    11.0232  -2.174    0.037 *  
## PNN_count_IL_c:RearingMS            -0.2942     2.4613  -0.120    0.906    
## PNN_count_IL_c:HousingSI             0.8699     1.6977   0.512    0.612    
## PNN_count_IL_c:RearingMS:HousingSI  -1.6954     3.0050  -0.564    0.576    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 29.58 on 33 degrees of freedom
## Multiple R-squared:  0.2486, Adjusted R-squared:  0.112 
## F-statistic:  1.82 on 6 and 33 DF,  p-value: 0.1255
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: head_poke_duration
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 1.82, p = 0.13
## R² = 0.25
## Adj. R² = 0.11 
## 
## Standard errors: OLS
## -------------------------------------------------------------------------
##                                              Est.    S.E.   t val.      p
## ---------------------------------------- -------- ------- -------- ------
## (Intercept)                                 72.10    9.92     7.27   0.00
## PNN_count_IL_c                              -0.15    1.41    -0.11   0.91
## RearingMS                                   16.96   11.10     1.53   0.14
## HousingSI                                  -23.96   11.02    -2.17   0.04
## PNN_count_IL_c:RearingMS                    -0.29    2.46    -0.12   0.91
## PNN_count_IL_c:HousingSI                     0.87    1.70     0.51   0.61
## PNN_count_IL_c:RearingMS:HousingSI          -1.70    3.01    -0.56   0.58
## -------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_count_IL_c                  1   235.2   235.2  0.2689 0.60756  
## Rearing                         1  4471.7  4471.7  5.1114 0.03049 *
## Housing                         1  3560.5  3560.5  4.0699 0.05185 .
## PNN_count_IL_c:Rearing          1   975.4   975.4  1.1149 0.29868  
## PNN_count_IL_c:Housing          1    31.6    31.6  0.0362 0.85037  
## PNN_count_IL_c:Rearing:Housing  1   278.5   278.5  0.3183 0.57645  
## Residuals                      33 28869.8   874.8                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -47.956 -20.222  -1.017  15.415  64.384 
## 
## Coefficients:
##                                        Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                              71.157      9.010   7.898 4.17e-09 ***
## PNN_intensity_IL_c                      -16.225     32.496  -0.499    0.621    
## RearingMS                                19.784     12.154   1.628    0.113    
## HousingSI                               -18.117     11.741  -1.543    0.132    
## PNN_intensity_IL_c:RearingMS             17.172     37.605   0.457    0.651    
## PNN_intensity_IL_c:HousingSI             -3.899     45.729  -0.085    0.933    
## PNN_intensity_IL_c:RearingMS:HousingSI    6.177     68.949   0.090    0.929    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 29.95 on 33 degrees of freedom
## Multiple R-squared:  0.2297, Adjusted R-squared:  0.08963 
## F-statistic:  1.64 on 6 and 33 DF,  p-value: 0.1674
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: head_poke_duration
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 1.64, p = 0.17
## R² = 0.23
## Adj. R² = 0.09 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------------
##                                                  Est.    S.E.   t val.      p
## -------------------------------------------- -------- ------- -------- ------
## (Intercept)                                     71.16    9.01     7.90   0.00
## PNN_intensity_IL_c                             -16.22   32.50    -0.50   0.62
## RearingMS                                       19.78   12.15     1.63   0.11
## HousingSI                                      -18.12   11.74    -1.54   0.13
## PNN_intensity_IL_c:RearingMS                    17.17   37.60     0.46   0.65
## PNN_intensity_IL_c:HousingSI                    -3.90   45.73    -0.09   0.93
## PNN_intensity_IL_c:RearingMS:HousingSI           6.18   68.95     0.09   0.93
## -----------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                    Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_intensity_IL_c                  1    21.6    21.6  0.0241 0.87766  
## Rearing                             1  4516.7  4516.7  5.0359 0.03165 *
## Housing                             1  3868.0  3868.0  4.3127 0.04569 *
## PNN_intensity_IL_c:Rearing          1   411.1   411.1  0.4584 0.50309  
## PNN_intensity_IL_c:Housing          1     0.7     0.7  0.0008 0.97737  
## PNN_intensity_IL_c:Rearing:Housing  1     7.2     7.2  0.0080 0.92915  
## Residuals                          33 29597.5   896.9                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -49.866 -17.237  -1.017  11.622  71.810 
## 
## Coefficients:
##                                           Estimate Std. Error t value Pr(>|t|)
## (Intercept)                                 69.681      9.050   7.700 7.23e-09
## PNN_pos_PV_count_IL_c                        1.764      2.699   0.654   0.5177
## RearingMS                                   20.640     10.101   2.043   0.0491
## HousingSI                                  -23.500     10.100  -2.327   0.0263
## PNN_pos_PV_count_IL_c:RearingMS              1.045      3.781   0.276   0.7840
## PNN_pos_PV_count_IL_c:HousingSI             -0.975      3.192  -0.305   0.7619
## PNN_pos_PV_count_IL_c:RearingMS:HousingSI   -4.830      4.746  -1.018   0.3163
##                                              
## (Intercept)                               ***
## PNN_pos_PV_count_IL_c                        
## RearingMS                                 *  
## HousingSI                                 *  
## PNN_pos_PV_count_IL_c:RearingMS              
## PNN_pos_PV_count_IL_c:HousingSI              
## PNN_pos_PV_count_IL_c:RearingMS:HousingSI    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 28.45 on 33 degrees of freedom
## Multiple R-squared:  0.3049, Adjusted R-squared:  0.1785 
## F-statistic: 2.412 on 6 and 33 DF,  p-value: 0.0482
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: head_poke_duration
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 2.41, p = 0.05
## R² = 0.30
## Adj. R² = 0.18 
## 
## Standard errors: OLS
## --------------------------------------------------------------------------------
##                                                     Est.    S.E.   t val.      p
## ----------------------------------------------- -------- ------- -------- ------
## (Intercept)                                        69.68    9.05     7.70   0.00
## PNN_pos_PV_count_IL_c                               1.76    2.70     0.65   0.52
## RearingMS                                          20.64   10.10     2.04   0.05
## HousingSI                                         -23.50   10.10    -2.33   0.03
## PNN_pos_PV_count_IL_c:RearingMS                     1.05    3.78     0.28   0.78
## PNN_pos_PV_count_IL_c:HousingSI                    -0.98    3.19    -0.31   0.76
## PNN_pos_PV_count_IL_c:RearingMS:HousingSI          -4.83    4.75    -1.02   0.32
## --------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                       Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_count_IL_c                  1   292.9   292.9  0.3619 0.55157  
## Rearing                                1  4334.2  4334.2  5.3551 0.02703 *
## Housing                                1  3662.9  3662.9  4.5257 0.04095 *
## PNN_pos_PV_count_IL_c:Rearing          1   586.2   586.2  0.7242 0.40089  
## PNN_pos_PV_count_IL_c:Housing          1  1999.4  1999.4  2.4704 0.12555  
## PNN_pos_PV_count_IL_c:Rearing:Housing  1   838.1   838.1  1.0355 0.31627  
## Residuals                             33 26709.0   809.4                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -44.967 -15.809  -2.873  15.257  52.744 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                     69.547      8.002   8.691
## PNN_pos_PV_intensity_IL_c                       19.159     26.897   0.712
## RearingMS                                       24.825      9.354   2.654
## HousingSI                                      -18.163      9.334  -1.946
## PNN_pos_PV_intensity_IL_c:RearingMS            -51.243     32.315  -1.586
## PNN_pos_PV_intensity_IL_c:HousingSI             -9.415     34.903  -0.270
## PNN_pos_PV_intensity_IL_c:RearingMS:HousingSI   82.162     48.447   1.696
##                                               Pr(>|t|)    
## (Intercept)                                    4.8e-10 ***
## PNN_pos_PV_intensity_IL_c                       0.4813    
## RearingMS                                       0.0121 *  
## HousingSI                                       0.0602 .  
## PNN_pos_PV_intensity_IL_c:RearingMS             0.1223    
## PNN_pos_PV_intensity_IL_c:HousingSI             0.7890    
## PNN_pos_PV_intensity_IL_c:RearingMS:HousingSI   0.0993 .  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 27.77 on 33 degrees of freedom
## Multiple R-squared:  0.3376, Adjusted R-squared:  0.2172 
## F-statistic: 2.803 on 6 and 33 DF,  p-value: 0.02573
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: head_poke_duration
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 2.80, p = 0.03
## R² = 0.34
## Adj. R² = 0.22 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------------
##                                                         Est.    S.E.   t val.
## --------------------------------------------------- -------- ------- --------
## (Intercept)                                            69.55    8.00     8.69
## PNN_pos_PV_intensity_IL_c                              19.16   26.90     0.71
## RearingMS                                              24.83    9.35     2.65
## HousingSI                                             -18.16    9.33    -1.95
## PNN_pos_PV_intensity_IL_c:RearingMS                   -51.24   32.31    -1.59
## PNN_pos_PV_intensity_IL_c:HousingSI                    -9.41   34.90    -0.27
## PNN_pos_PV_intensity_IL_c:RearingMS:HousingSI          82.16   48.45     1.70
## -----------------------------------------------------------------------------
##  
## ----------------------------------------------------------
##                                                          p
## --------------------------------------------------- ------
## (Intercept)                                           0.00
## PNN_pos_PV_intensity_IL_c                             0.48
## RearingMS                                             0.01
## HousingSI                                             0.06
## PNN_pos_PV_intensity_IL_c:RearingMS                   0.12
## PNN_pos_PV_intensity_IL_c:HousingSI                   0.79
## PNN_pos_PV_intensity_IL_c:RearingMS:HousingSI         0.10
## ----------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                           Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_intensity_IL_c                  1    93.2    93.2  0.1208 0.73037  
## Rearing                                    1  4382.2  4382.2  5.6822 0.02305 *
## Housing                                    1  3792.2  3792.2  4.9171 0.03359 *
## PNN_pos_PV_intensity_IL_c:Rearing          1  1055.6  1055.6  1.3688 0.25040  
## PNN_pos_PV_intensity_IL_c:Housing          1  1430.9  1430.9  1.8553 0.18239  
## PNN_pos_PV_intensity_IL_c:Rearing:Housing  1  2218.2  2218.2  2.8761 0.09932 .
## Residuals                                 33 25450.5   771.2                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -50.082 -20.261  -1.222  17.193  53.557 
## 
## Coefficients:
##                                                Estimate Std. Error t value
## (Intercept)                                    69.41217    8.90289   7.797
## PV_pos_PNN_intensity_IL_c                     -10.12099   21.04663  -0.481
## RearingMS                                      24.73129   11.68062   2.117
## HousingSI                                     -15.51308   11.42201  -1.358
## PV_pos_PNN_intensity_IL_c:RearingMS             6.71374   25.18643   0.267
## PV_pos_PNN_intensity_IL_c:HousingSI             0.02135   30.81472   0.001
## PV_pos_PNN_intensity_IL_c:RearingMS:HousingSI  24.21697   47.31237   0.512
##                                               Pr(>|t|)    
## (Intercept)                                   5.52e-09 ***
## PV_pos_PNN_intensity_IL_c                       0.6338    
## RearingMS                                       0.0419 *  
## HousingSI                                       0.1836    
## PV_pos_PNN_intensity_IL_c:RearingMS             0.7915    
## PV_pos_PNN_intensity_IL_c:HousingSI             0.9995    
## PV_pos_PNN_intensity_IL_c:RearingMS:HousingSI   0.6122    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 29.79 on 33 degrees of freedom
## Multiple R-squared:  0.2377, Adjusted R-squared:  0.09907 
## F-statistic: 1.715 on 6 and 33 DF,  p-value: 0.1485
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: head_poke_duration
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 1.71, p = 0.15
## R² = 0.24
## Adj. R² = 0.10 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------------
##                                                         Est.    S.E.   t val.
## --------------------------------------------------- -------- ------- --------
## (Intercept)                                            69.41    8.90     7.80
## PV_pos_PNN_intensity_IL_c                             -10.12   21.05    -0.48
## RearingMS                                              24.73   11.68     2.12
## HousingSI                                             -15.51   11.42    -1.36
## PV_pos_PNN_intensity_IL_c:RearingMS                     6.71   25.19     0.27
## PV_pos_PNN_intensity_IL_c:HousingSI                     0.02   30.81     0.00
## PV_pos_PNN_intensity_IL_c:RearingMS:HousingSI          24.22   47.31     0.51
## -----------------------------------------------------------------------------
##  
## ----------------------------------------------------------
##                                                          p
## --------------------------------------------------- ------
## (Intercept)                                           0.00
## PV_pos_PNN_intensity_IL_c                             0.63
## RearingMS                                             0.04
## HousingSI                                             0.18
## PV_pos_PNN_intensity_IL_c:RearingMS                   0.79
## PV_pos_PNN_intensity_IL_c:HousingSI                   1.00
## PV_pos_PNN_intensity_IL_c:RearingMS:HousingSI         0.61
## ----------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                           Df  Sum Sq Mean Sq F value  Pr(>F)  
## PV_pos_PNN_intensity_IL_c                  1    11.5    11.5  0.0129 0.91009  
## Rearing                                    1  4578.2  4578.2  5.1580 0.02979 *
## Housing                                    1  3724.4  3724.4  4.1961 0.04854 *
## PV_pos_PNN_intensity_IL_c:Rearing          1   330.9   330.9  0.3728 0.54567  
## PV_pos_PNN_intensity_IL_c:Housing          1   254.5   254.5  0.2868 0.59589  
## PV_pos_PNN_intensity_IL_c:Rearing:Housing  1   232.5   232.5  0.2620 0.61216  
## Residuals                                 33 29290.7   887.6                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## [[1]]
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                               Df  Sum Sq Mean Sq F value  Pr(>F)  
## PV_count_PL_c                  1   752.3   752.3  0.8884 0.35275  
## Rearing                        1  3760.1  3760.1  4.4405 0.04278 *
## Housing                        1  3898.6  3898.6  4.6041 0.03935 *
## PV_count_PL_c:Rearing          1  1500.0  1500.0  1.7715 0.19232  
## PV_count_PL_c:Housing          1   568.1   568.1  0.6709 0.41861  
## PV_count_PL_c:Rearing:Housing  1     0.1     0.1  0.0001 0.99259  
## Residuals                     33 27943.5   846.8                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[2]]
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                   Df  Sum Sq Mean Sq F value  Pr(>F)  
## PV_intensity_PL_c                  1   476.9   476.9  0.6038 0.44267  
## Rearing                            1  4935.3  4935.3  6.2481 0.01758 *
## Housing                            1  3580.7  3580.7  4.5332 0.04080 *
## PV_intensity_PL_c:Rearing          1  1099.3  1099.3  1.3917 0.24655  
## PV_intensity_PL_c:Housing          1    53.6    53.6  0.0678 0.79613  
## PV_intensity_PL_c:Rearing:Housing  1  2210.7  2210.7  2.7988 0.10379  
## Residuals                         33 26066.3   789.9                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[3]]
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_count_PL_c                  1   662.8   662.8  0.8126 0.37390  
## Rearing                         1  3854.8  3854.8  4.7259 0.03699 *
## Housing                         1  4227.0  4227.0  5.1823 0.02943 *
## PNN_count_PL_c:Rearing          1  1844.2  1844.2  2.2610 0.14218  
## PNN_count_PL_c:Housing          1   217.7   217.7  0.2669 0.60887  
## PNN_count_PL_c:Rearing:Housing  1   699.1   699.1  0.8571 0.36127  
## Residuals                      33 26917.2   815.7                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[4]]
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                    Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_intensity_PL_c                  1     7.2     7.2  0.0081 0.92869  
## Rearing                             1  4862.9  4862.9  5.4730 0.02551 *
## Housing                             1  3395.5  3395.5  3.8215 0.05911 .
## PNN_intensity_PL_c:Rearing          1   168.9   168.9  0.1901 0.66565  
## PNN_intensity_PL_c:Housing          1   124.3   124.3  0.1399 0.71080  
## PNN_intensity_PL_c:Rearing:Housing  1   543.0   543.0  0.6111 0.43996  
## Residuals                          33 29321.1   888.5                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[5]]
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                       Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_count_PL_c                  1   629.9   629.9  0.7447 0.39438  
## Rearing                                1  3866.9  3866.9  4.5717 0.04000 *
## Housing                                1  4165.6  4165.6  4.9248 0.03346 *
## PNN_pos_PV_count_PL_c:Rearing          1   512.1   512.1  0.6054 0.44207  
## PNN_pos_PV_count_PL_c:Housing          1    30.4    30.4  0.0360 0.85069  
## PNN_pos_PV_count_PL_c:Rearing:Housing  1  1305.4  1305.4  1.5433 0.22288  
## Residuals                             33 27912.5   845.8                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[6]]
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                           Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_intensity_PL_c                  1   344.4   344.4  0.4293 0.51686  
## Rearing                                    1  4859.1  4859.1  6.0577 0.01924 *
## Housing                                    1  3612.7  3612.7  4.5039 0.04141 *
## PNN_pos_PV_intensity_PL_c:Rearing          1  2335.9  2335.9  2.9121 0.09731 .
## PNN_pos_PV_intensity_PL_c:Housing          1   143.8   143.8  0.1793 0.67469  
## PNN_pos_PV_intensity_PL_c:Rearing:Housing  1   656.7   656.7  0.8187 0.37213  
## Residuals                                 33 26470.2   802.1                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[7]]
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                           Df  Sum Sq Mean Sq F value  Pr(>F)  
## PV_pos_PNN_intensity_PL_c                  1     2.4     2.4  0.0027 0.95874  
## Rearing                                    1  4798.1  4798.1  5.3917 0.02655 *
## Housing                                    1  3474.3  3474.3  3.9040 0.05658 .
## PV_pos_PNN_intensity_PL_c:Rearing          1   142.8   142.8  0.1605 0.69131  
## PV_pos_PNN_intensity_PL_c:Housing          1    46.6    46.6  0.0523 0.82050  
## PV_pos_PNN_intensity_PL_c:Rearing:Housing  1   591.4   591.4  0.6645 0.42081  
## Residuals                                 33 29367.2   889.9                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[8]]
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                               Df  Sum Sq Mean Sq F value  Pr(>F)  
## PV_count_IL_c                  1   632.9   632.9  0.7880 0.38112  
## Rearing                        1  3841.2  3841.2  4.7827 0.03594 *
## Housing                        1  3817.2  3817.2  4.7529 0.03649 *
## PV_count_IL_c:Rearing          1  1414.9  1414.9  1.7617 0.19352  
## PV_count_IL_c:Housing          1  2123.2  2123.2  2.6436 0.11348  
## PV_count_IL_c:Rearing:Housing  1    89.6    89.6  0.1116 0.74046  
## Residuals                     33 26503.7   803.1                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[9]]
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                   Df  Sum Sq Mean Sq F value  Pr(>F)  
## PV_intensity_IL_c                  1   170.1   170.1  0.1946 0.66201  
## Rearing                            1  4337.0  4337.0  4.9616 0.03285 *
## Housing                            1  3761.6  3761.6  4.3034 0.04591 *
## PV_intensity_IL_c:Rearing          1   360.0   360.0  0.4119 0.52544  
## PV_intensity_IL_c:Housing          1   923.1   923.1  1.0560 0.31161  
## PV_intensity_IL_c:Rearing:Housing  1    25.4    25.4  0.0290 0.86578  
## Residuals                         33 28845.7   874.1                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[10]]
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_count_IL_c                  1   235.2   235.2  0.2689 0.60756  
## Rearing                         1  4471.7  4471.7  5.1114 0.03049 *
## Housing                         1  3560.5  3560.5  4.0699 0.05185 .
## PNN_count_IL_c:Rearing          1   975.4   975.4  1.1149 0.29868  
## PNN_count_IL_c:Housing          1    31.6    31.6  0.0362 0.85037  
## PNN_count_IL_c:Rearing:Housing  1   278.5   278.5  0.3183 0.57645  
## Residuals                      33 28869.8   874.8                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[11]]
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                    Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_intensity_IL_c                  1    21.6    21.6  0.0241 0.87766  
## Rearing                             1  4516.7  4516.7  5.0359 0.03165 *
## Housing                             1  3868.0  3868.0  4.3127 0.04569 *
## PNN_intensity_IL_c:Rearing          1   411.1   411.1  0.4584 0.50309  
## PNN_intensity_IL_c:Housing          1     0.7     0.7  0.0008 0.97737  
## PNN_intensity_IL_c:Rearing:Housing  1     7.2     7.2  0.0080 0.92915  
## Residuals                          33 29597.5   896.9                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[12]]
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                       Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_count_IL_c                  1   292.9   292.9  0.3619 0.55157  
## Rearing                                1  4334.2  4334.2  5.3551 0.02703 *
## Housing                                1  3662.9  3662.9  4.5257 0.04095 *
## PNN_pos_PV_count_IL_c:Rearing          1   586.2   586.2  0.7242 0.40089  
## PNN_pos_PV_count_IL_c:Housing          1  1999.4  1999.4  2.4704 0.12555  
## PNN_pos_PV_count_IL_c:Rearing:Housing  1   838.1   838.1  1.0355 0.31627  
## Residuals                             33 26709.0   809.4                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[13]]
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                           Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_intensity_IL_c                  1    93.2    93.2  0.1208 0.73037  
## Rearing                                    1  4382.2  4382.2  5.6822 0.02305 *
## Housing                                    1  3792.2  3792.2  4.9171 0.03359 *
## PNN_pos_PV_intensity_IL_c:Rearing          1  1055.6  1055.6  1.3688 0.25040  
## PNN_pos_PV_intensity_IL_c:Housing          1  1430.9  1430.9  1.8553 0.18239  
## PNN_pos_PV_intensity_IL_c:Rearing:Housing  1  2218.2  2218.2  2.8761 0.09932 .
## Residuals                                 33 25450.5   771.2                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[14]]
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                           Df  Sum Sq Mean Sq F value  Pr(>F)  
## PV_pos_PNN_intensity_IL_c                  1    11.5    11.5  0.0129 0.91009  
## Rearing                                    1  4578.2  4578.2  5.1580 0.02979 *
## Housing                                    1  3724.4  3724.4  4.1961 0.04854 *
## PV_pos_PNN_intensity_IL_c:Rearing          1   330.9   330.9  0.3728 0.54567  
## PV_pos_PNN_intensity_IL_c:Housing          1   254.5   254.5  0.2868 0.59589  
## PV_pos_PNN_intensity_IL_c:Rearing:Housing  1   232.5   232.5  0.2620 0.61216  
## Residuals                                 33 29290.7   887.6                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

Female - Head pokes

# Returning summary, summ, and anova stats for every linear model in the femalelm_head_pokes list
lapply(femalelm_head_pokes, function(x){
    print(summary(x))
    print(summ(x))
    print(anova(x))
})
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -7.5096 -2.1333 -0.2061  2.1409  8.7839 
## 
## Coefficients:
##                                   Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                       12.80949    1.08630  11.792 2.24e-13 ***
## PV_count_PL_c                      0.03332    0.15348   0.217   0.8295    
## RearingMS                          0.77228    1.29266   0.597   0.5543    
## HousingSI                         -2.27673    1.29423  -1.759   0.0878 .  
## PV_count_PL_c:RearingMS            0.11914    0.18894   0.631   0.5327    
## PV_count_PL_c:HousingSI            0.08955    0.17822   0.502   0.6187    
## PV_count_PL_c:RearingMS:HousingSI -0.53442    0.24020  -2.225   0.0330 *  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.734 on 33 degrees of freedom
## Multiple R-squared:  0.2887, Adjusted R-squared:  0.1594 
## F-statistic: 2.233 on 6 and 33 DF,  p-value: 0.06443
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: head_pokes
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 2.23, p = 0.06
## R² = 0.29
## Adj. R² = 0.16 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------
##                                            Est.   S.E.   t val.      p
## --------------------------------------- ------- ------ -------- ------
## (Intercept)                               12.81   1.09    11.79   0.00
## PV_count_PL_c                              0.03   0.15     0.22   0.83
## RearingMS                                  0.77   1.29     0.60   0.55
## HousingSI                                 -2.28   1.29    -1.76   0.09
## PV_count_PL_c:RearingMS                    0.12   0.19     0.63   0.53
## PV_count_PL_c:HousingSI                    0.09   0.18     0.50   0.62
## PV_count_PL_c:RearingMS:HousingSI         -0.53   0.24    -2.22   0.03
## ----------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_pokes
##                               Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_count_PL_c                  1   2.21   2.206  0.1582 0.69341  
## Rearing                        1  21.19  21.191  1.5197 0.22638  
## Housing                        1  10.71  10.710  0.7680 0.38716  
## PV_count_PL_c:Rearing          1  33.84  33.838  2.4265 0.12884  
## PV_count_PL_c:Housing          1  49.82  49.819  3.5726 0.06755 .
## PV_count_PL_c:Rearing:Housing  1  69.03  69.030  4.9502 0.03304 *
## Residuals                     33 460.18  13.945                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -7.5661 -2.2388  0.4437  2.5372  4.8022 
## 
## Coefficients:
##                                       Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                            12.6004     0.9556  13.186 1.05e-14 ***
## PV_intensity_PL_c                      -0.7601     3.1058  -0.245  0.80818    
## RearingMS                               1.1458     1.1377   1.007  0.32120    
## HousingSI                              -1.9131     1.1327  -1.689  0.10064    
## PV_intensity_PL_c:RearingMS             5.1819     3.6001   1.439  0.15947    
## PV_intensity_PL_c:HousingSI             7.8069     3.9410   1.981  0.05598 .  
## PV_intensity_PL_c:RearingMS:HousingSI -18.4752     5.1799  -3.567  0.00113 ** 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.427 on 33 degrees of freedom
## Multiple R-squared:  0.4009, Adjusted R-squared:  0.2919 
## F-statistic:  3.68 on 6 and 33 DF,  p-value: 0.006576
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: head_pokes
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 3.68, p = 0.01
## R² = 0.40
## Adj. R² = 0.29 
## 
## Standard errors: OLS
## ---------------------------------------------------------------------------
##                                                 Est.   S.E.   t val.      p
## ------------------------------------------- -------- ------ -------- ------
## (Intercept)                                    12.60   0.96    13.19   0.00
## PV_intensity_PL_c                              -0.76   3.11    -0.24   0.81
## RearingMS                                       1.15   1.14     1.01   0.32
## HousingSI                                      -1.91   1.13    -1.69   0.10
## PV_intensity_PL_c:RearingMS                     5.18   3.60     1.44   0.16
## PV_intensity_PL_c:HousingSI                     7.81   3.94     1.98   0.06
## PV_intensity_PL_c:RearingMS:HousingSI         -18.48   5.18    -3.57   0.00
## ---------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_pokes
##                                   Df Sum Sq Mean Sq F value   Pr(>F)   
## PV_intensity_PL_c                  1  38.54  38.545  3.2814 0.079178 . 
## Rearing                            1  32.21  32.212  2.7423 0.107207   
## Housing                            1   8.16   8.157  0.6944 0.410650   
## PV_intensity_PL_c:Rearing          1  14.89  14.886  1.2673 0.268392   
## PV_intensity_PL_c:Housing          1  16.12  16.116  1.3720 0.249857   
## PV_intensity_PL_c:Rearing:Housing  1 149.43 149.429 12.7213 0.001129 **
## Residuals                         33 387.63  11.746                    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##    Min     1Q Median     3Q    Max 
## -9.636 -2.063  0.550  1.918  8.660 
## 
## Coefficients:
##                                    Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                         13.3604     1.1549  11.568 3.74e-13 ***
## PNN_count_PL_c                      -0.1958     0.1792  -1.093   0.2825    
## RearingMS                            0.2130     1.4106   0.151   0.8809    
## HousingSI                           -2.5398     1.3904  -1.827   0.0768 .  
## PNN_count_PL_c:RearingMS             0.3297     0.2667   1.236   0.2252    
## PNN_count_PL_c:HousingSI             0.4214     0.2333   1.806   0.0800 .  
## PNN_count_PL_c:RearingMS:HousingSI  -1.0025     0.3930  -2.551   0.0156 *  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.896 on 33 degrees of freedom
## Multiple R-squared:  0.2257, Adjusted R-squared:  0.08488 
## F-statistic: 1.603 on 6 and 33 DF,  p-value: 0.1775
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: head_pokes
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 1.60, p = 0.18
## R² = 0.23
## Adj. R² = 0.08 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------
##                                             Est.   S.E.   t val.      p
## ---------------------------------------- ------- ------ -------- ------
## (Intercept)                                13.36   1.15    11.57   0.00
## PNN_count_PL_c                             -0.20   0.18    -1.09   0.28
## RearingMS                                   0.21   1.41     0.15   0.88
## HousingSI                                  -2.54   1.39    -1.83   0.08
## PNN_count_PL_c:RearingMS                    0.33   0.27     1.24   0.23
## PNN_count_PL_c:HousingSI                    0.42   0.23     1.81   0.08
## PNN_count_PL_c:RearingMS:HousingSI         -1.00   0.39    -2.55   0.02
## -----------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_pokes
##                                Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_count_PL_c                  1   1.50   1.502  0.0990 0.75507  
## Rearing                         1  21.92  21.924  1.4442 0.23802  
## Housing                         1  11.00  10.997  0.7244 0.40084  
## PNN_count_PL_c:Rearing          1  11.93  11.925  0.7855 0.38187  
## PNN_count_PL_c:Housing          1   0.85   0.854  0.0563 0.81394  
## PNN_count_PL_c:Rearing:Housing  1  98.80  98.799  6.5081 0.01556 *
## Residuals                      33 500.97  15.181                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -7.7257 -2.4656  0.0088  2.7327  8.8827 
## 
## Coefficients:
##                                        Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                             13.5624     1.3276  10.215 9.47e-12 ***
## PNN_intensity_PL_c                      -2.6769     3.9984  -0.669    0.508    
## RearingMS                               -0.2413     1.6687  -0.145    0.886    
## HousingSI                               -2.4046     1.6211  -1.483    0.147    
## PNN_intensity_PL_c:RearingMS             3.5283     4.6751   0.755    0.456    
## PNN_intensity_PL_c:HousingSI             2.1635     4.9110   0.441    0.662    
## PNN_intensity_PL_c:RearingMS:HousingSI -11.0858     8.0326  -1.380    0.177    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 4.12 on 33 degrees of freedom
## Multiple R-squared:  0.1342, Adjusted R-squared:  -0.02321 
## F-statistic: 0.8526 on 6 and 33 DF,  p-value: 0.5393
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: head_pokes
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 0.85, p = 0.54
## R² = 0.13
## Adj. R² = -0.02 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------------
##                                                  Est.   S.E.   t val.      p
## -------------------------------------------- -------- ------ -------- ------
## (Intercept)                                     13.56   1.33    10.22   0.00
## PNN_intensity_PL_c                              -2.68   4.00    -0.67   0.51
## RearingMS                                       -0.24   1.67    -0.14   0.89
## HousingSI                                       -2.40   1.62    -1.48   0.15
## PNN_intensity_PL_c:RearingMS                     3.53   4.68     0.75   0.46
## PNN_intensity_PL_c:HousingSI                     2.16   4.91     0.44   0.66
## PNN_intensity_PL_c:RearingMS:HousingSI         -11.09   8.03    -1.38   0.18
## ----------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_pokes
##                                    Df Sum Sq Mean Sq F value Pr(>F)
## PNN_intensity_PL_c                  1  10.54  10.544  0.6212 0.4362
## Rearing                             1  17.31  17.314  1.0201 0.3199
## Housing                             1  17.41  17.411  1.0257 0.3185
## PNN_intensity_PL_c:Rearing          1   0.00   0.003  0.0002 0.9892
## PNN_intensity_PL_c:Housing          1   9.23   9.228  0.5437 0.4661
## PNN_intensity_PL_c:Rearing:Housing  1  32.33  32.330  1.9047 0.1768
## Residuals                          33 560.14  16.974               
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -9.1696 -2.1385  0.5006  1.8745  8.9642 
## 
## Coefficients:
##                                           Estimate Std. Error t value Pr(>|t|)
## (Intercept)                                13.5461     1.0712  12.646 3.34e-14
## PNN_pos_PV_count_PL_c                      -0.3079     0.2670  -1.153  0.25711
## RearingMS                                  -0.4320     1.3033  -0.332  0.74236
## HousingSI                                  -3.0616     1.2951  -2.364  0.02412
## PNN_pos_PV_count_PL_c:RearingMS             0.5810     0.3253   1.786  0.08324
## PNN_pos_PV_count_PL_c:HousingSI             0.5801     0.3311   1.752  0.08907
## PNN_pos_PV_count_PL_c:RearingMS:HousingSI  -1.6188     0.4637  -3.491  0.00139
##                                              
## (Intercept)                               ***
## PNN_pos_PV_count_PL_c                        
## RearingMS                                    
## HousingSI                                 *  
## PNN_pos_PV_count_PL_c:RearingMS           .  
## PNN_pos_PV_count_PL_c:HousingSI           .  
## PNN_pos_PV_count_PL_c:RearingMS:HousingSI ** 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.563 on 33 degrees of freedom
## Multiple R-squared:  0.3525, Adjusted R-squared:  0.2347 
## F-statistic: 2.994 on 6 and 33 DF,  p-value: 0.01903
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: head_pokes
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 2.99, p = 0.02
## R² = 0.35
## Adj. R² = 0.23 
## 
## Standard errors: OLS
## ------------------------------------------------------------------------------
##                                                    Est.   S.E.   t val.      p
## ----------------------------------------------- ------- ------ -------- ------
## (Intercept)                                       13.55   1.07    12.65   0.00
## PNN_pos_PV_count_PL_c                             -0.31   0.27    -1.15   0.26
## RearingMS                                         -0.43   1.30    -0.33   0.74
## HousingSI                                         -3.06   1.30    -2.36   0.02
## PNN_pos_PV_count_PL_c:RearingMS                    0.58   0.33     1.79   0.08
## PNN_pos_PV_count_PL_c:HousingSI                    0.58   0.33     1.75   0.09
## PNN_pos_PV_count_PL_c:RearingMS:HousingSI         -1.62   0.46    -3.49   0.00
## ------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_pokes
##                                       Df Sum Sq Mean Sq F value  Pr(>F)   
## PNN_pos_PV_count_PL_c                  1   7.55   7.548  0.5946 0.44614   
## Rearing                                1  17.60  17.598  1.3862 0.24747   
## Housing                                1  13.57  13.573  1.0691 0.30866   
## PNN_pos_PV_count_PL_c:Rearing          1  10.81  10.814  0.8518 0.36275   
## PNN_pos_PV_count_PL_c:Housing          1  23.80  23.798  1.8746 0.18020   
## PNN_pos_PV_count_PL_c:Rearing:Housing  1 154.70 154.704 12.1861 0.00139 **
## Residuals                             33 418.94  12.695                   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -7.5521 -2.6584  0.4328  2.2322  5.8170 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                    12.7136     1.0109  12.576
## PNN_pos_PV_intensity_PL_c                      -0.7608     2.7794  -0.274
## RearingMS                                       0.8433     1.1974   0.704
## HousingSI                                      -1.9521     1.1900  -1.640
## PNN_pos_PV_intensity_PL_c:RearingMS             4.2555     3.2870   1.295
## PNN_pos_PV_intensity_PL_c:HousingSI             5.0635     3.2909   1.539
## PNN_pos_PV_intensity_PL_c:RearingMS:HousingSI -14.0479     4.3517  -3.228
##                                               Pr(>|t|)    
## (Intercept)                                   3.89e-14 ***
## PNN_pos_PV_intensity_PL_c                      0.78599    
## RearingMS                                      0.48620    
## HousingSI                                      0.11042    
## PNN_pos_PV_intensity_PL_c:RearingMS            0.20443    
## PNN_pos_PV_intensity_PL_c:HousingSI            0.13343    
## PNN_pos_PV_intensity_PL_c:RearingMS:HousingSI  0.00282 ** 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.546 on 33 degrees of freedom
## Multiple R-squared:  0.3587, Adjusted R-squared:  0.2421 
## F-statistic: 3.077 on 6 and 33 DF,  p-value: 0.0167
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: head_pokes
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 3.08, p = 0.02
## R² = 0.36
## Adj. R² = 0.24 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------------------
##                                                         Est.   S.E.   t val.      p
## --------------------------------------------------- -------- ------ -------- ------
## (Intercept)                                            12.71   1.01    12.58   0.00
## PNN_pos_PV_intensity_PL_c                              -0.76   2.78    -0.27   0.79
## RearingMS                                               0.84   1.20     0.70   0.49
## HousingSI                                              -1.95   1.19    -1.64   0.11
## PNN_pos_PV_intensity_PL_c:RearingMS                     4.26   3.29     1.29   0.20
## PNN_pos_PV_intensity_PL_c:HousingSI                     5.06   3.29     1.54   0.13
## PNN_pos_PV_intensity_PL_c:RearingMS:HousingSI         -14.05   4.35    -3.23   0.00
## -----------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_pokes
##                                           Df Sum Sq Mean Sq F value   Pr(>F)   
## PNN_pos_PV_intensity_PL_c                  1  19.35  19.346  1.5388 0.223545   
## Rearing                                    1  29.37  29.375  2.3365 0.135903   
## Housing                                    1   8.87   8.867  0.7053 0.407067   
## PNN_pos_PV_intensity_PL_c:Rearing          1  20.95  20.950  1.6664 0.205718   
## PNN_pos_PV_intensity_PL_c:Housing          1  22.55  22.545  1.7933 0.189681   
## PNN_pos_PV_intensity_PL_c:Rearing:Housing  1 131.01 131.013 10.4209 0.002816 **
## Residuals                                 33 414.88  12.572                    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -7.8018 -2.0303 -0.0975  2.8142  8.8290 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                     13.607      1.322  10.290
## PV_pos_PNN_intensity_PL_c                       -2.710      3.377  -0.802
## RearingMS                                       -0.150      1.614  -0.093
## HousingSI                                       -2.408      1.573  -1.532
## PV_pos_PNN_intensity_PL_c:RearingMS              3.306      4.014   0.824
## PV_pos_PNN_intensity_PL_c:HousingSI              2.303      4.184   0.551
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI   -9.652      6.677  -1.446
##                                               Pr(>|t|)    
## (Intercept)                                   7.88e-12 ***
## PV_pos_PNN_intensity_PL_c                        0.428    
## RearingMS                                        0.927    
## HousingSI                                        0.135    
## PV_pos_PNN_intensity_PL_c:RearingMS              0.416    
## PV_pos_PNN_intensity_PL_c:HousingSI              0.586    
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI    0.158    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 4.106 on 33 degrees of freedom
## Multiple R-squared:   0.14,  Adjusted R-squared:  -0.01633 
## F-statistic: 0.8956 on 6 and 33 DF,  p-value: 0.5096
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: head_pokes
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 0.90, p = 0.51
## R² = 0.14
## Adj. R² = -0.02 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------------------
##                                                        Est.   S.E.   t val.      p
## --------------------------------------------------- ------- ------ -------- ------
## (Intercept)                                           13.61   1.32    10.29   0.00
## PV_pos_PNN_intensity_PL_c                             -2.71   3.38    -0.80   0.43
## RearingMS                                             -0.15   1.61    -0.09   0.93
## HousingSI                                             -2.41   1.57    -1.53   0.14
## PV_pos_PNN_intensity_PL_c:RearingMS                    3.31   4.01     0.82   0.42
## PV_pos_PNN_intensity_PL_c:HousingSI                    2.30   4.18     0.55   0.59
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI         -9.65   6.68    -1.45   0.16
## ----------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_pokes
##                                           Df Sum Sq Mean Sq F value Pr(>F)
## PV_pos_PNN_intensity_PL_c                  1  12.41  12.412  0.7362 0.3971
## Rearing                                    1  16.92  16.921  1.0036 0.3237
## Housing                                    1  18.95  18.951  1.1240 0.2968
## PV_pos_PNN_intensity_PL_c:Rearing          1   0.08   0.078  0.0046 0.9462
## PV_pos_PNN_intensity_PL_c:Housing          1   7.00   6.997  0.4150 0.5239
## PV_pos_PNN_intensity_PL_c:Rearing:Housing  1  35.24  35.235  2.0899 0.1577
## Residuals                                 33 556.38  16.860               
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -7.8324 -2.6507  0.6334  2.4161  9.2358 
## 
## Coefficients:
##                                   Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                       12.84611    1.15740  11.099 1.12e-12 ***
## PV_count_IL_c                     -0.01780    0.13352  -0.133   0.8947    
## RearingMS                          1.47098    1.38689   1.061   0.2966    
## HousingSI                         -1.92596    1.38689  -1.389   0.1742    
## PV_count_IL_c:RearingMS            0.18724    0.22756   0.823   0.4165    
## PV_count_IL_c:HousingSI            0.08603    0.17131   0.502   0.6189    
## PV_count_IL_c:RearingMS:HousingSI -0.49808    0.28933  -1.721   0.0945 .  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 4.041 on 33 degrees of freedom
## Multiple R-squared:  0.167,  Adjusted R-squared:  0.01552 
## F-statistic: 1.102 on 6 and 33 DF,  p-value: 0.3818
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: head_pokes
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 1.10, p = 0.38
## R² = 0.17
## Adj. R² = 0.02 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------
##                                            Est.   S.E.   t val.      p
## --------------------------------------- ------- ------ -------- ------
## (Intercept)                               12.85   1.16    11.10   0.00
## PV_count_IL_c                             -0.02   0.13    -0.13   0.89
## RearingMS                                  1.47   1.39     1.06   0.30
## HousingSI                                 -1.93   1.39    -1.39   0.17
## PV_count_IL_c:RearingMS                    0.19   0.23     0.82   0.42
## PV_count_IL_c:HousingSI                    0.09   0.17     0.50   0.62
## PV_count_IL_c:RearingMS:HousingSI         -0.50   0.29    -1.72   0.09
## ----------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_pokes
##                               Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_count_IL_c                  1  10.81  10.809  0.6618 0.42174  
## Rearing                        1  15.12  15.125  0.9261 0.34288  
## Housing                        1   9.87   9.871  0.6044 0.44243  
## PV_count_IL_c:Rearing          1  13.55  13.546  0.8295 0.36903  
## PV_count_IL_c:Housing          1  10.28  10.285  0.6297 0.43312  
## PV_count_IL_c:Rearing:Housing  1  48.40  48.397  2.9634 0.09453 .
## Residuals                     33 538.94  16.332                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -8.4807 -2.0345 -0.0395  2.8894  8.3669 
## 
## Coefficients:
##                                       Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                             12.143      1.244   9.759 2.98e-11 ***
## PV_intensity_IL_c                       -7.071      6.114  -1.157   0.2557    
## RearingMS                                1.509      1.367   1.103   0.2779    
## HousingSI                               -1.355      1.369  -0.990   0.3292    
## PV_intensity_IL_c:RearingMS             10.407      7.202   1.445   0.1579    
## PV_intensity_IL_c:HousingSI             11.884      7.861   1.512   0.1401    
## PV_intensity_IL_c:RearingMS:HousingSI  -23.387      9.679  -2.416   0.0214 *  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.936 on 33 degrees of freedom
## Multiple R-squared:   0.21,  Adjusted R-squared:  0.06633 
## F-statistic: 1.462 on 6 and 33 DF,  p-value: 0.2217
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: head_pokes
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 1.46, p = 0.22
## R² = 0.21
## Adj. R² = 0.07 
## 
## Standard errors: OLS
## ---------------------------------------------------------------------------
##                                                 Est.   S.E.   t val.      p
## ------------------------------------------- -------- ------ -------- ------
## (Intercept)                                    12.14   1.24     9.76   0.00
## PV_intensity_IL_c                              -7.07   6.11    -1.16   0.26
## RearingMS                                       1.51   1.37     1.10   0.28
## HousingSI                                      -1.36   1.37    -0.99   0.33
## PV_intensity_IL_c:RearingMS                    10.41   7.20     1.44   0.16
## PV_intensity_IL_c:HousingSI                    11.88   7.86     1.51   0.14
## PV_intensity_IL_c:RearingMS:HousingSI         -23.39   9.68    -2.42   0.02
## ---------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_pokes
##                                   Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_intensity_IL_c                  1   6.23   6.235  0.4025 0.53016  
## Rearing                            1  21.07  21.071  1.3604 0.25183  
## Housing                            1   9.88   9.883  0.6381 0.43011  
## PV_intensity_IL_c:Rearing          1   1.47   1.467  0.0947 0.76023  
## PV_intensity_IL_c:Housing          1   6.76   6.758  0.4363 0.51349  
## PV_intensity_IL_c:Rearing:Housing  1  90.43  90.431  5.8385 0.02137 *
## Residuals                         33 511.13  15.489                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -8.9368 -1.8591  0.4443  2.0378  8.4695 
## 
## Coefficients:
##                                    Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                        13.73380    1.30024  10.563 4.04e-12 ***
## PNN_count_IL_c                     -0.16124    0.18546  -0.869   0.3909    
## RearingMS                          -0.04874    1.45519  -0.033   0.9735    
## HousingSI                          -2.80902    1.44551  -1.943   0.0606 .  
## PNN_count_IL_c:RearingMS            0.16025    0.32276   0.497   0.6228    
## PNN_count_IL_c:HousingSI            0.33538    0.22263   1.506   0.1415    
## PNN_count_IL_c:RearingMS:HousingSI -0.74773    0.39406  -1.898   0.0665 .  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.879 on 33 degrees of freedom
## Multiple R-squared:  0.2327, Adjusted R-squared:  0.09316 
## F-statistic: 1.668 on 6 and 33 DF,  p-value: 0.1601
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: head_pokes
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 1.67, p = 0.16
## R² = 0.23
## Adj. R² = 0.09 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------
##                                             Est.   S.E.   t val.      p
## ---------------------------------------- ------- ------ -------- ------
## (Intercept)                                13.73   1.30    10.56   0.00
## PNN_count_IL_c                             -0.16   0.19    -0.87   0.39
## RearingMS                                  -0.05   1.46    -0.03   0.97
## HousingSI                                  -2.81   1.45    -1.94   0.06
## PNN_count_IL_c:RearingMS                    0.16   0.32     0.50   0.62
## PNN_count_IL_c:HousingSI                    0.34   0.22     1.51   0.14
## PNN_count_IL_c:RearingMS:HousingSI         -0.75   0.39    -1.90   0.07
## -----------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_pokes
##                                Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_count_IL_c                  1   8.78   8.785  0.5839 0.45020  
## Rearing                         1  15.52  15.521  1.0317 0.31714  
## Housing                         1  13.38  13.382  0.8895 0.35246  
## PNN_count_IL_c:Rearing          1  56.80  56.803  3.7759 0.06057 .
## PNN_count_IL_c:Housing          1   1.88   1.877  0.1248 0.72618  
## PNN_count_IL_c:Rearing:Housing  1  54.16  54.165  3.6005 0.06654 .
## Residuals                      33 496.44  15.044                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -7.1582 -2.7981 -0.0131  2.2762  8.2838 
## 
## Coefficients:
##                                        Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                             13.5609     1.2213  11.104  1.1e-12 ***
## PNN_intensity_IL_c                      -2.9289     4.4047  -0.665    0.511    
## RearingMS                               -0.2542     1.6474  -0.154    0.878    
## HousingSI                               -2.2460     1.5914  -1.411    0.168    
## PNN_intensity_IL_c:RearingMS             2.7526     5.0971   0.540    0.593    
## PNN_intensity_IL_c:HousingSI            -0.7055     6.1982  -0.114    0.910    
## PNN_intensity_IL_c:RearingMS:HousingSI  -7.9365     9.3455  -0.849    0.402    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 4.059 on 33 degrees of freedom
## Multiple R-squared:  0.1595, Adjusted R-squared:  0.006713 
## F-statistic: 1.044 on 6 and 33 DF,  p-value: 0.4153
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: head_pokes
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 1.04, p = 0.42
## R² = 0.16
## Adj. R² = 0.01 
## 
## Standard errors: OLS
## ---------------------------------------------------------------------------
##                                                 Est.   S.E.   t val.      p
## -------------------------------------------- ------- ------ -------- ------
## (Intercept)                                    13.56   1.22    11.10   0.00
## PNN_intensity_IL_c                             -2.93   4.40    -0.66   0.51
## RearingMS                                      -0.25   1.65    -0.15   0.88
## HousingSI                                      -2.25   1.59    -1.41   0.17
## PNN_intensity_IL_c:RearingMS                    2.75   5.10     0.54   0.59
## PNN_intensity_IL_c:HousingSI                   -0.71   6.20    -0.11   0.91
## PNN_intensity_IL_c:RearingMS:HousingSI         -7.94   9.35    -0.85   0.40
## ---------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_pokes
##                                    Df Sum Sq Mean Sq F value Pr(>F)
## PNN_intensity_IL_c                  1  30.30  30.304  1.8391 0.1843
## Rearing                             1  15.01  15.014  0.9111 0.3468
## Housing                             1  24.82  24.819  1.5062 0.2284
## PNN_intensity_IL_c:Rearing          1   1.61   1.607  0.0975 0.7568
## PNN_intensity_IL_c:Housing          1  19.58  19.583  1.1884 0.2835
## PNN_intensity_IL_c:Rearing:Housing  1  11.88  11.883  0.7212 0.4019
## Residuals                          33 543.77  16.478               
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -9.0128 -2.2254  0.3525  1.9949  9.3471 
## 
## Coefficients:
##                                           Estimate Std. Error t value Pr(>|t|)
## (Intercept)                                13.5276     1.1950  11.320 6.65e-13
## PNN_pos_PV_count_IL_c                      -0.2773     0.3564  -0.778   0.4421
## RearingMS                                   0.5225     1.3339   0.392   0.6978
## HousingSI                                  -2.6938     1.3337  -2.020   0.0516
## PNN_pos_PV_count_IL_c:RearingMS             0.6402     0.4993   1.282   0.2088
## PNN_pos_PV_count_IL_c:HousingSI             0.4920     0.4215   1.167   0.2515
## PNN_pos_PV_count_IL_c:RearingMS:HousingSI  -1.6290     0.6267  -2.599   0.0139
##                                              
## (Intercept)                               ***
## PNN_pos_PV_count_IL_c                        
## RearingMS                                    
## HousingSI                                 .  
## PNN_pos_PV_count_IL_c:RearingMS              
## PNN_pos_PV_count_IL_c:HousingSI              
## PNN_pos_PV_count_IL_c:RearingMS:HousingSI *  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.757 on 33 degrees of freedom
## Multiple R-squared:  0.2801, Adjusted R-squared:  0.1492 
## F-statistic:  2.14 on 6 and 33 DF,  p-value: 0.07486
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: head_pokes
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 2.14, p = 0.07
## R² = 0.28
## Adj. R² = 0.15 
## 
## Standard errors: OLS
## ------------------------------------------------------------------------------
##                                                    Est.   S.E.   t val.      p
## ----------------------------------------------- ------- ------ -------- ------
## (Intercept)                                       13.53   1.20    11.32   0.00
## PNN_pos_PV_count_IL_c                             -0.28   0.36    -0.78   0.44
## RearingMS                                          0.52   1.33     0.39   0.70
## HousingSI                                         -2.69   1.33    -2.02   0.05
## PNN_pos_PV_count_IL_c:RearingMS                    0.64   0.50     1.28   0.21
## PNN_pos_PV_count_IL_c:HousingSI                    0.49   0.42     1.17   0.25
## PNN_pos_PV_count_IL_c:RearingMS:HousingSI         -1.63   0.63    -2.60   0.01
## ------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_pokes
##                                       Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_count_IL_c                  1  19.79  19.789  1.4021 0.24484  
## Rearing                                1  10.62  10.624  0.7527 0.39188  
## Housing                                1  13.05  13.055  0.9249 0.34317  
## PNN_pos_PV_count_IL_c:Rearing          1  24.63  24.625  1.7447 0.19563  
## PNN_pos_PV_count_IL_c:Housing          1  17.76  17.759  1.2583 0.27008  
## PNN_pos_PV_count_IL_c:Rearing:Housing  1  95.35  95.353  6.7558 0.01387 *
## Residuals                             33 465.77  14.114                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -7.9181 -2.1794  0.4623  2.9413  8.7194 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                     12.517      1.208  10.364
## PNN_pos_PV_intensity_IL_c                       -1.780      4.060  -0.438
## RearingMS                                        1.453      1.412   1.029
## HousingSI                                       -1.320      1.409  -0.937
## PNN_pos_PV_intensity_IL_c:RearingMS              4.155      4.877   0.852
## PNN_pos_PV_intensity_IL_c:HousingSI              3.791      5.268   0.720
## PNN_pos_PV_intensity_IL_c:RearingMS:HousingSI   -9.404      7.312  -1.286
##                                               Pr(>|t|)    
## (Intercept)                                   6.56e-12 ***
## PNN_pos_PV_intensity_IL_c                        0.664    
## RearingMS                                        0.311    
## HousingSI                                        0.355    
## PNN_pos_PV_intensity_IL_c:RearingMS              0.400    
## PNN_pos_PV_intensity_IL_c:HousingSI              0.477    
## PNN_pos_PV_intensity_IL_c:RearingMS:HousingSI    0.207    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 4.192 on 33 degrees of freedom
## Multiple R-squared:  0.1038, Adjusted R-squared:  -0.05911 
## F-statistic: 0.6372 on 6 and 33 DF,  p-value: 0.6996
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: head_pokes
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 0.64, p = 0.70
## R² = 0.10
## Adj. R² = -0.06 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------------------
##                                                        Est.   S.E.   t val.      p
## --------------------------------------------------- ------- ------ -------- ------
## (Intercept)                                           12.52   1.21    10.36   0.00
## PNN_pos_PV_intensity_IL_c                             -1.78   4.06    -0.44   0.66
## RearingMS                                              1.45   1.41     1.03   0.31
## HousingSI                                             -1.32   1.41    -0.94   0.36
## PNN_pos_PV_intensity_IL_c:RearingMS                    4.15   4.88     0.85   0.40
## PNN_pos_PV_intensity_IL_c:HousingSI                    3.79   5.27     0.72   0.48
## PNN_pos_PV_intensity_IL_c:RearingMS:HousingSI         -9.40   7.31    -1.29   0.21
## ----------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_pokes
##                                           Df Sum Sq Mean Sq F value Pr(>F)
## PNN_pos_PV_intensity_IL_c                  1   0.57  0.5705  0.0325 0.8581
## Rearing                                    1  24.73 24.7288  1.4075 0.2439
## Housing                                    1  11.07 11.0653  0.6298 0.4331
## PNN_pos_PV_intensity_IL_c:Rearing          1   0.25  0.2465  0.0140 0.9064
## PNN_pos_PV_intensity_IL_c:Housing          1   1.51  1.5055  0.0857 0.7716
## PNN_pos_PV_intensity_IL_c:Rearing:Housing  1  29.06 29.0580  1.6539 0.2074
## Residuals                                 33 579.80 17.5697               
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -7.3740 -2.4688 -0.2345  3.0155  8.6806 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                   13.46455    1.22513  10.990
## PV_pos_PNN_intensity_IL_c                     -2.21895    2.89623  -0.766
## RearingMS                                     -0.04796    1.60737  -0.030
## HousingSI                                     -2.16110    1.57179  -1.375
## PV_pos_PNN_intensity_IL_c:RearingMS            2.22835    3.46591   0.643
## PV_pos_PNN_intensity_IL_c:HousingSI            0.43198    4.24042   0.102
## PV_pos_PNN_intensity_IL_c:RearingMS:HousingSI -6.42359    6.51066  -0.987
##                                               Pr(>|t|)    
## (Intercept)                                   1.44e-12 ***
## PV_pos_PNN_intensity_IL_c                        0.449    
## RearingMS                                        0.976    
## HousingSI                                        0.178    
## PV_pos_PNN_intensity_IL_c:RearingMS              0.525    
## PV_pos_PNN_intensity_IL_c:HousingSI              0.919    
## PV_pos_PNN_intensity_IL_c:RearingMS:HousingSI    0.331    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 4.1 on 33 degrees of freedom
## Multiple R-squared:  0.1427, Adjusted R-squared:  -0.0132 
## F-statistic: 0.9153 on 6 and 33 DF,  p-value: 0.4963
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: head_pokes
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 0.92, p = 0.50
## R² = 0.14
## Adj. R² = -0.01 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------------------
##                                                        Est.   S.E.   t val.      p
## --------------------------------------------------- ------- ------ -------- ------
## (Intercept)                                           13.46   1.23    10.99   0.00
## PV_pos_PNN_intensity_IL_c                             -2.22   2.90    -0.77   0.45
## RearingMS                                             -0.05   1.61    -0.03   0.98
## HousingSI                                             -2.16   1.57    -1.37   0.18
## PV_pos_PNN_intensity_IL_c:RearingMS                    2.23   3.47     0.64   0.52
## PV_pos_PNN_intensity_IL_c:HousingSI                    0.43   4.24     0.10   0.92
## PV_pos_PNN_intensity_IL_c:RearingMS:HousingSI         -6.42   6.51    -0.99   0.33
## ----------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_pokes
##                                           Df Sum Sq Mean Sq F value Pr(>F)
## PV_pos_PNN_intensity_IL_c                  1  25.36  25.358  1.5087 0.2280
## Rearing                                    1  15.01  15.007  0.8929 0.3516
## Housing                                    1  21.36  21.358  1.2707 0.2678
## PV_pos_PNN_intensity_IL_c:Rearing          1   1.12   1.120  0.0666 0.7979
## PV_pos_PNN_intensity_IL_c:Housing          1  13.11  13.105  0.7797 0.3836
## PV_pos_PNN_intensity_IL_c:Rearing:Housing  1  16.36  16.361  0.9734 0.3310
## Residuals                                 33 554.66  16.808
## [[1]]
## Analysis of Variance Table
## 
## Response: head_pokes
##                               Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_count_PL_c                  1   2.21   2.206  0.1582 0.69341  
## Rearing                        1  21.19  21.191  1.5197 0.22638  
## Housing                        1  10.71  10.710  0.7680 0.38716  
## PV_count_PL_c:Rearing          1  33.84  33.838  2.4265 0.12884  
## PV_count_PL_c:Housing          1  49.82  49.819  3.5726 0.06755 .
## PV_count_PL_c:Rearing:Housing  1  69.03  69.030  4.9502 0.03304 *
## Residuals                     33 460.18  13.945                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[2]]
## Analysis of Variance Table
## 
## Response: head_pokes
##                                   Df Sum Sq Mean Sq F value   Pr(>F)   
## PV_intensity_PL_c                  1  38.54  38.545  3.2814 0.079178 . 
## Rearing                            1  32.21  32.212  2.7423 0.107207   
## Housing                            1   8.16   8.157  0.6944 0.410650   
## PV_intensity_PL_c:Rearing          1  14.89  14.886  1.2673 0.268392   
## PV_intensity_PL_c:Housing          1  16.12  16.116  1.3720 0.249857   
## PV_intensity_PL_c:Rearing:Housing  1 149.43 149.429 12.7213 0.001129 **
## Residuals                         33 387.63  11.746                    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[3]]
## Analysis of Variance Table
## 
## Response: head_pokes
##                                Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_count_PL_c                  1   1.50   1.502  0.0990 0.75507  
## Rearing                         1  21.92  21.924  1.4442 0.23802  
## Housing                         1  11.00  10.997  0.7244 0.40084  
## PNN_count_PL_c:Rearing          1  11.93  11.925  0.7855 0.38187  
## PNN_count_PL_c:Housing          1   0.85   0.854  0.0563 0.81394  
## PNN_count_PL_c:Rearing:Housing  1  98.80  98.799  6.5081 0.01556 *
## Residuals                      33 500.97  15.181                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[4]]
## Analysis of Variance Table
## 
## Response: head_pokes
##                                    Df Sum Sq Mean Sq F value Pr(>F)
## PNN_intensity_PL_c                  1  10.54  10.544  0.6212 0.4362
## Rearing                             1  17.31  17.314  1.0201 0.3199
## Housing                             1  17.41  17.411  1.0257 0.3185
## PNN_intensity_PL_c:Rearing          1   0.00   0.003  0.0002 0.9892
## PNN_intensity_PL_c:Housing          1   9.23   9.228  0.5437 0.4661
## PNN_intensity_PL_c:Rearing:Housing  1  32.33  32.330  1.9047 0.1768
## Residuals                          33 560.14  16.974               
## 
## [[5]]
## Analysis of Variance Table
## 
## Response: head_pokes
##                                       Df Sum Sq Mean Sq F value  Pr(>F)   
## PNN_pos_PV_count_PL_c                  1   7.55   7.548  0.5946 0.44614   
## Rearing                                1  17.60  17.598  1.3862 0.24747   
## Housing                                1  13.57  13.573  1.0691 0.30866   
## PNN_pos_PV_count_PL_c:Rearing          1  10.81  10.814  0.8518 0.36275   
## PNN_pos_PV_count_PL_c:Housing          1  23.80  23.798  1.8746 0.18020   
## PNN_pos_PV_count_PL_c:Rearing:Housing  1 154.70 154.704 12.1861 0.00139 **
## Residuals                             33 418.94  12.695                   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[6]]
## Analysis of Variance Table
## 
## Response: head_pokes
##                                           Df Sum Sq Mean Sq F value   Pr(>F)   
## PNN_pos_PV_intensity_PL_c                  1  19.35  19.346  1.5388 0.223545   
## Rearing                                    1  29.37  29.375  2.3365 0.135903   
## Housing                                    1   8.87   8.867  0.7053 0.407067   
## PNN_pos_PV_intensity_PL_c:Rearing          1  20.95  20.950  1.6664 0.205718   
## PNN_pos_PV_intensity_PL_c:Housing          1  22.55  22.545  1.7933 0.189681   
## PNN_pos_PV_intensity_PL_c:Rearing:Housing  1 131.01 131.013 10.4209 0.002816 **
## Residuals                                 33 414.88  12.572                    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[7]]
## Analysis of Variance Table
## 
## Response: head_pokes
##                                           Df Sum Sq Mean Sq F value Pr(>F)
## PV_pos_PNN_intensity_PL_c                  1  12.41  12.412  0.7362 0.3971
## Rearing                                    1  16.92  16.921  1.0036 0.3237
## Housing                                    1  18.95  18.951  1.1240 0.2968
## PV_pos_PNN_intensity_PL_c:Rearing          1   0.08   0.078  0.0046 0.9462
## PV_pos_PNN_intensity_PL_c:Housing          1   7.00   6.997  0.4150 0.5239
## PV_pos_PNN_intensity_PL_c:Rearing:Housing  1  35.24  35.235  2.0899 0.1577
## Residuals                                 33 556.38  16.860               
## 
## [[8]]
## Analysis of Variance Table
## 
## Response: head_pokes
##                               Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_count_IL_c                  1  10.81  10.809  0.6618 0.42174  
## Rearing                        1  15.12  15.125  0.9261 0.34288  
## Housing                        1   9.87   9.871  0.6044 0.44243  
## PV_count_IL_c:Rearing          1  13.55  13.546  0.8295 0.36903  
## PV_count_IL_c:Housing          1  10.28  10.285  0.6297 0.43312  
## PV_count_IL_c:Rearing:Housing  1  48.40  48.397  2.9634 0.09453 .
## Residuals                     33 538.94  16.332                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[9]]
## Analysis of Variance Table
## 
## Response: head_pokes
##                                   Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_intensity_IL_c                  1   6.23   6.235  0.4025 0.53016  
## Rearing                            1  21.07  21.071  1.3604 0.25183  
## Housing                            1   9.88   9.883  0.6381 0.43011  
## PV_intensity_IL_c:Rearing          1   1.47   1.467  0.0947 0.76023  
## PV_intensity_IL_c:Housing          1   6.76   6.758  0.4363 0.51349  
## PV_intensity_IL_c:Rearing:Housing  1  90.43  90.431  5.8385 0.02137 *
## Residuals                         33 511.13  15.489                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[10]]
## Analysis of Variance Table
## 
## Response: head_pokes
##                                Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_count_IL_c                  1   8.78   8.785  0.5839 0.45020  
## Rearing                         1  15.52  15.521  1.0317 0.31714  
## Housing                         1  13.38  13.382  0.8895 0.35246  
## PNN_count_IL_c:Rearing          1  56.80  56.803  3.7759 0.06057 .
## PNN_count_IL_c:Housing          1   1.88   1.877  0.1248 0.72618  
## PNN_count_IL_c:Rearing:Housing  1  54.16  54.165  3.6005 0.06654 .
## Residuals                      33 496.44  15.044                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[11]]
## Analysis of Variance Table
## 
## Response: head_pokes
##                                    Df Sum Sq Mean Sq F value Pr(>F)
## PNN_intensity_IL_c                  1  30.30  30.304  1.8391 0.1843
## Rearing                             1  15.01  15.014  0.9111 0.3468
## Housing                             1  24.82  24.819  1.5062 0.2284
## PNN_intensity_IL_c:Rearing          1   1.61   1.607  0.0975 0.7568
## PNN_intensity_IL_c:Housing          1  19.58  19.583  1.1884 0.2835
## PNN_intensity_IL_c:Rearing:Housing  1  11.88  11.883  0.7212 0.4019
## Residuals                          33 543.77  16.478               
## 
## [[12]]
## Analysis of Variance Table
## 
## Response: head_pokes
##                                       Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_count_IL_c                  1  19.79  19.789  1.4021 0.24484  
## Rearing                                1  10.62  10.624  0.7527 0.39188  
## Housing                                1  13.05  13.055  0.9249 0.34317  
## PNN_pos_PV_count_IL_c:Rearing          1  24.63  24.625  1.7447 0.19563  
## PNN_pos_PV_count_IL_c:Housing          1  17.76  17.759  1.2583 0.27008  
## PNN_pos_PV_count_IL_c:Rearing:Housing  1  95.35  95.353  6.7558 0.01387 *
## Residuals                             33 465.77  14.114                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[13]]
## Analysis of Variance Table
## 
## Response: head_pokes
##                                           Df Sum Sq Mean Sq F value Pr(>F)
## PNN_pos_PV_intensity_IL_c                  1   0.57  0.5705  0.0325 0.8581
## Rearing                                    1  24.73 24.7288  1.4075 0.2439
## Housing                                    1  11.07 11.0653  0.6298 0.4331
## PNN_pos_PV_intensity_IL_c:Rearing          1   0.25  0.2465  0.0140 0.9064
## PNN_pos_PV_intensity_IL_c:Housing          1   1.51  1.5055  0.0857 0.7716
## PNN_pos_PV_intensity_IL_c:Rearing:Housing  1  29.06 29.0580  1.6539 0.2074
## Residuals                                 33 579.80 17.5697               
## 
## [[14]]
## Analysis of Variance Table
## 
## Response: head_pokes
##                                           Df Sum Sq Mean Sq F value Pr(>F)
## PV_pos_PNN_intensity_IL_c                  1  25.36  25.358  1.5087 0.2280
## Rearing                                    1  15.01  15.007  0.8929 0.3516
## Housing                                    1  21.36  21.358  1.2707 0.2678
## PV_pos_PNN_intensity_IL_c:Rearing          1   1.12   1.120  0.0666 0.7979
## PV_pos_PNN_intensity_IL_c:Housing          1  13.11  13.105  0.7797 0.3836
## PV_pos_PNN_intensity_IL_c:Rearing:Housing  1  16.36  16.361  0.9734 0.3310
## Residuals                                 33 554.66  16.808

Female - Time in the open

# Returning summary, summ, and anova stats for every linear model in the femalelm_time_open list
lapply(femalelm_time_open, function(x){
    print(summary(x))
    print(summ(x))
    print(anova(x))
})
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -53.379 -13.063  -1.834  16.720  55.927 
## 
## Coefficients:
##                                   Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                       43.04566    8.69481   4.951 2.13e-05 ***
## PV_count_PL_c                      1.19534    1.22846   0.973    0.338    
## RearingMS                         -7.97890   10.34659  -0.771    0.446    
## HousingSI                          9.12843   10.35916   0.881    0.385    
## PV_count_PL_c:RearingMS            0.13423    1.51228   0.089    0.930    
## PV_count_PL_c:HousingSI           -1.07901    1.42652  -0.756    0.455    
## PV_count_PL_c:RearingMS:HousingSI  0.00247    1.92256   0.001    0.999    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 29.89 on 33 degrees of freedom
## Multiple R-squared:  0.126,  Adjusted R-squared:  -0.03291 
## F-statistic: 0.7929 on 6 and 33 DF,  p-value: 0.5821
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: time_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 0.79, p = 0.58
## R² = 0.13
## Adj. R² = -0.03 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------
##                                            Est.    S.E.   t val.      p
## --------------------------------------- ------- ------- -------- ------
## (Intercept)                               43.05    8.69     4.95   0.00
## PV_count_PL_c                              1.20    1.23     0.97   0.34
## RearingMS                                 -7.98   10.35    -0.77   0.45
## HousingSI                                  9.13   10.36     0.88   0.38
## PV_count_PL_c:RearingMS                    0.13    1.51     0.09   0.93
## PV_count_PL_c:HousingSI                   -1.08    1.43    -0.76   0.45
## PV_count_PL_c:RearingMS:HousingSI          0.00    1.92     0.00   1.00
## -----------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: time_open
##                               Df  Sum Sq Mean Sq F value Pr(>F)
## PV_count_PL_c                  1  2043.9 2043.89  2.2878 0.1399
## Rearing                        1   292.9  292.91  0.3279 0.5708
## Housing                        1   554.2  554.17  0.6203 0.4366
## PV_count_PL_c:Rearing          1   112.0  112.01  0.1254 0.7255
## PV_count_PL_c:Housing          1  1247.3 1247.29  1.3961 0.2458
## PV_count_PL_c:Rearing:Housing  1     0.0    0.00  0.0000 0.9990
## Residuals                     33 29481.6  893.38               
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -46.525 -20.180  -5.413  18.303  63.700 
## 
## Coefficients:
##                                       Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                             48.240      8.340   5.784 1.82e-06 ***
## PV_intensity_PL_c                        6.938     27.106   0.256    0.800    
## RearingMS                              -13.318      9.929  -1.341    0.189    
## HousingSI                                6.651      9.885   0.673    0.506    
## PV_intensity_PL_c:RearingMS            -12.813     31.421  -0.408    0.686    
## PV_intensity_PL_c:HousingSI            -40.528     34.396  -1.178    0.247    
## PV_intensity_PL_c:RearingMS:HousingSI   31.866     45.209   0.705    0.486    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 29.91 on 33 degrees of freedom
## Multiple R-squared:  0.1247, Adjusted R-squared:  -0.03449 
## F-statistic: 0.7833 on 6 and 33 DF,  p-value: 0.5892
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: time_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 0.78, p = 0.59
## R² = 0.12
## Adj. R² = -0.03 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------------
##                                                 Est.    S.E.   t val.      p
## ------------------------------------------- -------- ------- -------- ------
## (Intercept)                                    48.24    8.34     5.78   0.00
## PV_intensity_PL_c                               6.94   27.11     0.26   0.80
## RearingMS                                     -13.32    9.93    -1.34   0.19
## HousingSI                                       6.65    9.89     0.67   0.51
## PV_intensity_PL_c:RearingMS                   -12.81   31.42    -0.41   0.69
## PV_intensity_PL_c:HousingSI                   -40.53   34.40    -1.18   0.25
## PV_intensity_PL_c:RearingMS:HousingSI          31.87   45.21     0.70   0.49
## ----------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: time_open
##                                   Df  Sum Sq Mean Sq F value Pr(>F)
## PV_intensity_PL_c                  1  1127.6 1127.63  1.2603 0.2697
## Rearing                            1  1249.9 1249.93  1.3970 0.2457
## Housing                            1   312.2  312.20  0.3489 0.5587
## PV_intensity_PL_c:Rearing          1   187.9  187.87  0.2100 0.6498
## PV_intensity_PL_c:Housing          1   882.8  882.84  0.9867 0.3278
## PV_intensity_PL_c:Rearing:Housing  1   444.5  444.54  0.4968 0.4858
## Residuals                         33 29526.9  894.75               
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -54.204 -22.955   1.612  17.653  52.741 
## 
## Coefficients:
##                                    Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                          39.488      8.543   4.622 5.59e-05 ***
## PNN_count_PL_c                        2.360      1.326   1.780   0.0842 .  
## RearingMS                            -4.128     10.434  -0.396   0.6949    
## HousingSI                            13.932     10.284   1.355   0.1847    
## PNN_count_PL_c:RearingMS             -0.234      1.973  -0.119   0.9063    
## PNN_count_PL_c:HousingSI             -2.103      1.725  -1.219   0.2315    
## PNN_count_PL_c:RearingMS:HousingSI    1.477      2.907   0.508   0.6147    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 28.82 on 33 degrees of freedom
## Multiple R-squared:  0.1874, Adjusted R-squared:  0.03967 
## F-statistic: 1.269 on 6 and 33 DF,  p-value: 0.2985
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: time_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 1.27, p = 0.30
## R² = 0.19
## Adj. R² = 0.04 
## 
## Standard errors: OLS
## ------------------------------------------------------------------------
##                                             Est.    S.E.   t val.      p
## ---------------------------------------- ------- ------- -------- ------
## (Intercept)                                39.49    8.54     4.62   0.00
## PNN_count_PL_c                              2.36    1.33     1.78   0.08
## RearingMS                                  -4.13   10.43    -0.40   0.69
## HousingSI                                  13.93   10.28     1.35   0.18
## PNN_count_PL_c:RearingMS                   -0.23    1.97    -0.12   0.91
## PNN_count_PL_c:HousingSI                   -2.10    1.73    -1.22   0.23
## PNN_count_PL_c:RearingMS:HousingSI          1.48    2.91     0.51   0.61
## ------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: time_open
##                                Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_count_PL_c                  1  3508.3  3508.3  4.2237 0.04785 *
## Rearing                         1   201.1   201.1  0.2421 0.62595  
## Housing                         1  1114.9  1114.9  1.3422 0.25496  
## PNN_count_PL_c:Rearing          1   163.3   163.3  0.1966 0.66035  
## PNN_count_PL_c:Housing          1  1119.8  1119.8  1.3482 0.25393  
## PNN_count_PL_c:Rearing:Housing  1   214.5   214.5  0.2582 0.61474  
## Residuals                      33 27410.1   830.6                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -44.948 -20.764  -3.565  21.721  56.728 
## 
## Coefficients:
##                                        Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                              39.010      9.686   4.027 0.000311 ***
## PNN_intensity_PL_c                       40.065     29.172   1.373 0.178884    
## RearingMS                                -1.966     12.175  -0.161 0.872728    
## HousingSI                                10.726     11.827   0.907 0.371029    
## PNN_intensity_PL_c:RearingMS            -39.799     34.109  -1.167 0.251642    
## PNN_intensity_PL_c:HousingSI            -19.684     35.830  -0.549 0.586458    
## PNN_intensity_PL_c:RearingMS:HousingSI   36.061     58.605   0.615 0.542567    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 30.06 on 33 degrees of freedom
## Multiple R-squared:  0.1161, Adjusted R-squared:  -0.04464 
## F-statistic: 0.7222 on 6 and 33 DF,  p-value: 0.6346
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: time_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 0.72, p = 0.63
## R² = 0.12
## Adj. R² = -0.04 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------------
##                                                  Est.    S.E.   t val.      p
## -------------------------------------------- -------- ------- -------- ------
## (Intercept)                                     39.01    9.69     4.03   0.00
## PNN_intensity_PL_c                              40.07   29.17     1.37   0.18
## RearingMS                                       -1.97   12.17    -0.16   0.87
## HousingSI                                       10.73   11.83     0.91   0.37
## PNN_intensity_PL_c:RearingMS                   -39.80   34.11    -1.17   0.25
## PNN_intensity_PL_c:HousingSI                   -19.68   35.83    -0.55   0.59
## PNN_intensity_PL_c:RearingMS:HousingSI          36.06   58.61     0.62   0.54
## -----------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: time_open
##                                    Df  Sum Sq Mean Sq F value Pr(>F)
## PNN_intensity_PL_c                  1  1144.8 1144.82  1.2671 0.2684
## Rearing                             1   534.0  533.96  0.5910 0.4475
## Housing                             1   917.1  917.07  1.0150 0.3210
## PNN_intensity_PL_c:Rearing          1   952.7  952.65  1.0544 0.3120
## PNN_intensity_PL_c:Housing          1    24.8   24.84  0.0275 0.8693
## PNN_intensity_PL_c:Rearing:Housing  1   342.1  342.09  0.3786 0.5426
## Residuals                          33 29816.5  903.53               
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -52.691 -16.885   1.229  18.630  53.572 
## 
## Coefficients:
##                                           Estimate Std. Error t value Pr(>|t|)
## (Intercept)                                 39.186      8.683   4.513 7.69e-05
## PNN_pos_PV_count_PL_c                        4.095      2.165   1.892   0.0673
## RearingMS                                   -6.034     10.565  -0.571   0.5718
## HousingSI                                   12.339     10.498   1.175   0.2483
## PNN_pos_PV_count_PL_c:RearingMS             -1.857      2.637  -0.704   0.4862
## PNN_pos_PV_count_PL_c:HousingSI             -3.439      2.684  -1.281   0.2090
## PNN_pos_PV_count_PL_c:RearingMS:HousingSI    1.922      3.759   0.511   0.6126
##                                              
## (Intercept)                               ***
## PNN_pos_PV_count_PL_c                     .  
## RearingMS                                    
## HousingSI                                    
## PNN_pos_PV_count_PL_c:RearingMS              
## PNN_pos_PV_count_PL_c:HousingSI              
## PNN_pos_PV_count_PL_c:RearingMS:HousingSI    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 28.88 on 33 degrees of freedom
## Multiple R-squared:  0.1839, Adjusted R-squared:  0.03553 
## F-statistic: 1.239 on 6 and 33 DF,  p-value: 0.3118
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: time_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 1.24, p = 0.31
## R² = 0.18
## Adj. R² = 0.04 
## 
## Standard errors: OLS
## -------------------------------------------------------------------------------
##                                                    Est.    S.E.   t val.      p
## ----------------------------------------------- ------- ------- -------- ------
## (Intercept)                                       39.19    8.68     4.51   0.00
## PNN_pos_PV_count_PL_c                              4.10    2.16     1.89   0.07
## RearingMS                                         -6.03   10.56    -0.57   0.57
## HousingSI                                         12.34   10.50     1.18   0.25
## PNN_pos_PV_count_PL_c:RearingMS                   -1.86    2.64    -0.70   0.49
## PNN_pos_PV_count_PL_c:HousingSI                   -3.44    2.68    -1.28   0.21
## PNN_pos_PV_count_PL_c:RearingMS:HousingSI          1.92    3.76     0.51   0.61
## -------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: time_open
##                                       Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_count_PL_c                  1  3108.6 3108.61  3.7265 0.06219 .
## Rearing                                1   205.4  205.40  0.2462 0.62304  
## Housing                                1  1047.2 1047.22  1.2554 0.27062  
## PNN_pos_PV_count_PL_c:Rearing          1    59.1   59.10  0.0708 0.79177  
## PNN_pos_PV_count_PL_c:Housing          1  1565.2 1565.23  1.8763 0.18000  
## PNN_pos_PV_count_PL_c:Rearing:Housing  1   218.1  218.06  0.2614 0.61256  
## Residuals                             33 27528.3  834.19                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##    Min     1Q Median     3Q    Max 
## -48.18 -19.44  -4.44  20.15  63.92 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                     47.839      8.484   5.639
## PNN_pos_PV_intensity_PL_c                        3.096     23.325   0.133
## RearingMS                                      -11.977     10.048  -1.192
## HousingSI                                        7.181      9.987   0.719
## PNN_pos_PV_intensity_PL_c:RearingMS            -11.630     27.585  -0.422
## PNN_pos_PV_intensity_PL_c:HousingSI            -28.838     27.618  -1.044
## PNN_pos_PV_intensity_PL_c:RearingMS:HousingSI   33.969     36.520   0.930
##                                               Pr(>|t|)    
## (Intercept)                                    2.8e-06 ***
## PNN_pos_PV_intensity_PL_c                        0.895    
## RearingMS                                        0.242    
## HousingSI                                        0.477    
## PNN_pos_PV_intensity_PL_c:RearingMS              0.676    
## PNN_pos_PV_intensity_PL_c:HousingSI              0.304    
## PNN_pos_PV_intensity_PL_c:RearingMS:HousingSI    0.359    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 29.76 on 33 degrees of freedom
## Multiple R-squared:  0.1338, Adjusted R-squared:  -0.02371 
## F-statistic: 0.8494 on 6 and 33 DF,  p-value: 0.5415
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: time_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 0.85, p = 0.54
## R² = 0.13
## Adj. R² = -0.02 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------------
##                                                         Est.    S.E.   t val.
## --------------------------------------------------- -------- ------- --------
## (Intercept)                                            47.84    8.48     5.64
## PNN_pos_PV_intensity_PL_c                               3.10   23.33     0.13
## RearingMS                                             -11.98   10.05    -1.19
## HousingSI                                               7.18    9.99     0.72
## PNN_pos_PV_intensity_PL_c:RearingMS                   -11.63   27.58    -0.42
## PNN_pos_PV_intensity_PL_c:HousingSI                   -28.84   27.62    -1.04
## PNN_pos_PV_intensity_PL_c:RearingMS:HousingSI          33.97   36.52     0.93
## -----------------------------------------------------------------------------
##  
## ----------------------------------------------------------
##                                                          p
## --------------------------------------------------- ------
## (Intercept)                                           0.00
## PNN_pos_PV_intensity_PL_c                             0.90
## RearingMS                                             0.24
## HousingSI                                             0.48
## PNN_pos_PV_intensity_PL_c:RearingMS                   0.68
## PNN_pos_PV_intensity_PL_c:HousingSI                   0.30
## PNN_pos_PV_intensity_PL_c:RearingMS:HousingSI         0.36
## ----------------------------------------------------------
## Analysis of Variance Table
## 
## Response: time_open
##                                           Df  Sum Sq Mean Sq F value Pr(>F)
## PNN_pos_PV_intensity_PL_c                  1  1540.5 1540.53  1.7399 0.1962
## Rearing                                    1  1288.0 1288.01  1.4547 0.2364
## Housing                                    1   303.5  303.50  0.3428 0.5622
## PNN_pos_PV_intensity_PL_c:Rearing          1   371.9  371.91  0.4200 0.5214
## PNN_pos_PV_intensity_PL_c:Housing          1   242.7  242.74  0.2741 0.6041
## PNN_pos_PV_intensity_PL_c:Rearing:Housing  1   766.1  766.07  0.8652 0.3590
## Residuals                                 33 29219.2  885.43               
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##    Min     1Q Median     3Q    Max 
## -45.79 -20.83  -3.60  22.09  57.04 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                     38.868      9.673   4.018
## PV_pos_PNN_intensity_PL_c                       35.277     24.706   1.428
## RearingMS                                       -2.962     11.809  -0.251
## HousingSI                                       11.277     11.504   0.980
## PV_pos_PNN_intensity_PL_c:RearingMS            -32.929     29.361  -1.121
## PV_pos_PNN_intensity_PL_c:HousingSI            -18.326     30.607  -0.599
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI   28.040     48.841   0.574
##                                               Pr(>|t|)    
## (Intercept)                                    0.00032 ***
## PV_pos_PNN_intensity_PL_c                      0.16274    
## RearingMS                                      0.80349    
## HousingSI                                      0.33406    
## PV_pos_PNN_intensity_PL_c:RearingMS            0.27017    
## PV_pos_PNN_intensity_PL_c:HousingSI            0.55343    
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI  0.56979    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 30.04 on 33 degrees of freedom
## Multiple R-squared:  0.1174, Adjusted R-squared:  -0.04312 
## F-statistic: 0.7313 on 6 and 33 DF,  p-value: 0.6278
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: time_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 0.73, p = 0.63
## R² = 0.12
## Adj. R² = -0.04 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------------
##                                                         Est.    S.E.   t val.
## --------------------------------------------------- -------- ------- --------
## (Intercept)                                            38.87    9.67     4.02
## PV_pos_PNN_intensity_PL_c                              35.28   24.71     1.43
## RearingMS                                              -2.96   11.81    -0.25
## HousingSI                                              11.28   11.50     0.98
## PV_pos_PNN_intensity_PL_c:RearingMS                   -32.93   29.36    -1.12
## PV_pos_PNN_intensity_PL_c:HousingSI                   -18.33   30.61    -0.60
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI          28.04   48.84     0.57
## -----------------------------------------------------------------------------
##  
## ----------------------------------------------------------
##                                                          p
## --------------------------------------------------- ------
## (Intercept)                                           0.00
## PV_pos_PNN_intensity_PL_c                             0.16
## RearingMS                                             0.80
## HousingSI                                             0.33
## PV_pos_PNN_intensity_PL_c:RearingMS                   0.27
## PV_pos_PNN_intensity_PL_c:HousingSI                   0.55
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI         0.57
## ----------------------------------------------------------
## Analysis of Variance Table
## 
## Response: time_open
##                                           Df  Sum Sq Mean Sq F value Pr(>F)
## PV_pos_PNN_intensity_PL_c                  1  1225.9 1225.92  1.3588 0.2521
## Rearing                                    1   532.5  532.53  0.5902 0.4478
## Housing                                    1   990.4  990.42  1.0978 0.3024
## PV_pos_PNN_intensity_PL_c:Rearing          1   843.8  843.80  0.9353 0.3405
## PV_pos_PNN_intensity_PL_c:Housing          1    68.7   68.70  0.0762 0.7843
## PV_pos_PNN_intensity_PL_c:Rearing:Housing  1   297.4  297.37  0.3296 0.5698
## Residuals                                 33 29773.2  902.22               
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -46.033 -17.952   0.939  17.051  63.956 
## 
## Coefficients:
##                                   Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                       47.79131    8.60670   5.553 3.61e-06 ***
## PV_count_IL_c                     -0.09393    0.99292  -0.095    0.925    
## RearingMS                         -7.84574   10.31323  -0.761    0.452    
## HousingSI                          6.70582   10.31325   0.650    0.520    
## PV_count_IL_c:RearingMS            2.03288    1.69217   1.201    0.238    
## PV_count_IL_c:HousingSI           -0.40143    1.27393  -0.315    0.755    
## PV_count_IL_c:RearingMS:HousingSI -0.86639    2.15156  -0.403    0.690    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 30.05 on 33 degrees of freedom
## Multiple R-squared:  0.1165, Adjusted R-squared:  -0.04414 
## F-statistic: 0.7252 on 6 and 33 DF,  p-value: 0.6324
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: time_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 0.73, p = 0.63
## R² = 0.12
## Adj. R² = -0.04 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------
##                                            Est.    S.E.   t val.      p
## --------------------------------------- ------- ------- -------- ------
## (Intercept)                               47.79    8.61     5.55   0.00
## PV_count_IL_c                             -0.09    0.99    -0.09   0.93
## RearingMS                                 -7.85   10.31    -0.76   0.45
## HousingSI                                  6.71   10.31     0.65   0.52
## PV_count_IL_c:RearingMS                    2.03    1.69     1.20   0.24
## PV_count_IL_c:HousingSI                   -0.40    1.27    -0.32   0.75
## PV_count_IL_c:RearingMS:HousingSI         -0.87    2.15    -0.40   0.69
## -----------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: time_open
##                               Df  Sum Sq Mean Sq F value Pr(>F)
## PV_count_IL_c                  1   622.8  622.77  0.6896 0.4123
## Rearing                        1   534.6  534.64  0.5920 0.4471
## Housing                        1   351.8  351.81  0.3896 0.5368
## PV_count_IL_c:Rearing          1  1764.3 1764.33  1.9536 0.1715
## PV_count_IL_c:Housing          1   509.7  509.69  0.5644 0.4578
## PV_count_IL_c:Rearing:Housing  1   146.4  146.44  0.1622 0.6898
## Residuals                     33 29802.2  903.10               
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -41.975 -15.669  -3.379  18.757  57.432 
## 
## Coefficients:
##                                        Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                             55.6825     9.1857   6.062 8.04e-07 ***
## PV_intensity_IL_c                       78.0942    45.1309   1.730   0.0929 .  
## RearingMS                              -18.8307    10.0939  -1.866   0.0710 .  
## HousingSI                                0.4029    10.1031   0.040   0.9684    
## PV_intensity_IL_c:RearingMS            -67.4117    53.1657  -1.268   0.2137    
## PV_intensity_IL_c:HousingSI           -120.5740    58.0322  -2.078   0.0456 *  
## PV_intensity_IL_c:RearingMS:HousingSI   75.2433    71.4515   1.053   0.3000    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 29.05 on 33 degrees of freedom
## Multiple R-squared:  0.1742, Adjusted R-squared:  0.02411 
## F-statistic: 1.161 on 6 and 33 DF,  p-value: 0.3507
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: time_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 1.16, p = 0.35
## R² = 0.17
## Adj. R² = 0.02 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------------
##                                                  Est.    S.E.   t val.      p
## ------------------------------------------- --------- ------- -------- ------
## (Intercept)                                     55.68    9.19     6.06   0.00
## PV_intensity_IL_c                               78.09   45.13     1.73   0.09
## RearingMS                                      -18.83   10.09    -1.87   0.07
## HousingSI                                        0.40   10.10     0.04   0.97
## PV_intensity_IL_c:RearingMS                    -67.41   53.17    -1.27   0.21
## PV_intensity_IL_c:HousingSI                   -120.57   58.03    -2.08   0.05
## PV_intensity_IL_c:RearingMS:HousingSI           75.24   71.45     1.05   0.30
## -----------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: time_open
##                                   Df  Sum Sq Mean Sq F value  Pr(>F)  
## PV_intensity_IL_c                  1     3.9     3.9  0.0047 0.94604  
## Rearing                            1   972.4   972.4  1.1520 0.29091  
## Housing                            1   412.4   412.4  0.4886 0.48946  
## PV_intensity_IL_c:Rearing          1    46.8    46.8  0.0554 0.81536  
## PV_intensity_IL_c:Housing          1  3506.2  3506.2  4.1540 0.04962 *
## PV_intensity_IL_c:Rearing:Housing  1   936.0   936.0  1.1090 0.29996  
## Residuals                         33 27854.2   844.1                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -51.033 -20.008   2.064  19.624  49.702 
## 
## Coefficients:
##                                    Estimate Std. Error t value Pr(>|t|)   
## (Intercept)                          35.450      9.856   3.597  0.00104 **
## PNN_count_IL_c                        2.637      1.406   1.876  0.06955 . 
## RearingMS                             1.170     11.030   0.106  0.91618   
## HousingSI                            15.569     10.957   1.421  0.16471   
## PNN_count_IL_c:RearingMS             -1.374      2.446  -0.562  0.57813   
## PNN_count_IL_c:HousingSI             -2.545      1.688  -1.508  0.14103   
## PNN_count_IL_c:RearingMS:HousingSI    2.536      2.987   0.849  0.40207   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 29.4 on 33 degrees of freedom
## Multiple R-squared:  0.1544, Adjusted R-squared:  0.0006821 
## F-statistic: 1.004 on 6 and 33 DF,  p-value: 0.4391
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: time_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 1.00, p = 0.44
## R² = 0.15
## Adj. R² = 0.00 
## 
## Standard errors: OLS
## ------------------------------------------------------------------------
##                                             Est.    S.E.   t val.      p
## ---------------------------------------- ------- ------- -------- ------
## (Intercept)                                35.45    9.86     3.60   0.00
## PNN_count_IL_c                              2.64    1.41     1.88   0.07
## RearingMS                                   1.17   11.03     0.11   0.92
## HousingSI                                  15.57   10.96     1.42   0.16
## PNN_count_IL_c:RearingMS                   -1.37    2.45    -0.56   0.58
## PNN_count_IL_c:HousingSI                   -2.55    1.69    -1.51   0.14
## PNN_count_IL_c:RearingMS:HousingSI          2.54    2.99     0.85   0.40
## ------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: time_open
##                                Df  Sum Sq Mean Sq F value Pr(>F)
## PNN_count_IL_c                  1  2106.2 2106.15  2.4367 0.1281
## Rearing                         1   144.5  144.53  0.1672 0.6852
## Housing                         1   947.1  947.06  1.0957 0.3028
## PNN_count_IL_c:Rearing          1    17.4   17.45  0.0202 0.8879
## PNN_count_IL_c:Housing          1  1371.0 1370.99  1.5862 0.2167
## PNN_count_IL_c:Rearing:Housing  1   622.8  622.81  0.7206 0.4021
## Residuals                      33 28522.9  864.33               
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -44.641 -20.646  -1.789  20.810  61.259 
## 
## Coefficients:
##                                        Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                              44.072      8.976   4.910  2.4e-05 ***
## PNN_intensity_IL_c                       37.550     32.373   1.160    0.254    
## RearingMS                               -10.692     12.108  -0.883    0.384    
## HousingSI                                 2.854     11.697   0.244    0.809    
## PNN_intensity_IL_c:RearingMS            -26.966     37.463  -0.720    0.477    
## PNN_intensity_IL_c:HousingSI              3.802     45.556   0.083    0.934    
## PNN_intensity_IL_c:RearingMS:HousingSI  -36.105     68.688  -0.526    0.603    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 29.83 on 33 degrees of freedom
## Multiple R-squared:  0.1292, Adjusted R-squared:  -0.02913 
## F-statistic: 0.816 on 6 and 33 DF,  p-value: 0.5654
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: time_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 0.82, p = 0.57
## R² = 0.13
## Adj. R² = -0.03 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------------
##                                                  Est.    S.E.   t val.      p
## -------------------------------------------- -------- ------- -------- ------
## (Intercept)                                     44.07    8.98     4.91   0.00
## PNN_intensity_IL_c                              37.55   32.37     1.16   0.25
## RearingMS                                      -10.69   12.11    -0.88   0.38
## HousingSI                                        2.85   11.70     0.24   0.81
## PNN_intensity_IL_c:RearingMS                   -26.97   37.46    -0.72   0.48
## PNN_intensity_IL_c:HousingSI                     3.80   45.56     0.08   0.93
## PNN_intensity_IL_c:RearingMS:HousingSI         -36.11   68.69    -0.53   0.60
## -----------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: time_open
##                                    Df  Sum Sq Mean Sq F value Pr(>F)
## PNN_intensity_IL_c                  1  1027.7 1027.73  1.1546 0.2904
## Rearing                             1   636.3  636.26  0.7148 0.4039
## Housing                             1   887.7  887.71  0.9973 0.3252
## PNN_intensity_IL_c:Rearing          1  1382.0 1382.02  1.5526 0.2215
## PNN_intensity_IL_c:Housing          1   178.3  178.30  0.2003 0.6574
## PNN_intensity_IL_c:Rearing:Housing  1   245.9  245.94  0.2763 0.6027
## Residuals                          33 29373.9  890.12               
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -53.295 -17.764  -2.883  20.269  54.779 
## 
## Coefficients:
##                                           Estimate Std. Error t value Pr(>|t|)
## (Intercept)                                 40.028      9.680   4.135 0.000229
## PNN_pos_PV_count_IL_c                        3.324      2.886   1.152 0.257744
## RearingMS                                   -3.189     10.805  -0.295 0.769740
## HousingSI                                   10.827     10.803   1.002 0.323506
## PNN_pos_PV_count_IL_c:RearingMS             -2.325      4.045  -0.575 0.569385
## PNN_pos_PV_count_IL_c:HousingSI             -2.642      3.414  -0.774 0.444591
## PNN_pos_PV_count_IL_c:RearingMS:HousingSI    3.243      5.077   0.639 0.527311
##                                              
## (Intercept)                               ***
## PNN_pos_PV_count_IL_c                        
## RearingMS                                    
## HousingSI                                    
## PNN_pos_PV_count_IL_c:RearingMS              
## PNN_pos_PV_count_IL_c:HousingSI              
## PNN_pos_PV_count_IL_c:RearingMS:HousingSI    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 30.43 on 33 degrees of freedom
## Multiple R-squared:  0.09406,    Adjusted R-squared:  -0.07066 
## F-statistic: 0.571 on 6 and 33 DF,  p-value: 0.7504
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: time_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 0.57, p = 0.75
## R² = 0.09
## Adj. R² = -0.07 
## 
## Standard errors: OLS
## -------------------------------------------------------------------------------
##                                                    Est.    S.E.   t val.      p
## ----------------------------------------------- ------- ------- -------- ------
## (Intercept)                                       40.03    9.68     4.14   0.00
## PNN_pos_PV_count_IL_c                              3.32    2.89     1.15   0.26
## RearingMS                                         -3.19   10.80    -0.30   0.77
## HousingSI                                         10.83   10.80     1.00   0.32
## PNN_pos_PV_count_IL_c:RearingMS                   -2.32    4.04    -0.57   0.57
## PNN_pos_PV_count_IL_c:HousingSI                   -2.64    3.41    -0.77   0.44
## PNN_pos_PV_count_IL_c:RearingMS:HousingSI          3.24    5.08     0.64   0.53
## -------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: time_open
##                                       Df  Sum Sq Mean Sq F value Pr(>F)
## PNN_pos_PV_count_IL_c                  1  1827.7 1827.73  1.9737 0.1694
## Rearing                                1   195.8  195.78  0.2114 0.6487
## Housing                                1   579.3  579.25  0.6255 0.4347
## PNN_pos_PV_count_IL_c:Rearing          1     6.5    6.46  0.0070 0.9339
## PNN_pos_PV_count_IL_c:Housing          1   185.5  185.51  0.2003 0.6574
## PNN_pos_PV_count_IL_c:Rearing:Housing  1   378.0  377.98  0.4082 0.5273
## Residuals                             33 30559.2  926.04               
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -52.364 -13.351  -5.663  16.720  56.292 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                     50.969      8.277   6.158
## PNN_pos_PV_intensity_IL_c                       26.012     27.821   0.935
## RearingMS                                      -17.218      9.675  -1.780
## HousingSI                                        3.722      9.655   0.386
## PNN_pos_PV_intensity_IL_c:RearingMS             -6.353     33.424  -0.190
## PNN_pos_PV_intensity_IL_c:HousingSI            -57.410     36.101  -1.590
## PNN_pos_PV_intensity_IL_c:RearingMS:HousingSI   -6.762     50.110  -0.135
##                                               Pr(>|t|)    
## (Intercept)                                   6.06e-07 ***
## PNN_pos_PV_intensity_IL_c                       0.3566    
## RearingMS                                       0.0844 .  
## HousingSI                                       0.7023    
## PNN_pos_PV_intensity_IL_c:RearingMS             0.8504    
## PNN_pos_PV_intensity_IL_c:HousingSI             0.1213    
## PNN_pos_PV_intensity_IL_c:RearingMS:HousingSI   0.8935    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 28.72 on 33 degrees of freedom
## Multiple R-squared:  0.1928, Adjusted R-squared:  0.04605 
## F-statistic: 1.314 on 6 and 33 DF,  p-value: 0.2786
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: time_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 1.31, p = 0.28
## R² = 0.19
## Adj. R² = 0.05 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------------
##                                                         Est.    S.E.   t val.
## --------------------------------------------------- -------- ------- --------
## (Intercept)                                            50.97    8.28     6.16
## PNN_pos_PV_intensity_IL_c                              26.01   27.82     0.93
## RearingMS                                             -17.22    9.68    -1.78
## HousingSI                                               3.72    9.65     0.39
## PNN_pos_PV_intensity_IL_c:RearingMS                    -6.35   33.42    -0.19
## PNN_pos_PV_intensity_IL_c:HousingSI                   -57.41   36.10    -1.59
## PNN_pos_PV_intensity_IL_c:RearingMS:HousingSI          -6.76   50.11    -0.13
## -----------------------------------------------------------------------------
##  
## ----------------------------------------------------------
##                                                          p
## --------------------------------------------------- ------
## (Intercept)                                           0.00
## PNN_pos_PV_intensity_IL_c                             0.36
## RearingMS                                             0.08
## HousingSI                                             0.70
## PNN_pos_PV_intensity_IL_c:RearingMS                   0.85
## PNN_pos_PV_intensity_IL_c:HousingSI                   0.12
## PNN_pos_PV_intensity_IL_c:RearingMS:HousingSI         0.89
## ----------------------------------------------------------
## Analysis of Variance Table
## 
## Response: time_open
##                                           Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_intensity_IL_c                  1    21.5    21.5  0.0261 0.87263  
## Rearing                                    1  1000.1  1000.1  1.2121 0.27888  
## Housing                                    1   411.9   411.9  0.4992 0.48479  
## PNN_pos_PV_intensity_IL_c:Rearing          1   206.9   206.9  0.2507 0.61990  
## PNN_pos_PV_intensity_IL_c:Housing          1  4848.4  4848.4  5.8762 0.02099 *
## PNN_pos_PV_intensity_IL_c:Rearing:Housing  1    15.0    15.0  0.0182 0.89347  
## Residuals                                 33 27228.1   825.1                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_females)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -46.814 -19.155   0.333  22.128  58.918 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                     44.201      8.815   5.014
## PV_pos_PNN_intensity_IL_c                       27.544     20.840   1.322
## RearingMS                                      -12.495     11.566  -1.080
## HousingSI                                        2.803     11.310   0.248
## PV_pos_PNN_intensity_IL_c:RearingMS            -15.088     24.939  -0.605
## PV_pos_PNN_intensity_IL_c:HousingSI             -1.908     30.511  -0.063
## PV_pos_PNN_intensity_IL_c:RearingMS:HousingSI  -32.954     46.847  -0.703
##                                               Pr(>|t|)    
## (Intercept)                                   1.77e-05 ***
## PV_pos_PNN_intensity_IL_c                        0.195    
## RearingMS                                        0.288    
## HousingSI                                        0.806    
## PV_pos_PNN_intensity_IL_c:RearingMS              0.549    
## PV_pos_PNN_intensity_IL_c:HousingSI              0.951    
## PV_pos_PNN_intensity_IL_c:RearingMS:HousingSI    0.487    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 29.5 on 33 degrees of freedom
## Multiple R-squared:  0.1487, Adjusted R-squared:  -0.00612 
## F-statistic: 0.9605 on 6 and 33 DF,  p-value: 0.4667
## 
## MODEL INFO:
## Observations: 40
## Dependent Variable: time_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,33) = 0.96, p = 0.47
## R² = 0.15
## Adj. R² = -0.01 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------------
##                                                         Est.    S.E.   t val.
## --------------------------------------------------- -------- ------- --------
## (Intercept)                                            44.20    8.82     5.01
## PV_pos_PNN_intensity_IL_c                              27.54   20.84     1.32
## RearingMS                                             -12.49   11.57    -1.08
## HousingSI                                               2.80   11.31     0.25
## PV_pos_PNN_intensity_IL_c:RearingMS                   -15.09   24.94    -0.61
## PV_pos_PNN_intensity_IL_c:HousingSI                    -1.91   30.51    -0.06
## PV_pos_PNN_intensity_IL_c:RearingMS:HousingSI         -32.95   46.85    -0.70
## -----------------------------------------------------------------------------
##  
## ----------------------------------------------------------
##                                                          p
## --------------------------------------------------- ------
## (Intercept)                                           0.00
## PV_pos_PNN_intensity_IL_c                             0.20
## RearingMS                                             0.29
## HousingSI                                             0.81
## PV_pos_PNN_intensity_IL_c:RearingMS                   0.55
## PV_pos_PNN_intensity_IL_c:HousingSI                   0.95
## PV_pos_PNN_intensity_IL_c:RearingMS:HousingSI         0.49
## ----------------------------------------------------------
## Analysis of Variance Table
## 
## Response: time_open
##                                           Df  Sum Sq Mean Sq F value Pr(>F)
## PV_pos_PNN_intensity_IL_c                  1  1430.5 1430.49  1.6438 0.2087
## Rearing                                    1   548.7  548.72  0.6306 0.4328
## Housing                                    1   915.1  915.12  1.0516 0.3126
## PV_pos_PNN_intensity_IL_c:Rearing          1  1097.6 1097.64  1.2613 0.2695
## PV_pos_PNN_intensity_IL_c:Housing          1   592.3  592.29  0.6806 0.4153
## PV_pos_PNN_intensity_IL_c:Rearing:Housing  1   430.6  430.60  0.4948 0.4867
## Residuals                                 33 28717.1  870.21
## [[1]]
## Analysis of Variance Table
## 
## Response: time_open
##                               Df  Sum Sq Mean Sq F value Pr(>F)
## PV_count_PL_c                  1  2043.9 2043.89  2.2878 0.1399
## Rearing                        1   292.9  292.91  0.3279 0.5708
## Housing                        1   554.2  554.17  0.6203 0.4366
## PV_count_PL_c:Rearing          1   112.0  112.01  0.1254 0.7255
## PV_count_PL_c:Housing          1  1247.3 1247.29  1.3961 0.2458
## PV_count_PL_c:Rearing:Housing  1     0.0    0.00  0.0000 0.9990
## Residuals                     33 29481.6  893.38               
## 
## [[2]]
## Analysis of Variance Table
## 
## Response: time_open
##                                   Df  Sum Sq Mean Sq F value Pr(>F)
## PV_intensity_PL_c                  1  1127.6 1127.63  1.2603 0.2697
## Rearing                            1  1249.9 1249.93  1.3970 0.2457
## Housing                            1   312.2  312.20  0.3489 0.5587
## PV_intensity_PL_c:Rearing          1   187.9  187.87  0.2100 0.6498
## PV_intensity_PL_c:Housing          1   882.8  882.84  0.9867 0.3278
## PV_intensity_PL_c:Rearing:Housing  1   444.5  444.54  0.4968 0.4858
## Residuals                         33 29526.9  894.75               
## 
## [[3]]
## Analysis of Variance Table
## 
## Response: time_open
##                                Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_count_PL_c                  1  3508.3  3508.3  4.2237 0.04785 *
## Rearing                         1   201.1   201.1  0.2421 0.62595  
## Housing                         1  1114.9  1114.9  1.3422 0.25496  
## PNN_count_PL_c:Rearing          1   163.3   163.3  0.1966 0.66035  
## PNN_count_PL_c:Housing          1  1119.8  1119.8  1.3482 0.25393  
## PNN_count_PL_c:Rearing:Housing  1   214.5   214.5  0.2582 0.61474  
## Residuals                      33 27410.1   830.6                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[4]]
## Analysis of Variance Table
## 
## Response: time_open
##                                    Df  Sum Sq Mean Sq F value Pr(>F)
## PNN_intensity_PL_c                  1  1144.8 1144.82  1.2671 0.2684
## Rearing                             1   534.0  533.96  0.5910 0.4475
## Housing                             1   917.1  917.07  1.0150 0.3210
## PNN_intensity_PL_c:Rearing          1   952.7  952.65  1.0544 0.3120
## PNN_intensity_PL_c:Housing          1    24.8   24.84  0.0275 0.8693
## PNN_intensity_PL_c:Rearing:Housing  1   342.1  342.09  0.3786 0.5426
## Residuals                          33 29816.5  903.53               
## 
## [[5]]
## Analysis of Variance Table
## 
## Response: time_open
##                                       Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_count_PL_c                  1  3108.6 3108.61  3.7265 0.06219 .
## Rearing                                1   205.4  205.40  0.2462 0.62304  
## Housing                                1  1047.2 1047.22  1.2554 0.27062  
## PNN_pos_PV_count_PL_c:Rearing          1    59.1   59.10  0.0708 0.79177  
## PNN_pos_PV_count_PL_c:Housing          1  1565.2 1565.23  1.8763 0.18000  
## PNN_pos_PV_count_PL_c:Rearing:Housing  1   218.1  218.06  0.2614 0.61256  
## Residuals                             33 27528.3  834.19                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[6]]
## Analysis of Variance Table
## 
## Response: time_open
##                                           Df  Sum Sq Mean Sq F value Pr(>F)
## PNN_pos_PV_intensity_PL_c                  1  1540.5 1540.53  1.7399 0.1962
## Rearing                                    1  1288.0 1288.01  1.4547 0.2364
## Housing                                    1   303.5  303.50  0.3428 0.5622
## PNN_pos_PV_intensity_PL_c:Rearing          1   371.9  371.91  0.4200 0.5214
## PNN_pos_PV_intensity_PL_c:Housing          1   242.7  242.74  0.2741 0.6041
## PNN_pos_PV_intensity_PL_c:Rearing:Housing  1   766.1  766.07  0.8652 0.3590
## Residuals                                 33 29219.2  885.43               
## 
## [[7]]
## Analysis of Variance Table
## 
## Response: time_open
##                                           Df  Sum Sq Mean Sq F value Pr(>F)
## PV_pos_PNN_intensity_PL_c                  1  1225.9 1225.92  1.3588 0.2521
## Rearing                                    1   532.5  532.53  0.5902 0.4478
## Housing                                    1   990.4  990.42  1.0978 0.3024
## PV_pos_PNN_intensity_PL_c:Rearing          1   843.8  843.80  0.9353 0.3405
## PV_pos_PNN_intensity_PL_c:Housing          1    68.7   68.70  0.0762 0.7843
## PV_pos_PNN_intensity_PL_c:Rearing:Housing  1   297.4  297.37  0.3296 0.5698
## Residuals                                 33 29773.2  902.22               
## 
## [[8]]
## Analysis of Variance Table
## 
## Response: time_open
##                               Df  Sum Sq Mean Sq F value Pr(>F)
## PV_count_IL_c                  1   622.8  622.77  0.6896 0.4123
## Rearing                        1   534.6  534.64  0.5920 0.4471
## Housing                        1   351.8  351.81  0.3896 0.5368
## PV_count_IL_c:Rearing          1  1764.3 1764.33  1.9536 0.1715
## PV_count_IL_c:Housing          1   509.7  509.69  0.5644 0.4578
## PV_count_IL_c:Rearing:Housing  1   146.4  146.44  0.1622 0.6898
## Residuals                     33 29802.2  903.10               
## 
## [[9]]
## Analysis of Variance Table
## 
## Response: time_open
##                                   Df  Sum Sq Mean Sq F value  Pr(>F)  
## PV_intensity_IL_c                  1     3.9     3.9  0.0047 0.94604  
## Rearing                            1   972.4   972.4  1.1520 0.29091  
## Housing                            1   412.4   412.4  0.4886 0.48946  
## PV_intensity_IL_c:Rearing          1    46.8    46.8  0.0554 0.81536  
## PV_intensity_IL_c:Housing          1  3506.2  3506.2  4.1540 0.04962 *
## PV_intensity_IL_c:Rearing:Housing  1   936.0   936.0  1.1090 0.29996  
## Residuals                         33 27854.2   844.1                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[10]]
## Analysis of Variance Table
## 
## Response: time_open
##                                Df  Sum Sq Mean Sq F value Pr(>F)
## PNN_count_IL_c                  1  2106.2 2106.15  2.4367 0.1281
## Rearing                         1   144.5  144.53  0.1672 0.6852
## Housing                         1   947.1  947.06  1.0957 0.3028
## PNN_count_IL_c:Rearing          1    17.4   17.45  0.0202 0.8879
## PNN_count_IL_c:Housing          1  1371.0 1370.99  1.5862 0.2167
## PNN_count_IL_c:Rearing:Housing  1   622.8  622.81  0.7206 0.4021
## Residuals                      33 28522.9  864.33               
## 
## [[11]]
## Analysis of Variance Table
## 
## Response: time_open
##                                    Df  Sum Sq Mean Sq F value Pr(>F)
## PNN_intensity_IL_c                  1  1027.7 1027.73  1.1546 0.2904
## Rearing                             1   636.3  636.26  0.7148 0.4039
## Housing                             1   887.7  887.71  0.9973 0.3252
## PNN_intensity_IL_c:Rearing          1  1382.0 1382.02  1.5526 0.2215
## PNN_intensity_IL_c:Housing          1   178.3  178.30  0.2003 0.6574
## PNN_intensity_IL_c:Rearing:Housing  1   245.9  245.94  0.2763 0.6027
## Residuals                          33 29373.9  890.12               
## 
## [[12]]
## Analysis of Variance Table
## 
## Response: time_open
##                                       Df  Sum Sq Mean Sq F value Pr(>F)
## PNN_pos_PV_count_IL_c                  1  1827.7 1827.73  1.9737 0.1694
## Rearing                                1   195.8  195.78  0.2114 0.6487
## Housing                                1   579.3  579.25  0.6255 0.4347
## PNN_pos_PV_count_IL_c:Rearing          1     6.5    6.46  0.0070 0.9339
## PNN_pos_PV_count_IL_c:Housing          1   185.5  185.51  0.2003 0.6574
## PNN_pos_PV_count_IL_c:Rearing:Housing  1   378.0  377.98  0.4082 0.5273
## Residuals                             33 30559.2  926.04               
## 
## [[13]]
## Analysis of Variance Table
## 
## Response: time_open
##                                           Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_intensity_IL_c                  1    21.5    21.5  0.0261 0.87263  
## Rearing                                    1  1000.1  1000.1  1.2121 0.27888  
## Housing                                    1   411.9   411.9  0.4992 0.48479  
## PNN_pos_PV_intensity_IL_c:Rearing          1   206.9   206.9  0.2507 0.61990  
## PNN_pos_PV_intensity_IL_c:Housing          1  4848.4  4848.4  5.8762 0.02099 *
## PNN_pos_PV_intensity_IL_c:Rearing:Housing  1    15.0    15.0  0.0182 0.89347  
## Residuals                                 33 27228.1   825.1                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[14]]
## Analysis of Variance Table
## 
## Response: time_open
##                                           Df  Sum Sq Mean Sq F value Pr(>F)
## PV_pos_PNN_intensity_IL_c                  1  1430.5 1430.49  1.6438 0.2087
## Rearing                                    1   548.7  548.72  0.6306 0.4328
## Housing                                    1   915.1  915.12  1.0516 0.3126
## PV_pos_PNN_intensity_IL_c:Rearing          1  1097.6 1097.64  1.2613 0.2695
## PV_pos_PNN_intensity_IL_c:Housing          1   592.3  592.29  0.6806 0.4153
## PV_pos_PNN_intensity_IL_c:Rearing:Housing  1   430.6  430.60  0.4948 0.4867
## Residuals                                 33 28717.1  870.21

Statistics for Male Subjects

Male - Crossings

# Returning summary, summ, and anova stats for every linear model in the malelm_crossings list
lapply(malelm_crossings, function(x){
    print(summary(x))
    print(summ(x))
    print(anova(x))
})
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -8.0594 -2.5594 -0.7135  0.9408 11.2186 
## 
## Coefficients:
##                                   Estimate Std. Error t value Pr(>|t|)  
## (Intercept)                        1.84601    1.17044   1.577   0.1235  
## PV_count_PL_c                     -0.12845    0.15262  -0.842   0.4055  
## RearingMS                          0.30195    1.25624   0.240   0.8114  
## HousingSI                          2.45982    1.26761   1.941   0.0602 .
## PV_count_PL_c:RearingMS            0.06577    0.21687   0.303   0.7634  
## PV_count_PL_c:HousingSI            0.06754    0.19016   0.355   0.7245  
## PV_count_PL_c:RearingMS:HousingSI -0.31566    0.26517  -1.190   0.2417  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.845 on 36 degrees of freedom
## Multiple R-squared:  0.326,  Adjusted R-squared:  0.2136 
## F-statistic: 2.902 on 6 and 36 DF,  p-value: 0.02064
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: crossings
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 2.90, p = 0.02
## R² = 0.33
## Adj. R² = 0.21 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------
##                                            Est.   S.E.   t val.      p
## --------------------------------------- ------- ------ -------- ------
## (Intercept)                                1.85   1.17     1.58   0.12
## PV_count_PL_c                             -0.13   0.15    -0.84   0.41
## RearingMS                                  0.30   1.26     0.24   0.81
## HousingSI                                  2.46   1.27     1.94   0.06
## PV_count_PL_c:RearingMS                    0.07   0.22     0.30   0.76
## PV_count_PL_c:HousingSI                    0.07   0.19     0.36   0.72
## PV_count_PL_c:RearingMS:HousingSI         -0.32   0.27    -1.19   0.24
## ----------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: crossings
##                               Df Sum Sq Mean Sq F value   Pr(>F)   
## PV_count_PL_c                  1 126.76 126.762  8.5722 0.005885 **
## Rearing                        1   0.01   0.012  0.0008 0.977494   
## Housing                        1  78.03  78.030  5.2767 0.027535 * 
## PV_count_PL_c:Rearing          1  21.80  21.795  1.4739 0.232636   
## PV_count_PL_c:Housing          1   9.91   9.910  0.6701 0.418390   
## PV_count_PL_c:Rearing:Housing  1  20.95  20.955  1.4170 0.241682   
## Residuals                     36 532.35  14.788                    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -6.7395 -2.5121 -0.5761  1.9778 10.7524 
## 
## Coefficients:
##                                       Estimate Std. Error t value Pr(>|t|)  
## (Intercept)                             1.2573     1.1165   1.126   0.2676  
## PV_intensity_PL_c                       0.6901     2.6999   0.256   0.7997  
## RearingMS                               0.8274     1.2507   0.662   0.5124  
## HousingSI                               3.1522     1.2513   2.519   0.0163 *
## PV_intensity_PL_c:RearingMS            -4.4928     3.7904  -1.185   0.2437  
## PV_intensity_PL_c:HousingSI            -2.4066     3.4890  -0.690   0.4948  
## PV_intensity_PL_c:RearingMS:HousingSI   3.2646     4.7075   0.693   0.4925  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 4.044 on 36 degrees of freedom
## Multiple R-squared:  0.2545, Adjusted R-squared:  0.1303 
## F-statistic: 2.049 on 6 and 36 DF,  p-value: 0.08423
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: crossings
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 2.05, p = 0.08
## R² = 0.25
## Adj. R² = 0.13 
## 
## Standard errors: OLS
## --------------------------------------------------------------------------
##                                                Est.   S.E.   t val.      p
## ------------------------------------------- ------- ------ -------- ------
## (Intercept)                                    1.26   1.12     1.13   0.27
## PV_intensity_PL_c                              0.69   2.70     0.26   0.80
## RearingMS                                      0.83   1.25     0.66   0.51
## HousingSI                                      3.15   1.25     2.52   0.02
## PV_intensity_PL_c:RearingMS                   -4.49   3.79    -1.19   0.24
## PV_intensity_PL_c:HousingSI                   -2.41   3.49    -0.69   0.49
## PV_intensity_PL_c:RearingMS:HousingSI          3.26   4.71     0.69   0.49
## --------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: crossings
##                                   Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_intensity_PL_c                  1  74.38  74.377  4.5476 0.03986 *
## Rearing                            1   2.92   2.919  0.1785 0.67519  
## Housing                            1  95.13  95.135  5.8168 0.02110 *
## PV_intensity_PL_c:Rearing          1  19.64  19.645  1.2011 0.28038  
## PV_intensity_PL_c:Housing          1   1.09   1.086  0.0664 0.79808  
## PV_intensity_PL_c:Rearing:Housing  1   7.87   7.866  0.4809 0.49246  
## Residuals                         36 588.79  16.355                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##    Min     1Q Median     3Q    Max 
## -7.368 -2.241 -1.018  1.203 11.685 
## 
## Coefficients:
##                                    Estimate Std. Error t value Pr(>|t|)  
## (Intercept)                         1.41351    1.11268   1.270   0.2121  
## PNN_count_PL_c                      0.05833    0.16467   0.354   0.7252  
## RearingMS                           0.83258    1.25986   0.661   0.5129  
## HousingSI                           2.80525    1.25947   2.227   0.0323 *
## PNN_count_PL_c:RearingMS           -0.07385    0.19420  -0.380   0.7060  
## PNN_count_PL_c:HousingSI           -0.07785    0.21470  -0.363   0.7190  
## PNN_count_PL_c:RearingMS:HousingSI -0.21764    0.27986  -0.778   0.4419  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 4.098 on 36 degrees of freedom
## Multiple R-squared:  0.2346, Adjusted R-squared:  0.1071 
## F-statistic: 1.839 on 6 and 36 DF,  p-value: 0.1189
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: crossings
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.84, p = 0.12
## R² = 0.23
## Adj. R² = 0.11 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------
##                                             Est.   S.E.   t val.      p
## ---------------------------------------- ------- ------ -------- ------
## (Intercept)                                 1.41   1.11     1.27   0.21
## PNN_count_PL_c                              0.06   0.16     0.35   0.73
## RearingMS                                   0.83   1.26     0.66   0.51
## HousingSI                                   2.81   1.26     2.23   0.03
## PNN_count_PL_c:RearingMS                   -0.07   0.19    -0.38   0.71
## PNN_count_PL_c:HousingSI                   -0.08   0.21    -0.36   0.72
## PNN_count_PL_c:RearingMS:HousingSI         -0.22   0.28    -0.78   0.44
## -----------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: crossings
##                                Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_count_PL_c                  1  22.89  22.886  1.3629 0.25070  
## Rearing                         1   6.94   6.938  0.4132 0.52444  
## Housing                         1  92.82  92.822  5.5278 0.02431 *
## PNN_count_PL_c:Rearing          1  14.74  14.735  0.8775 0.35512  
## PNN_count_PL_c:Housing          1  37.77  37.772  2.2494 0.14238  
## PNN_count_PL_c:Rearing:Housing  1  10.15  10.155  0.6048 0.44185  
## Residuals                      36 604.51  16.792                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -6.1726 -2.8340 -0.6606  1.6282 10.9266 
## 
## Coefficients:
##                                        Estimate Std. Error t value Pr(>|t|)  
## (Intercept)                              0.9509     1.1797   0.806   0.4255  
## PNN_intensity_PL_c                       1.6348     3.2344   0.505   0.6163  
## RearingMS                                1.3809     1.3605   1.015   0.3169  
## HousingSI                                3.5686     1.3553   2.633   0.0124 *
## PNN_intensity_PL_c:RearingMS            -3.5439     5.2798  -0.671   0.5064  
## PNN_intensity_PL_c:HousingSI            -1.6134     4.4395  -0.363   0.7184  
## PNN_intensity_PL_c:RearingMS:HousingSI   9.5654     7.6354   1.253   0.2184  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 4.236 on 36 degrees of freedom
## Multiple R-squared:  0.1822, Adjusted R-squared:  0.04589 
## F-statistic: 1.337 on 6 and 36 DF,  p-value: 0.2666
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: crossings
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.34, p = 0.27
## R² = 0.18
## Adj. R² = 0.05 
## 
## Standard errors: OLS
## ---------------------------------------------------------------------------
##                                                 Est.   S.E.   t val.      p
## -------------------------------------------- ------- ------ -------- ------
## (Intercept)                                     0.95   1.18     0.81   0.43
## PNN_intensity_PL_c                              1.63   3.23     0.51   0.62
## RearingMS                                       1.38   1.36     1.02   0.32
## HousingSI                                       3.57   1.36     2.63   0.01
## PNN_intensity_PL_c:RearingMS                   -3.54   5.28    -0.67   0.51
## PNN_intensity_PL_c:HousingSI                   -1.61   4.44    -0.36   0.72
## PNN_intensity_PL_c:RearingMS:HousingSI          9.57   7.64     1.25   0.22
## ---------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: crossings
##                                    Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_intensity_PL_c                  1   0.61   0.609  0.0339 0.85487  
## Rearing                             1   8.95   8.945  0.4986 0.48467  
## Housing                             1 101.64 101.643  5.6650 0.02272 *
## PNN_intensity_PL_c:Rearing          1   0.70   0.705  0.0393 0.84402  
## PNN_intensity_PL_c:Housing          1   3.84   3.838  0.2139 0.64652  
## PNN_intensity_PL_c:Rearing:Housing  1  28.16  28.159  1.5694 0.21837  
## Residuals                          36 645.92  17.942                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -7.8281 -1.9661 -0.8929  1.3507 10.8336 
## 
## Coefficients:
##                                           Estimate Std. Error t value Pr(>|t|)
## (Intercept)                                1.25611    1.16332   1.080   0.2874
## PNN_pos_PV_count_PL_c                      0.05588    0.24360   0.229   0.8199
## RearingMS                                  0.74851    1.29955   0.576   0.5682
## HousingSI                                  3.03520    1.30211   2.331   0.0255
## PNN_pos_PV_count_PL_c:RearingMS           -0.22050    0.35217  -0.626   0.5352
## PNN_pos_PV_count_PL_c:HousingSI           -0.05130    0.31986  -0.160   0.8735
## PNN_pos_PV_count_PL_c:RearingMS:HousingSI -0.23815    0.46957  -0.507   0.6151
##                                            
## (Intercept)                                
## PNN_pos_PV_count_PL_c                      
## RearingMS                                  
## HousingSI                                 *
## PNN_pos_PV_count_PL_c:RearingMS            
## PNN_pos_PV_count_PL_c:HousingSI            
## PNN_pos_PV_count_PL_c:RearingMS:HousingSI  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 4.117 on 36 degrees of freedom
## Multiple R-squared:  0.2273, Adjusted R-squared:  0.09854 
## F-statistic: 1.765 on 6 and 36 DF,  p-value: 0.1342
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: crossings
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.77, p = 0.13
## R² = 0.23
## Adj. R² = 0.10 
## 
## Standard errors: OLS
## ------------------------------------------------------------------------------
##                                                    Est.   S.E.   t val.      p
## ----------------------------------------------- ------- ------ -------- ------
## (Intercept)                                        1.26   1.16     1.08   0.29
## PNN_pos_PV_count_PL_c                              0.06   0.24     0.23   0.82
## RearingMS                                          0.75   1.30     0.58   0.57
## HousingSI                                          3.04   1.30     2.33   0.03
## PNN_pos_PV_count_PL_c:RearingMS                   -0.22   0.35    -0.63   0.54
## PNN_pos_PV_count_PL_c:HousingSI                   -0.05   0.32    -0.16   0.87
## PNN_pos_PV_count_PL_c:RearingMS:HousingSI         -0.24   0.47    -0.51   0.62
## ------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: crossings
##                                       Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_count_PL_c                  1  29.85  29.847  1.7607 0.19290  
## Rearing                                1   3.00   3.003  0.1771 0.67636  
## Housing                                1  95.86  95.857  5.6546 0.02284 *
## PNN_pos_PV_count_PL_c:Rearing          1  37.69  37.688  2.2232 0.14466  
## PNN_pos_PV_count_PL_c:Housing          1   8.79   8.786  0.5183 0.47623  
## PNN_pos_PV_count_PL_c:Rearing:Housing  1   4.36   4.360  0.2572 0.61514  
## Residuals                             36 610.28  16.952                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -6.6751 -2.4553 -0.5274  1.8331 10.9815 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                     1.4044     1.1721   1.198
## PNN_pos_PV_intensity_PL_c                      -0.4814     2.3173  -0.208
## RearingMS                                       0.7434     1.2659   0.587
## HousingSI                                       3.0704     1.2691   2.419
## PNN_pos_PV_intensity_PL_c:RearingMS            -1.5767     2.8591  -0.551
## PNN_pos_PV_intensity_PL_c:HousingSI            -1.1777     2.7693  -0.425
## PNN_pos_PV_intensity_PL_c:RearingMS:HousingSI   0.7587     3.4905   0.217
##                                               Pr(>|t|)  
## (Intercept)                                     0.2387  
## PNN_pos_PV_intensity_PL_c                       0.8366  
## RearingMS                                       0.5607  
## HousingSI                                       0.0207 *
## PNN_pos_PV_intensity_PL_c:RearingMS             0.5847  
## PNN_pos_PV_intensity_PL_c:HousingSI             0.6732  
## PNN_pos_PV_intensity_PL_c:RearingMS:HousingSI   0.8292  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 4.01 on 36 degrees of freedom
## Multiple R-squared:  0.267,  Adjusted R-squared:  0.1448 
## F-statistic: 2.185 on 6 and 36 DF,  p-value: 0.06716
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: crossings
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 2.19, p = 0.07
## R² = 0.27
## Adj. R² = 0.14 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------------------
##                                                        Est.   S.E.   t val.      p
## --------------------------------------------------- ------- ------ -------- ------
## (Intercept)                                            1.40   1.17     1.20   0.24
## PNN_pos_PV_intensity_PL_c                             -0.48   2.32    -0.21   0.84
## RearingMS                                              0.74   1.27     0.59   0.56
## HousingSI                                              3.07   1.27     2.42   0.02
## PNN_pos_PV_intensity_PL_c:RearingMS                   -1.58   2.86    -0.55   0.58
## PNN_pos_PV_intensity_PL_c:HousingSI                   -1.18   2.77    -0.43   0.67
## PNN_pos_PV_intensity_PL_c:RearingMS:HousingSI          0.76   3.49     0.22   0.83
## ----------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: crossings
##                                           Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_intensity_PL_c                  1 109.90 109.903  6.8341 0.01298 *
## Rearing                                    1   1.32   1.317  0.0819 0.77638  
## Housing                                    1  89.86  89.856  5.5875 0.02361 *
## PNN_pos_PV_intensity_PL_c:Rearing          1   6.18   6.185  0.3846 0.53906  
## PNN_pos_PV_intensity_PL_c:Housing          1   2.86   2.857  0.1777 0.67590  
## PNN_pos_PV_intensity_PL_c:Rearing:Housing  1   0.76   0.760  0.0472 0.82916  
## Residuals                                 36 578.94  16.082                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -6.3185 -2.9049 -0.6454  1.7348 11.0066 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                      1.028      1.188   0.865
## PV_pos_PNN_intensity_PL_c                        1.740      3.031   0.574
## RearingMS                                        1.311      1.371   0.956
## HousingSI                                        3.422      1.366   2.505
## PV_pos_PNN_intensity_PL_c:RearingMS             -3.575      4.919  -0.727
## PV_pos_PNN_intensity_PL_c:HousingSI             -1.880      4.167  -0.451
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI    7.142      7.131   1.002
##                                               Pr(>|t|)  
## (Intercept)                                     0.3928  
## PV_pos_PNN_intensity_PL_c                       0.5695  
## RearingMS                                       0.3452  
## HousingSI                                       0.0169 *
## PV_pos_PNN_intensity_PL_c:RearingMS             0.4721  
## PV_pos_PNN_intensity_PL_c:HousingSI             0.6545  
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI   0.3233  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 4.288 on 36 degrees of freedom
## Multiple R-squared:  0.1618, Adjusted R-squared:  0.02215 
## F-statistic: 1.159 on 6 and 36 DF,  p-value: 0.3497
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: crossings
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.16, p = 0.35
## R² = 0.16
## Adj. R² = 0.02 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------------------
##                                                        Est.   S.E.   t val.      p
## --------------------------------------------------- ------- ------ -------- ------
## (Intercept)                                            1.03   1.19     0.86   0.39
## PV_pos_PNN_intensity_PL_c                              1.74   3.03     0.57   0.57
## RearingMS                                              1.31   1.37     0.96   0.35
## HousingSI                                              3.42   1.37     2.51   0.02
## PV_pos_PNN_intensity_PL_c:RearingMS                   -3.57   4.92    -0.73   0.47
## PV_pos_PNN_intensity_PL_c:HousingSI                   -1.88   4.17    -0.45   0.65
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI          7.14   7.13     1.00   0.32
## ----------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: crossings
##                                           Df Sum Sq Mean Sq F value Pr(>F)  
## PV_pos_PNN_intensity_PL_c                  1   0.01   0.010  0.0005 0.9817  
## Rearing                                    1   7.98   7.975  0.4337 0.5144  
## Housing                                    1 100.75 100.750  5.4790 0.0249 *
## PV_pos_PNN_intensity_PL_c:Rearing          1   0.11   0.106  0.0058 0.9399  
## PV_pos_PNN_intensity_PL_c:Housing          1   0.54   0.542  0.0295 0.8647  
## PV_pos_PNN_intensity_PL_c:Rearing:Housing  1  18.44  18.445  1.0030 0.3233  
## Residuals                                 36 661.99  18.389                 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##    Min     1Q Median     3Q    Max 
## -6.330 -2.176 -1.153  1.336 11.924 
## 
## Coefficients:
##                                   Estimate Std. Error t value Pr(>|t|)  
## (Intercept)                        2.10769    1.23427   1.708   0.0963 .
## PV_count_IL_c                     -0.11384    0.16235  -0.701   0.4877  
## RearingMS                         -0.01906    1.34684  -0.014   0.9888  
## HousingSI                          1.96356    1.34664   1.458   0.1535  
## PV_count_IL_c:RearingMS            0.12054    0.20548   0.587   0.5611  
## PV_count_IL_c:HousingSI            0.07289    0.19477   0.374   0.7104  
## PV_count_IL_c:RearingMS:HousingSI -0.35446    0.26573  -1.334   0.1906  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 4.046 on 36 degrees of freedom
## Multiple R-squared:  0.2537, Adjusted R-squared:  0.1293 
## F-statistic:  2.04 on 6 and 36 DF,  p-value: 0.08547
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: crossings
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 2.04, p = 0.09
## R² = 0.25
## Adj. R² = 0.13 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------
##                                            Est.   S.E.   t val.      p
## --------------------------------------- ------- ------ -------- ------
## (Intercept)                                2.11   1.23     1.71   0.10
## PV_count_IL_c                             -0.11   0.16    -0.70   0.49
## RearingMS                                 -0.02   1.35    -0.01   0.99
## HousingSI                                  1.96   1.35     1.46   0.15
## PV_count_IL_c:RearingMS                    0.12   0.21     0.59   0.56
## PV_count_IL_c:HousingSI                    0.07   0.19     0.37   0.71
## PV_count_IL_c:RearingMS:HousingSI         -0.35   0.27    -1.33   0.19
## ----------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: crossings
##                               Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_count_IL_c                  1  78.78  78.780  4.8115 0.03481 *
## Rearing                        1   0.21   0.208  0.0127 0.91093  
## Housing                        1  68.03  68.028  4.1548 0.04891 *
## PV_count_IL_c:Rearing          1   7.02   7.025  0.4290 0.51662  
## PV_count_IL_c:Housing          1  17.21  17.207  1.0509 0.31213  
## PV_count_IL_c:Rearing:Housing  1  29.13  29.133  1.7793 0.19062  
## Residuals                     36 589.44  16.373                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -5.7774 -2.9407 -0.6665  1.7873 11.5702 
## 
## Coefficients:
##                                       Estimate Std. Error t value Pr(>|t|)  
## (Intercept)                             1.3737     1.1786   1.166   0.2514  
## PV_intensity_IL_c                       0.5129     3.9381   0.130   0.8971  
## RearingMS                               1.1351     1.3266   0.856   0.3979  
## HousingSI                               2.9346     1.3268   2.212   0.0334 *
## PV_intensity_IL_c:RearingMS            -3.9713     4.8936  -0.812   0.4224  
## PV_intensity_IL_c:HousingSI            -1.2108     4.6983  -0.258   0.7981  
## PV_intensity_IL_c:RearingMS:HousingSI   3.7340     6.2238   0.600   0.5523  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 4.263 on 36 degrees of freedom
## Multiple R-squared:  0.1715, Adjusted R-squared:  0.03346 
## F-statistic: 1.242 on 6 and 36 DF,  p-value: 0.3082
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: crossings
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.24, p = 0.31
## R² = 0.17
## Adj. R² = 0.03 
## 
## Standard errors: OLS
## --------------------------------------------------------------------------
##                                                Est.   S.E.   t val.      p
## ------------------------------------------- ------- ------ -------- ------
## (Intercept)                                    1.37   1.18     1.17   0.25
## PV_intensity_IL_c                              0.51   3.94     0.13   0.90
## RearingMS                                      1.14   1.33     0.86   0.40
## HousingSI                                      2.93   1.33     2.21   0.03
## PV_intensity_IL_c:RearingMS                   -3.97   4.89    -0.81   0.42
## PV_intensity_IL_c:HousingSI                   -1.21   4.70    -0.26   0.80
## PV_intensity_IL_c:RearingMS:HousingSI          3.73   6.22     0.60   0.55
## --------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: crossings
##                                   Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_intensity_IL_c                  1  21.87  21.870  1.2032 0.27996  
## Rearing                            1   5.59   5.592  0.3077 0.58254  
## Housing                            1  93.11  93.105  5.1224 0.02975 *
## PV_intensity_IL_c:Rearing          1   6.76   6.764  0.3721 0.54568  
## PV_intensity_IL_c:Housing          1   1.61   1.607  0.0884 0.76791  
## PV_intensity_IL_c:Rearing:Housing  1   6.54   6.543  0.3600 0.55229  
## Residuals                         36 654.34  18.176                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -7.1389 -2.3194 -1.3113  0.9329 11.6828 
## 
## Coefficients:
##                                      Estimate Std. Error t value Pr(>|t|)  
## (Intercept)                         1.3449948  1.1722974   1.147   0.2588  
## PNN_count_IL_c                      0.0017105  0.1250975   0.014   0.9892  
## RearingMS                           0.9745134  1.3179897   0.739   0.4645  
## HousingSI                           2.9511033  1.3181662   2.239   0.0314 *
## PNN_count_IL_c:RearingMS           -0.0009826  0.1612604  -0.006   0.9952  
## PNN_count_IL_c:HousingSI            0.0173456  0.1625464   0.107   0.9156  
## PNN_count_IL_c:RearingMS:HousingSI -0.1850629  0.2459220  -0.753   0.4566  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 4.285 on 36 degrees of freedom
## Multiple R-squared:  0.1632, Adjusted R-squared:  0.0237 
## F-statistic:  1.17 on 6 and 36 DF,  p-value: 0.3439
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: crossings
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.17, p = 0.34
## R² = 0.16
## Adj. R² = 0.02 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------
##                                             Est.   S.E.   t val.      p
## ---------------------------------------- ------- ------ -------- ------
## (Intercept)                                 1.34   1.17     1.15   0.26
## PNN_count_IL_c                              0.00   0.13     0.01   0.99
## RearingMS                                   0.97   1.32     0.74   0.46
## HousingSI                                   2.95   1.32     2.24   0.03
## PNN_count_IL_c:RearingMS                   -0.00   0.16    -0.01   1.00
## PNN_count_IL_c:HousingSI                    0.02   0.16     0.11   0.92
## PNN_count_IL_c:RearingMS:HousingSI         -0.19   0.25    -0.75   0.46
## -----------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: crossings
##                                Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_count_IL_c                  1   4.79   4.787  0.2608 0.61272  
## Rearing                         1   7.40   7.396  0.4029 0.52963  
## Housing                         1  95.88  95.878  5.2222 0.02829 *
## PNN_count_IL_c:Rearing          1   5.38   5.384  0.2933 0.59147  
## PNN_count_IL_c:Housing          1   5.03   5.032  0.2741 0.60383  
## PNN_count_IL_c:Rearing:Housing  1  10.40  10.397  0.5663 0.45663  
## Residuals                      36 660.94  18.360                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##    Min     1Q Median     3Q    Max 
## -4.751 -2.932 -0.823  1.678 10.042 
## 
## Coefficients:
##                                        Estimate Std. Error t value Pr(>|t|)   
## (Intercept)                              0.9681     1.0940   0.885  0.38206   
## PNN_intensity_IL_c                       2.9141     3.3306   0.875  0.38741   
## RearingMS                                1.0196     1.2482   0.817  0.41940   
## HousingSI                                3.5363     1.2486   2.832  0.00752 **
## PNN_intensity_IL_c:RearingMS            -8.8286     6.6272  -1.332  0.19117   
## PNN_intensity_IL_c:HousingSI            -2.1871     5.1976  -0.421  0.67641   
## PNN_intensity_IL_c:RearingMS:HousingSI  17.9152     8.7578   2.046  0.04815 * 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.975 on 36 degrees of freedom
## Multiple R-squared:  0.2799, Adjusted R-squared:  0.1599 
## F-statistic: 2.333 on 6 and 36 DF,  p-value: 0.05264
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: crossings
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 2.33, p = 0.05
## R² = 0.28
## Adj. R² = 0.16 
## 
## Standard errors: OLS
## ---------------------------------------------------------------------------
##                                                 Est.   S.E.   t val.      p
## -------------------------------------------- ------- ------ -------- ------
## (Intercept)                                     0.97   1.09     0.88   0.38
## PNN_intensity_IL_c                              2.91   3.33     0.87   0.39
## RearingMS                                       1.02   1.25     0.82   0.42
## HousingSI                                       3.54   1.25     2.83   0.01
## PNN_intensity_IL_c:RearingMS                   -8.83   6.63    -1.33   0.19
## PNN_intensity_IL_c:HousingSI                   -2.19   5.20    -0.42   0.68
## PNN_intensity_IL_c:RearingMS:HousingSI         17.92   8.76     2.05   0.05
## ---------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: crossings
##                                    Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_intensity_IL_c                  1  22.34  22.341  1.4142 0.24214  
## Rearing                             1  11.24  11.239  0.7114 0.40455  
## Housing                             1 101.40 101.401  6.4187 0.01579 *
## PNN_intensity_IL_c:Rearing          1   4.62   4.620  0.2924 0.59200  
## PNN_intensity_IL_c:Housing          1  15.39  15.395  0.9745 0.33015  
## PNN_intensity_IL_c:Rearing:Housing  1  66.11  66.106  4.1845 0.04815 *
## Residuals                          36 568.72  15.798                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -6.4543 -2.2603 -0.8768  0.8770 11.4881 
## 
## Coefficients:
##                                           Estimate Std. Error t value Pr(>|t|)
## (Intercept)                                1.28130    1.23223   1.040   0.3054
## PNN_pos_PV_count_IL_c                      0.04948    0.29821   0.166   0.8691
## RearingMS                                  0.94097    1.35947   0.692   0.4933
## HousingSI                                  2.99496    1.36105   2.200   0.0343
## PNN_pos_PV_count_IL_c:RearingMS           -0.13203    0.40018  -0.330   0.7434
## PNN_pos_PV_count_IL_c:HousingSI            0.03193    0.36777   0.087   0.9313
## PNN_pos_PV_count_IL_c:RearingMS:HousingSI -0.18839    0.56235  -0.335   0.7396
##                                            
## (Intercept)                                
## PNN_pos_PV_count_IL_c                      
## RearingMS                                  
## HousingSI                                 *
## PNN_pos_PV_count_IL_c:RearingMS            
## PNN_pos_PV_count_IL_c:HousingSI            
## PNN_pos_PV_count_IL_c:RearingMS:HousingSI  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 4.309 on 36 degrees of freedom
## Multiple R-squared:  0.1536, Adjusted R-squared:  0.01257 
## F-statistic: 1.089 on 6 and 36 DF,  p-value: 0.3875
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: crossings
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.09, p = 0.39
## R² = 0.15
## Adj. R² = 0.01 
## 
## Standard errors: OLS
## ------------------------------------------------------------------------------
##                                                    Est.   S.E.   t val.      p
## ----------------------------------------------- ------- ------ -------- ------
## (Intercept)                                        1.28   1.23     1.04   0.31
## PNN_pos_PV_count_IL_c                              0.05   0.30     0.17   0.87
## RearingMS                                          0.94   1.36     0.69   0.49
## HousingSI                                          2.99   1.36     2.20   0.03
## PNN_pos_PV_count_IL_c:RearingMS                   -0.13   0.40    -0.33   0.74
## PNN_pos_PV_count_IL_c:HousingSI                    0.03   0.37     0.09   0.93
## PNN_pos_PV_count_IL_c:RearingMS:HousingSI         -0.19   0.56    -0.34   0.74
## ------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: crossings
##                                       Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_count_IL_c                  1   3.92   3.922  0.2112 0.64860  
## Rearing                                1   6.21   6.206  0.3342 0.56680  
## Housing                                1  96.65  96.652  5.2050 0.02854 *
## PNN_pos_PV_count_IL_c:Rearing          1  11.82  11.823  0.6367 0.43013  
## PNN_pos_PV_count_IL_c:Housing          1   0.65   0.652  0.0351 0.85236  
## PNN_pos_PV_count_IL_c:Rearing:Housing  1   2.08   2.084  0.1122 0.73956  
## Residuals                             36 668.48  18.569                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -5.6379 -2.9383 -0.6187  1.7849 11.7189 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                     1.4307     1.1760   1.217
## PNN_pos_PV_intensity_IL_c                      -0.5407     3.4488  -0.157
## RearingMS                                       1.0528     1.3185   0.798
## HousingSI                                       2.9014     1.3186   2.200
## PNN_pos_PV_intensity_IL_c:RearingMS            -2.0166     3.9828  -0.506
## PNN_pos_PV_intensity_IL_c:HousingSI            -0.8779     4.2365  -0.207
## PNN_pos_PV_intensity_IL_c:RearingMS:HousingSI   2.6592     5.3166   0.500
##                                               Pr(>|t|)  
## (Intercept)                                     0.2317  
## PNN_pos_PV_intensity_IL_c                       0.8763  
## RearingMS                                       0.4298  
## HousingSI                                       0.0343 *
## PNN_pos_PV_intensity_IL_c:RearingMS             0.6157  
## PNN_pos_PV_intensity_IL_c:HousingSI             0.8370  
## PNN_pos_PV_intensity_IL_c:RearingMS:HousingSI   0.6200  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 4.237 on 36 degrees of freedom
## Multiple R-squared:  0.1817, Adjusted R-squared:  0.0453 
## F-statistic: 1.332 on 6 and 36 DF,  p-value: 0.2684
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: crossings
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.33, p = 0.27
## R² = 0.18
## Adj. R² = 0.05 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------------------
##                                                        Est.   S.E.   t val.      p
## --------------------------------------------------- ------- ------ -------- ------
## (Intercept)                                            1.43   1.18     1.22   0.23
## PNN_pos_PV_intensity_IL_c                             -0.54   3.45    -0.16   0.88
## RearingMS                                              1.05   1.32     0.80   0.43
## HousingSI                                              2.90   1.32     2.20   0.03
## PNN_pos_PV_intensity_IL_c:RearingMS                   -2.02   3.98    -0.51   0.62
## PNN_pos_PV_intensity_IL_c:HousingSI                   -0.88   4.24    -0.21   0.84
## PNN_pos_PV_intensity_IL_c:RearingMS:HousingSI          2.66   5.32     0.50   0.62
## ----------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: crossings
##                                           Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_intensity_IL_c                  1  45.39  45.392  2.5283 0.12056  
## Rearing                                    1   5.08   5.079  0.2829 0.59808  
## Housing                                    1  85.23  85.229  4.7473 0.03597 *
## PNN_pos_PV_intensity_IL_c:Rearing          1   1.44   1.436  0.0800 0.77894  
## PNN_pos_PV_intensity_IL_c:Housing          1   1.87   1.873  0.1043 0.74858  
## PNN_pos_PV_intensity_IL_c:Rearing:Housing  1   4.49   4.491  0.2502 0.62000  
## Residuals                                 36 646.32  17.953                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -5.3161 -2.6239 -0.7814  1.8544 10.3988 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                      1.075      1.100   0.978
## PV_pos_PNN_intensity_IL_c                        2.550      2.893   0.882
## RearingMS                                        1.289      1.249   1.032
## HousingSI                                        3.294      1.249   2.637
## PV_pos_PNN_intensity_IL_c:RearingMS             -6.199      4.919  -1.260
## PV_pos_PNN_intensity_IL_c:HousingSI             -3.239      4.305  -0.752
## PV_pos_PNN_intensity_IL_c:RearingMS:HousingSI   13.691      6.681   2.049
##                                               Pr(>|t|)  
## (Intercept)                                     0.3347  
## PV_pos_PNN_intensity_IL_c                       0.3838  
## RearingMS                                       0.3089  
## HousingSI                                       0.0123 *
## PV_pos_PNN_intensity_IL_c:RearingMS             0.2157  
## PV_pos_PNN_intensity_IL_c:HousingSI             0.4568  
## PV_pos_PNN_intensity_IL_c:RearingMS:HousingSI   0.0478 *
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 4.033 on 36 degrees of freedom
## Multiple R-squared:  0.2588, Adjusted R-squared:  0.1353 
## F-statistic: 2.095 on 6 and 36 DF,  p-value: 0.07799
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: crossings
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 2.10, p = 0.08
## R² = 0.26
## Adj. R² = 0.14 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------------------
##                                                        Est.   S.E.   t val.      p
## --------------------------------------------------- ------- ------ -------- ------
## (Intercept)                                            1.08   1.10     0.98   0.33
## PV_pos_PNN_intensity_IL_c                              2.55   2.89     0.88   0.38
## RearingMS                                              1.29   1.25     1.03   0.31
## HousingSI                                              3.29   1.25     2.64   0.01
## PV_pos_PNN_intensity_IL_c:RearingMS                   -6.20   4.92    -1.26   0.22
## PV_pos_PNN_intensity_IL_c:HousingSI                   -3.24   4.31    -0.75   0.46
## PV_pos_PNN_intensity_IL_c:RearingMS:HousingSI         13.69   6.68     2.05   0.05
## ----------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: crossings
##                                           Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_pos_PNN_intensity_IL_c                  1   9.28   9.281  0.5707 0.45488  
## Rearing                                    1   8.07   8.068  0.4962 0.48572  
## Housing                                    1 106.46 106.459  6.5468 0.01486 *
## PV_pos_PNN_intensity_IL_c:Rearing          1   3.66   3.657  0.2249 0.63822  
## PV_pos_PNN_intensity_IL_c:Housing          1   8.67   8.666  0.5329 0.47011  
## PV_pos_PNN_intensity_IL_c:Rearing:Housing  1  68.28  68.283  4.1991 0.04779 *
## Residuals                                 36 585.40  16.261                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## [[1]]
## Analysis of Variance Table
## 
## Response: crossings
##                               Df Sum Sq Mean Sq F value   Pr(>F)   
## PV_count_PL_c                  1 126.76 126.762  8.5722 0.005885 **
## Rearing                        1   0.01   0.012  0.0008 0.977494   
## Housing                        1  78.03  78.030  5.2767 0.027535 * 
## PV_count_PL_c:Rearing          1  21.80  21.795  1.4739 0.232636   
## PV_count_PL_c:Housing          1   9.91   9.910  0.6701 0.418390   
## PV_count_PL_c:Rearing:Housing  1  20.95  20.955  1.4170 0.241682   
## Residuals                     36 532.35  14.788                    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[2]]
## Analysis of Variance Table
## 
## Response: crossings
##                                   Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_intensity_PL_c                  1  74.38  74.377  4.5476 0.03986 *
## Rearing                            1   2.92   2.919  0.1785 0.67519  
## Housing                            1  95.13  95.135  5.8168 0.02110 *
## PV_intensity_PL_c:Rearing          1  19.64  19.645  1.2011 0.28038  
## PV_intensity_PL_c:Housing          1   1.09   1.086  0.0664 0.79808  
## PV_intensity_PL_c:Rearing:Housing  1   7.87   7.866  0.4809 0.49246  
## Residuals                         36 588.79  16.355                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[3]]
## Analysis of Variance Table
## 
## Response: crossings
##                                Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_count_PL_c                  1  22.89  22.886  1.3629 0.25070  
## Rearing                         1   6.94   6.938  0.4132 0.52444  
## Housing                         1  92.82  92.822  5.5278 0.02431 *
## PNN_count_PL_c:Rearing          1  14.74  14.735  0.8775 0.35512  
## PNN_count_PL_c:Housing          1  37.77  37.772  2.2494 0.14238  
## PNN_count_PL_c:Rearing:Housing  1  10.15  10.155  0.6048 0.44185  
## Residuals                      36 604.51  16.792                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[4]]
## Analysis of Variance Table
## 
## Response: crossings
##                                    Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_intensity_PL_c                  1   0.61   0.609  0.0339 0.85487  
## Rearing                             1   8.95   8.945  0.4986 0.48467  
## Housing                             1 101.64 101.643  5.6650 0.02272 *
## PNN_intensity_PL_c:Rearing          1   0.70   0.705  0.0393 0.84402  
## PNN_intensity_PL_c:Housing          1   3.84   3.838  0.2139 0.64652  
## PNN_intensity_PL_c:Rearing:Housing  1  28.16  28.159  1.5694 0.21837  
## Residuals                          36 645.92  17.942                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[5]]
## Analysis of Variance Table
## 
## Response: crossings
##                                       Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_count_PL_c                  1  29.85  29.847  1.7607 0.19290  
## Rearing                                1   3.00   3.003  0.1771 0.67636  
## Housing                                1  95.86  95.857  5.6546 0.02284 *
## PNN_pos_PV_count_PL_c:Rearing          1  37.69  37.688  2.2232 0.14466  
## PNN_pos_PV_count_PL_c:Housing          1   8.79   8.786  0.5183 0.47623  
## PNN_pos_PV_count_PL_c:Rearing:Housing  1   4.36   4.360  0.2572 0.61514  
## Residuals                             36 610.28  16.952                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[6]]
## Analysis of Variance Table
## 
## Response: crossings
##                                           Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_intensity_PL_c                  1 109.90 109.903  6.8341 0.01298 *
## Rearing                                    1   1.32   1.317  0.0819 0.77638  
## Housing                                    1  89.86  89.856  5.5875 0.02361 *
## PNN_pos_PV_intensity_PL_c:Rearing          1   6.18   6.185  0.3846 0.53906  
## PNN_pos_PV_intensity_PL_c:Housing          1   2.86   2.857  0.1777 0.67590  
## PNN_pos_PV_intensity_PL_c:Rearing:Housing  1   0.76   0.760  0.0472 0.82916  
## Residuals                                 36 578.94  16.082                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[7]]
## Analysis of Variance Table
## 
## Response: crossings
##                                           Df Sum Sq Mean Sq F value Pr(>F)  
## PV_pos_PNN_intensity_PL_c                  1   0.01   0.010  0.0005 0.9817  
## Rearing                                    1   7.98   7.975  0.4337 0.5144  
## Housing                                    1 100.75 100.750  5.4790 0.0249 *
## PV_pos_PNN_intensity_PL_c:Rearing          1   0.11   0.106  0.0058 0.9399  
## PV_pos_PNN_intensity_PL_c:Housing          1   0.54   0.542  0.0295 0.8647  
## PV_pos_PNN_intensity_PL_c:Rearing:Housing  1  18.44  18.445  1.0030 0.3233  
## Residuals                                 36 661.99  18.389                 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[8]]
## Analysis of Variance Table
## 
## Response: crossings
##                               Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_count_IL_c                  1  78.78  78.780  4.8115 0.03481 *
## Rearing                        1   0.21   0.208  0.0127 0.91093  
## Housing                        1  68.03  68.028  4.1548 0.04891 *
## PV_count_IL_c:Rearing          1   7.02   7.025  0.4290 0.51662  
## PV_count_IL_c:Housing          1  17.21  17.207  1.0509 0.31213  
## PV_count_IL_c:Rearing:Housing  1  29.13  29.133  1.7793 0.19062  
## Residuals                     36 589.44  16.373                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[9]]
## Analysis of Variance Table
## 
## Response: crossings
##                                   Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_intensity_IL_c                  1  21.87  21.870  1.2032 0.27996  
## Rearing                            1   5.59   5.592  0.3077 0.58254  
## Housing                            1  93.11  93.105  5.1224 0.02975 *
## PV_intensity_IL_c:Rearing          1   6.76   6.764  0.3721 0.54568  
## PV_intensity_IL_c:Housing          1   1.61   1.607  0.0884 0.76791  
## PV_intensity_IL_c:Rearing:Housing  1   6.54   6.543  0.3600 0.55229  
## Residuals                         36 654.34  18.176                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[10]]
## Analysis of Variance Table
## 
## Response: crossings
##                                Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_count_IL_c                  1   4.79   4.787  0.2608 0.61272  
## Rearing                         1   7.40   7.396  0.4029 0.52963  
## Housing                         1  95.88  95.878  5.2222 0.02829 *
## PNN_count_IL_c:Rearing          1   5.38   5.384  0.2933 0.59147  
## PNN_count_IL_c:Housing          1   5.03   5.032  0.2741 0.60383  
## PNN_count_IL_c:Rearing:Housing  1  10.40  10.397  0.5663 0.45663  
## Residuals                      36 660.94  18.360                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[11]]
## Analysis of Variance Table
## 
## Response: crossings
##                                    Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_intensity_IL_c                  1  22.34  22.341  1.4142 0.24214  
## Rearing                             1  11.24  11.239  0.7114 0.40455  
## Housing                             1 101.40 101.401  6.4187 0.01579 *
## PNN_intensity_IL_c:Rearing          1   4.62   4.620  0.2924 0.59200  
## PNN_intensity_IL_c:Housing          1  15.39  15.395  0.9745 0.33015  
## PNN_intensity_IL_c:Rearing:Housing  1  66.11  66.106  4.1845 0.04815 *
## Residuals                          36 568.72  15.798                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[12]]
## Analysis of Variance Table
## 
## Response: crossings
##                                       Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_count_IL_c                  1   3.92   3.922  0.2112 0.64860  
## Rearing                                1   6.21   6.206  0.3342 0.56680  
## Housing                                1  96.65  96.652  5.2050 0.02854 *
## PNN_pos_PV_count_IL_c:Rearing          1  11.82  11.823  0.6367 0.43013  
## PNN_pos_PV_count_IL_c:Housing          1   0.65   0.652  0.0351 0.85236  
## PNN_pos_PV_count_IL_c:Rearing:Housing  1   2.08   2.084  0.1122 0.73956  
## Residuals                             36 668.48  18.569                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[13]]
## Analysis of Variance Table
## 
## Response: crossings
##                                           Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_intensity_IL_c                  1  45.39  45.392  2.5283 0.12056  
## Rearing                                    1   5.08   5.079  0.2829 0.59808  
## Housing                                    1  85.23  85.229  4.7473 0.03597 *
## PNN_pos_PV_intensity_IL_c:Rearing          1   1.44   1.436  0.0800 0.77894  
## PNN_pos_PV_intensity_IL_c:Housing          1   1.87   1.873  0.1043 0.74858  
## PNN_pos_PV_intensity_IL_c:Rearing:Housing  1   4.49   4.491  0.2502 0.62000  
## Residuals                                 36 646.32  17.953                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[14]]
## Analysis of Variance Table
## 
## Response: crossings
##                                           Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_pos_PNN_intensity_IL_c                  1   9.28   9.281  0.5707 0.45488  
## Rearing                                    1   8.07   8.068  0.4962 0.48572  
## Housing                                    1 106.46 106.459  6.5468 0.01486 *
## PV_pos_PNN_intensity_IL_c:Rearing          1   3.66   3.657  0.2249 0.63822  
## PV_pos_PNN_intensity_IL_c:Housing          1   8.67   8.666  0.5329 0.47011  
## PV_pos_PNN_intensity_IL_c:Rearing:Housing  1  68.28  68.283  4.1991 0.04779 *
## Residuals                                 36 585.40  16.261                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

Male - Frequency in the open

# Returning summary, summ, and anova stats for every linear model in the malelm_freq_open list
lapply(malelm_freq_open, function(x){
    print(summary(x))
    print(summ(x))
    print(anova(x))
})
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -5.1044 -2.9985 -0.1653  1.4570 12.3250 
## 
## Coefficients:
##                                   Estimate Std. Error t value Pr(>|t|)   
## (Intercept)                        3.73473    1.23292   3.029  0.00452 **
## PV_count_PL_c                     -0.12592    0.16077  -0.783  0.43860   
## RearingMS                         -0.08382    1.32331  -0.063  0.94984   
## HousingSI                          1.74216    1.33528   1.305  0.20027   
## PV_count_PL_c:RearingMS            0.12354    0.22845   0.541  0.59198   
## PV_count_PL_c:HousingSI            0.07043    0.20031   0.352  0.72717   
## PV_count_PL_c:RearingMS:HousingSI -0.22215    0.27933  -0.795  0.43165   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 4.051 on 36 degrees of freedom
## Multiple R-squared:  0.1447, Adjusted R-squared:  0.002094 
## F-statistic: 1.015 on 6 and 36 DF,  p-value: 0.4313
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: freq_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.01, p = 0.43
## R² = 0.14
## Adj. R² = 0.00 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------
##                                            Est.   S.E.   t val.      p
## --------------------------------------- ------- ------ -------- ------
## (Intercept)                                3.73   1.23     3.03   0.00
## PV_count_PL_c                             -0.13   0.16    -0.78   0.44
## RearingMS                                 -0.08   1.32    -0.06   0.95
## HousingSI                                  1.74   1.34     1.30   0.20
## PV_count_PL_c:RearingMS                    0.12   0.23     0.54   0.59
## PV_count_PL_c:HousingSI                    0.07   0.20     0.35   0.73
## PV_count_PL_c:RearingMS:HousingSI         -0.22   0.28    -0.80   0.43
## ----------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: freq_open
##                               Df Sum Sq Mean Sq F value Pr(>F)
## PV_count_PL_c                  1  41.33  41.334  2.5191 0.1212
## Rearing                        1   0.76   0.760  0.0463 0.8308
## Housing                        1  44.40  44.401  2.7060 0.1087
## PV_count_PL_c:Rearing          1   0.73   0.734  0.0447 0.8337
## PV_count_PL_c:Housing          1   2.29   2.289  0.1395 0.7109
## PV_count_PL_c:Rearing:Housing  1  10.38  10.378  0.6325 0.4317
## Residuals                     36 590.71  16.409               
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##    Min     1Q Median     3Q    Max 
## -5.390 -2.658 -0.658  1.949 10.617 
## 
## Coefficients:
##                                       Estimate Std. Error t value Pr(>|t|)   
## (Intercept)                             3.1283     1.1078   2.824  0.00768 **
## PV_intensity_PL_c                       1.5098     2.6788   0.564  0.57651   
## RearingMS                               0.2261     1.2408   0.182  0.85642   
## HousingSI                               2.4350     1.2414   1.961  0.05760 . 
## PV_intensity_PL_c:RearingMS            -4.5679     3.7606  -1.215  0.23240   
## PV_intensity_PL_c:HousingSI            -3.8203     3.4616  -1.104  0.27708   
## PV_intensity_PL_c:RearingMS:HousingSI   5.3982     4.6705   1.156  0.25537   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 4.012 on 36 degrees of freedom
## Multiple R-squared:  0.1608, Adjusted R-squared:  0.02089 
## F-statistic: 1.149 on 6 and 36 DF,  p-value: 0.3546
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: freq_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.15, p = 0.35
## R² = 0.16
## Adj. R² = 0.02 
## 
## Standard errors: OLS
## --------------------------------------------------------------------------
##                                                Est.   S.E.   t val.      p
## ------------------------------------------- ------- ------ -------- ------
## (Intercept)                                    3.13   1.11     2.82   0.01
## PV_intensity_PL_c                              1.51   2.68     0.56   0.58
## RearingMS                                      0.23   1.24     0.18   0.86
## HousingSI                                      2.43   1.24     1.96   0.06
## PV_intensity_PL_c:RearingMS                   -4.57   3.76    -1.21   0.23
## PV_intensity_PL_c:HousingSI                   -3.82   3.46    -1.10   0.28
## PV_intensity_PL_c:RearingMS:HousingSI          5.40   4.67     1.16   0.26
## --------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: freq_open
##                                   Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_intensity_PL_c                  1  31.31  31.307  1.9446 0.17172  
## Rearing                            1   0.00   0.001  0.0000 0.99487  
## Housing                            1  51.65  51.654  3.2084 0.08167 .
## PV_intensity_PL_c:Rearing          1   4.46   4.464  0.2773 0.60173  
## PV_intensity_PL_c:Housing          1   2.09   2.090  0.1298 0.72075  
## PV_intensity_PL_c:Rearing:Housing  1  21.51  21.507  1.3359 0.25537  
## Residuals                         36 579.58  16.100                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -5.3811 -2.4790 -0.4023  1.0090 12.7625 
## 
## Coefficients:
##                                      Estimate Std. Error t value Pr(>|t|)   
## (Intercept)                         3.2393886  1.1171349   2.900  0.00633 **
## PNN_count_PL_c                      0.1050197  0.1653258   0.635  0.52930   
## RearingMS                           0.2723783  1.2649111   0.215  0.83072   
## HousingSI                           2.1975912  1.2645150   1.738  0.09078 . 
## PNN_count_PL_c:RearingMS           -0.0433671  0.1949782  -0.222  0.82524   
## PNN_count_PL_c:HousingSI           -0.1757417  0.2155582  -0.815  0.42027   
## PNN_count_PL_c:RearingMS:HousingSI  0.0002922  0.2809830   0.001  0.99918   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 4.114 on 36 degrees of freedom
## Multiple R-squared:  0.1176, Adjusted R-squared:  -0.02942 
## F-statistic: 0.7999 on 6 and 36 DF,  p-value: 0.5764
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: freq_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 0.80, p = 0.58
## R² = 0.12
## Adj. R² = -0.03 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------
##                                             Est.   S.E.   t val.      p
## ---------------------------------------- ------- ------ -------- ------
## (Intercept)                                 3.24   1.12     2.90   0.01
## PNN_count_PL_c                              0.11   0.17     0.64   0.53
## RearingMS                                   0.27   1.26     0.22   0.83
## HousingSI                                   2.20   1.26     1.74   0.09
## PNN_count_PL_c:RearingMS                   -0.04   0.19    -0.22   0.83
## PNN_count_PL_c:HousingSI                   -0.18   0.22    -0.82   0.42
## PNN_count_PL_c:RearingMS:HousingSI          0.00   0.28     0.00   1.00
## -----------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: freq_open
##                                Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_count_PL_c                  1   0.12   0.124  0.0073 0.93218  
## Rearing                         1   0.47   0.466  0.0276 0.86909  
## Housing                         1  53.25  53.245  3.1456 0.08459 .
## PNN_count_PL_c:Rearing          1   0.00   0.002  0.0001 0.99170  
## PNN_count_PL_c:Housing          1  27.40  27.404  1.6190 0.21139  
## PNN_count_PL_c:Rearing:Housing  1   0.00   0.000  0.0000 0.99918  
## Residuals                      36 609.36  16.927                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##    Min     1Q Median     3Q    Max 
## -4.821 -2.253 -1.119  2.569 11.745 
## 
## Coefficients:
##                                        Estimate Std. Error t value Pr(>|t|)  
## (Intercept)                              2.8756     1.1415   2.519   0.0163 *
## PNN_intensity_PL_c                       2.8819     3.1297   0.921   0.3633  
## RearingMS                                0.6099     1.3164   0.463   0.6459  
## HousingSI                                2.7135     1.3114   2.069   0.0458 *
## PNN_intensity_PL_c:RearingMS            -4.8616     5.1089  -0.952   0.3476  
## PNN_intensity_PL_c:HousingSI            -2.7798     4.2958  -0.647   0.5217  
## PNN_intensity_PL_c:RearingMS:HousingSI   8.9504     7.3882   1.211   0.2336  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 4.099 on 36 degrees of freedom
## Multiple R-squared:  0.1243, Adjusted R-squared:  -0.02167 
## F-statistic: 0.8515 on 6 and 36 DF,  p-value: 0.5393
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: freq_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 0.85, p = 0.54
## R² = 0.12
## Adj. R² = -0.02 
## 
## Standard errors: OLS
## ---------------------------------------------------------------------------
##                                                 Est.   S.E.   t val.      p
## -------------------------------------------- ------- ------ -------- ------
## (Intercept)                                     2.88   1.14     2.52   0.02
## PNN_intensity_PL_c                              2.88   3.13     0.92   0.36
## RearingMS                                       0.61   1.32     0.46   0.65
## HousingSI                                       2.71   1.31     2.07   0.05
## PNN_intensity_PL_c:RearingMS                   -4.86   5.11    -0.95   0.35
## PNN_intensity_PL_c:HousingSI                   -2.78   4.30    -0.65   0.52
## PNN_intensity_PL_c:RearingMS:HousingSI          8.95   7.39     1.21   0.23
## ---------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: freq_open
##                                    Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_intensity_PL_c                  1   3.14   3.137  0.1867 0.66823  
## Rearing                             1   1.05   1.050  0.0625 0.80401  
## Housing                             1  56.29  56.290  3.3507 0.07546 .
## PNN_intensity_PL_c:Rearing          1   0.59   0.589  0.0351 0.85248  
## PNN_intensity_PL_c:Housing          1   0.11   0.112  0.0066 0.93547  
## PNN_intensity_PL_c:Rearing:Housing  1  24.65  24.654  1.4676 0.23362  
## Residuals                          36 604.77  16.799                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -5.6393 -2.3222 -0.6055  1.2681 12.2821 
## 
## Coefficients:
##                                           Estimate Std. Error t value Pr(>|t|)
## (Intercept)                                3.11625    1.17552   2.651   0.0119
## PNN_pos_PV_count_PL_c                      0.11638    0.24616   0.473   0.6392
## RearingMS                                  0.35125    1.31318   0.267   0.7906
## HousingSI                                  2.29720    1.31577   1.746   0.0894
## PNN_pos_PV_count_PL_c:RearingMS           -0.15186    0.35586  -0.427   0.6721
## PNN_pos_PV_count_PL_c:HousingSI           -0.16965    0.32322  -0.525   0.6029
## PNN_pos_PV_count_PL_c:RearingMS:HousingSI  0.04352    0.47450   0.092   0.9274
##                                            
## (Intercept)                               *
## PNN_pos_PV_count_PL_c                      
## RearingMS                                  
## HousingSI                                 .
## PNN_pos_PV_count_PL_c:RearingMS            
## PNN_pos_PV_count_PL_c:HousingSI            
## PNN_pos_PV_count_PL_c:RearingMS:HousingSI  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 4.16 on 36 degrees of freedom
## Multiple R-squared:  0.09769,    Adjusted R-squared:  -0.0527 
## F-statistic: 0.6496 on 6 and 36 DF,  p-value: 0.6901
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: freq_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 0.65, p = 0.69
## R² = 0.10
## Adj. R² = -0.05 
## 
## Standard errors: OLS
## ------------------------------------------------------------------------------
##                                                    Est.   S.E.   t val.      p
## ----------------------------------------------- ------- ------ -------- ------
## (Intercept)                                        3.12   1.18     2.65   0.01
## PNN_pos_PV_count_PL_c                              0.12   0.25     0.47   0.64
## RearingMS                                          0.35   1.31     0.27   0.79
## HousingSI                                          2.30   1.32     1.75   0.09
## PNN_pos_PV_count_PL_c:RearingMS                   -0.15   0.36    -0.43   0.67
## PNN_pos_PV_count_PL_c:HousingSI                   -0.17   0.32    -0.52   0.60
## PNN_pos_PV_count_PL_c:RearingMS:HousingSI          0.04   0.47     0.09   0.93
## ------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: freq_open
##                                       Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_count_PL_c                  1   2.66   2.662  0.1538 0.69728  
## Rearing                                1   0.14   0.138  0.0080 0.92927  
## Housing                                1  52.75  52.746  3.0472 0.08941 .
## PNN_pos_PV_count_PL_c:Rearing          1   4.59   4.587  0.2650 0.60987  
## PNN_pos_PV_count_PL_c:Housing          1   7.19   7.186  0.4151 0.52345  
## PNN_pos_PV_count_PL_c:Rearing:Housing  1   0.15   0.146  0.0084 0.92743  
## Residuals                             36 623.14  17.309                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##    Min     1Q Median     3Q    Max 
## -4.869 -2.391 -1.004  1.598 11.135 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                     3.3156     1.1640   2.848
## PNN_pos_PV_intensity_PL_c                      -0.2855     2.3012  -0.124
## RearingMS                                       0.1185     1.2570   0.094
## HousingSI                                       2.2967     1.2602   1.822
## PNN_pos_PV_intensity_PL_c:RearingMS            -1.1603     2.8392  -0.409
## PNN_pos_PV_intensity_PL_c:HousingSI            -1.6649     2.7500  -0.605
## PNN_pos_PV_intensity_PL_c:RearingMS:HousingSI   1.4320     3.4662   0.413
##                                               Pr(>|t|)   
## (Intercept)                                    0.00722 **
## PNN_pos_PV_intensity_PL_c                      0.90196   
## RearingMS                                      0.92544   
## HousingSI                                      0.07671 . 
## PNN_pos_PV_intensity_PL_c:RearingMS            0.68519   
## PNN_pos_PV_intensity_PL_c:HousingSI            0.54869   
## PNN_pos_PV_intensity_PL_c:RearingMS:HousingSI  0.68196   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.982 on 36 degrees of freedom
## Multiple R-squared:  0.1733, Adjusted R-squared:  0.03555 
## F-statistic: 1.258 on 6 and 36 DF,  p-value: 0.301
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: freq_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.26, p = 0.30
## R² = 0.17
## Adj. R² = 0.04 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------------------
##                                                        Est.   S.E.   t val.      p
## --------------------------------------------------- ------- ------ -------- ------
## (Intercept)                                            3.32   1.16     2.85   0.01
## PNN_pos_PV_intensity_PL_c                             -0.29   2.30    -0.12   0.90
## RearingMS                                              0.12   1.26     0.09   0.93
## HousingSI                                              2.30   1.26     1.82   0.08
## PNN_pos_PV_intensity_PL_c:RearingMS                   -1.16   2.84    -0.41   0.69
## PNN_pos_PV_intensity_PL_c:HousingSI                   -1.66   2.75    -0.61   0.55
## PNN_pos_PV_intensity_PL_c:RearingMS:HousingSI          1.43   3.47     0.41   0.68
## ----------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: freq_open
##                                           Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_intensity_PL_c                  1  64.89  64.890  4.0918 0.05057 .
## Rearing                                    1   0.36   0.357  0.0225 0.88152  
## Housing                                    1  48.27  48.266  3.0436 0.08959 .
## PNN_pos_PV_intensity_PL_c:Rearing          1   0.13   0.127  0.0080 0.92912  
## PNN_pos_PV_intensity_PL_c:Housing          1   3.35   3.351  0.2113 0.64851  
## PNN_pos_PV_intensity_PL_c:Rearing:Housing  1   2.71   2.707  0.1707 0.68196  
## Residuals                                 36 570.91  15.858                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -5.2314 -2.4924 -0.8053  2.3948 12.0637 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                     2.9519     1.1427   2.583
## PV_pos_PNN_intensity_PL_c                       2.8670     2.9138   0.984
## RearingMS                                       0.6423     1.3180   0.487
## HousingSI                                       2.5799     1.3135   1.964
## PV_pos_PNN_intensity_PL_c:RearingMS            -3.8265     4.7293  -0.809
## PV_pos_PNN_intensity_PL_c:HousingSI            -2.9918     4.0067  -0.747
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI   6.7789     6.8561   0.989
##                                               Pr(>|t|)  
## (Intercept)                                     0.0140 *
## PV_pos_PNN_intensity_PL_c                       0.3317  
## RearingMS                                       0.6290  
## HousingSI                                       0.0573 .
## PV_pos_PNN_intensity_PL_c:RearingMS             0.4238  
## PV_pos_PNN_intensity_PL_c:HousingSI             0.4601  
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI   0.3294  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 4.123 on 36 degrees of freedom
## Multiple R-squared:  0.1139, Adjusted R-squared:  -0.03378 
## F-statistic: 0.7713 on 6 and 36 DF,  p-value: 0.5975
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: freq_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 0.77, p = 0.60
## R² = 0.11
## Adj. R² = -0.03 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------------------
##                                                        Est.   S.E.   t val.      p
## --------------------------------------------------- ------- ------ -------- ------
## (Intercept)                                            2.95   1.14     2.58   0.01
## PV_pos_PNN_intensity_PL_c                              2.87   2.91     0.98   0.33
## RearingMS                                              0.64   1.32     0.49   0.63
## HousingSI                                              2.58   1.31     1.96   0.06
## PV_pos_PNN_intensity_PL_c:RearingMS                   -3.83   4.73    -0.81   0.42
## PV_pos_PNN_intensity_PL_c:HousingSI                   -2.99   4.01    -0.75   0.46
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI          6.78   6.86     0.99   0.33
## ----------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: freq_open
##                                           Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_pos_PNN_intensity_PL_c                  1   2.70   2.703  0.1590 0.69241  
## Rearing                                    1   0.92   0.921  0.0542 0.81730  
## Housing                                    1  57.24  57.236  3.3671 0.07478 .
## PV_pos_PNN_intensity_PL_c:Rearing          1   0.48   0.483  0.0284 0.86708  
## PV_pos_PNN_intensity_PL_c:Housing          1   0.70   0.702  0.0413 0.84007  
## PV_pos_PNN_intensity_PL_c:Rearing:Housing  1  16.62  16.618  0.9776 0.32939  
## Residuals                                 36 611.94  16.998                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##    Min     1Q Median     3Q    Max 
## -4.701 -2.972 -1.049  1.437 12.622 
## 
## Coefficients:
##                                   Estimate Std. Error t value Pr(>|t|)   
## (Intercept)                        3.86819    1.23328   3.137   0.0034 **
## PV_count_IL_c                     -0.09834    0.16222  -0.606   0.5482   
## RearingMS                         -0.35228    1.34576  -0.262   0.7950   
## HousingSI                          1.43036    1.34556   1.063   0.2949   
## PV_count_IL_c:RearingMS            0.16897    0.20531   0.823   0.4159   
## PV_count_IL_c:HousingSI            0.07203    0.19462   0.370   0.7135   
## PV_count_IL_c:RearingMS:HousingSI -0.32358    0.26552  -1.219   0.2309   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 4.043 on 36 degrees of freedom
## Multiple R-squared:  0.1479, Adjusted R-squared:  0.005836 
## F-statistic: 1.041 on 6 and 36 DF,  p-value: 0.4154
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: freq_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.04, p = 0.42
## R² = 0.15
## Adj. R² = 0.01 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------
##                                            Est.   S.E.   t val.      p
## --------------------------------------- ------- ------ -------- ------
## (Intercept)                                3.87   1.23     3.14   0.00
## PV_count_IL_c                             -0.10   0.16    -0.61   0.55
## RearingMS                                 -0.35   1.35    -0.26   0.79
## HousingSI                                  1.43   1.35     1.06   0.29
## PV_count_IL_c:RearingMS                    0.17   0.21     0.82   0.42
## PV_count_IL_c:HousingSI                    0.07   0.19     0.37   0.71
## PV_count_IL_c:RearingMS:HousingSI         -0.32   0.27    -1.22   0.23
## ----------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: freq_open
##                               Df Sum Sq Mean Sq F value Pr(>F)
## PV_count_IL_c                  1  23.45  23.448  1.4344 0.2389
## Rearing                        1   0.38   0.382  0.0234 0.8793
## Housing                        1  40.74  40.735  2.4919 0.1232
## PV_count_IL_c:Rearing          1   0.25   0.252  0.0154 0.9018
## PV_count_IL_c:Housing          1  13.02  13.017  0.7963 0.3781
## PV_count_IL_c:Rearing:Housing  1  24.28  24.278  1.4852 0.2309
## Residuals                     36 588.49  16.347               
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -5.9623 -2.8479 -0.6061  2.1068 11.3158 
## 
## Coefficients:
##                                       Estimate Std. Error t value Pr(>|t|)   
## (Intercept)                              3.205      1.146   2.797  0.00823 **
## PV_intensity_IL_c                        1.859      3.829   0.486  0.63021   
## RearingMS                                0.456      1.290   0.354  0.72573   
## HousingSI                                2.292      1.290   1.777  0.08405 . 
## PV_intensity_IL_c:RearingMS             -4.034      4.758  -0.848  0.40221   
## PV_intensity_IL_c:HousingSI             -3.057      4.568  -0.669  0.50765   
## PV_intensity_IL_c:RearingMS:HousingSI    5.374      6.052   0.888  0.38038   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 4.145 on 36 degrees of freedom
## Multiple R-squared:  0.1042, Adjusted R-squared:  -0.04509 
## F-statistic: 0.698 on 6 and 36 DF,  p-value: 0.6529
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: freq_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 0.70, p = 0.65
## R² = 0.10
## Adj. R² = -0.05 
## 
## Standard errors: OLS
## --------------------------------------------------------------------------
##                                                Est.   S.E.   t val.      p
## ------------------------------------------- ------- ------ -------- ------
## (Intercept)                                    3.21   1.15     2.80   0.01
## PV_intensity_IL_c                              1.86   3.83     0.49   0.63
## RearingMS                                      0.46   1.29     0.35   0.73
## HousingSI                                      2.29   1.29     1.78   0.08
## PV_intensity_IL_c:RearingMS                   -4.03   4.76    -0.85   0.40
## PV_intensity_IL_c:HousingSI                   -3.06   4.57    -0.67   0.51
## PV_intensity_IL_c:RearingMS:HousingSI          5.37   6.05     0.89   0.38
## --------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: freq_open
##                                   Df Sum Sq Mean Sq F value Pr(>F)  
## PV_intensity_IL_c                  1   5.93   5.927  0.3449 0.5607  
## Rearing                            1   0.21   0.214  0.0124 0.9118  
## Housing                            1  51.23  51.232  2.9813 0.0928 .
## PV_intensity_IL_c:Rearing          1   1.04   1.042  0.0607 0.8069  
## PV_intensity_IL_c:Housing          1   0.00   0.000  0.0000 0.9987  
## PV_intensity_IL_c:Rearing:Housing  1  13.55  13.554  0.7887 0.3804  
## Residuals                         36 618.64  17.184                 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -5.3726 -2.3054 -0.7289  1.3811 12.7196 
## 
## Coefficients:
##                                    Estimate Std. Error t value Pr(>|t|)   
## (Intercept)                         3.20830    1.13777   2.820  0.00776 **
## PNN_count_IL_c                      0.02097    0.12141   0.173  0.86385   
## RearingMS                           0.33474    1.27917   0.262  0.79505   
## HousingSI                           2.25279    1.27934   1.761  0.08675 . 
## PNN_count_IL_c:RearingMS            0.06141    0.15651   0.392  0.69708   
## PNN_count_IL_c:HousingSI           -0.02731    0.15776  -0.173  0.86355   
## PNN_count_IL_c:RearingMS:HousingSI -0.10136    0.23868  -0.425  0.67361   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 4.159 on 36 degrees of freedom
## Multiple R-squared:  0.0985, Adjusted R-squared:  -0.05175 
## F-statistic: 0.6556 on 6 and 36 DF,  p-value: 0.6855
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: freq_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 0.66, p = 0.69
## R² = 0.10
## Adj. R² = -0.05 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------
##                                             Est.   S.E.   t val.      p
## ---------------------------------------- ------- ------ -------- ------
## (Intercept)                                 3.21   1.14     2.82   0.01
## PNN_count_IL_c                              0.02   0.12     0.17   0.86
## RearingMS                                   0.33   1.28     0.26   0.80
## HousingSI                                   2.25   1.28     1.76   0.09
## PNN_count_IL_c:RearingMS                    0.06   0.16     0.39   0.70
## PNN_count_IL_c:HousingSI                   -0.03   0.16    -0.17   0.86
## PNN_count_IL_c:RearingMS:HousingSI         -0.10   0.24    -0.42   0.67
## -----------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: freq_open
##                                Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_count_IL_c                  1   1.09   1.095  0.0633 0.80277  
## Rearing                         1   0.54   0.545  0.0315 0.86011  
## Housing                         1  54.95  54.954  3.1777 0.08309 .
## PNN_count_IL_c:Rearing          1   1.94   1.943  0.1124 0.73942  
## PNN_count_IL_c:Housing          1   6.37   6.372  0.3684 0.54766  
## PNN_count_IL_c:Rearing:Housing  1   3.12   3.119  0.1803 0.67361  
## Residuals                      36 622.58  17.294                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##    Min     1Q Median     3Q    Max 
## -4.715 -1.948 -1.162  2.232 10.868 
## 
## Coefficients:
##                                        Estimate Std. Error t value Pr(>|t|)  
## (Intercept)                               2.881      1.079   2.669   0.0113 *
## PNN_intensity_IL_c                        4.093      3.286   1.246   0.2209  
## RearingMS                                 0.320      1.232   0.260   0.7964  
## HousingSI                                 2.712      1.232   2.202   0.0342 *
## PNN_intensity_IL_c:RearingMS             -9.887      6.538  -1.512   0.1392  
## PNN_intensity_IL_c:HousingSI             -3.737      5.128  -0.729   0.4709  
## PNN_intensity_IL_c:RearingMS:HousingSI   16.521      8.641   1.912   0.0639 .
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.921 on 36 degrees of freedom
## Multiple R-squared:  0.1984, Adjusted R-squared:  0.06477 
## F-statistic: 1.485 on 6 and 36 DF,  p-value: 0.2111
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: freq_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.48, p = 0.21
## R² = 0.20
## Adj. R² = 0.06 
## 
## Standard errors: OLS
## ---------------------------------------------------------------------------
##                                                 Est.   S.E.   t val.      p
## -------------------------------------------- ------- ------ -------- ------
## (Intercept)                                     2.88   1.08     2.67   0.01
## PNN_intensity_IL_c                              4.09   3.29     1.25   0.22
## RearingMS                                       0.32   1.23     0.26   0.80
## HousingSI                                       2.71   1.23     2.20   0.03
## PNN_intensity_IL_c:RearingMS                   -9.89   6.54    -1.51   0.14
## PNN_intensity_IL_c:HousingSI                   -3.74   5.13    -0.73   0.47
## PNN_intensity_IL_c:RearingMS:HousingSI         16.52   8.64     1.91   0.06
## ---------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: freq_open
##                                    Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_intensity_IL_c                  1  20.18  20.177  1.3120 0.25958  
## Rearing                             1   1.45   1.446  0.0940 0.76088  
## Housing                             1  55.22  55.223  3.5911 0.06614 .
## PNN_intensity_IL_c:Rearing          1   0.00   0.000  0.0000 0.99556  
## PNN_intensity_IL_c:Housing          1   3.93   3.933  0.2558 0.61614  
## PNN_intensity_IL_c:Rearing:Housing  1  56.22  56.219  3.6559 0.06386 .
## Residuals                          36 553.61  15.378                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -5.7895 -2.4290 -0.9143  1.3441 12.6992 
## 
## Coefficients:
##                                           Estimate Std. Error t value Pr(>|t|)
## (Intercept)                                3.15094    1.19668   2.633   0.0124
## PNN_pos_PV_count_IL_c                      0.09913    0.28961   0.342   0.7341
## RearingMS                                  0.46153    1.32025   0.350   0.7287
## HousingSI                                  2.24639    1.32178   1.700   0.0978
## PNN_pos_PV_count_IL_c:RearingMS           -0.01030    0.38864  -0.027   0.9790
## PNN_pos_PV_count_IL_c:HousingSI           -0.04122    0.35716  -0.115   0.9088
## PNN_pos_PV_count_IL_c:RearingMS:HousingSI -0.10750    0.54612  -0.197   0.8451
##                                            
## (Intercept)                               *
## PNN_pos_PV_count_IL_c                      
## RearingMS                                  
## HousingSI                                 .
## PNN_pos_PV_count_IL_c:RearingMS            
## PNN_pos_PV_count_IL_c:HousingSI            
## PNN_pos_PV_count_IL_c:RearingMS:HousingSI  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 4.185 on 36 degrees of freedom
## Multiple R-squared:  0.08708,    Adjusted R-squared:  -0.06507 
## F-statistic: 0.5723 on 6 and 36 DF,  p-value: 0.7496
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: freq_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 0.57, p = 0.75
## R² = 0.09
## Adj. R² = -0.07 
## 
## Standard errors: OLS
## ------------------------------------------------------------------------------
##                                                    Est.   S.E.   t val.      p
## ----------------------------------------------- ------- ------ -------- ------
## (Intercept)                                        3.15   1.20     2.63   0.01
## PNN_pos_PV_count_IL_c                              0.10   0.29     0.34   0.73
## RearingMS                                          0.46   1.32     0.35   0.73
## HousingSI                                          2.25   1.32     1.70   0.10
## PNN_pos_PV_count_IL_c:RearingMS                   -0.01   0.39    -0.03   0.98
## PNN_pos_PV_count_IL_c:HousingSI                   -0.04   0.36    -0.12   0.91
## PNN_pos_PV_count_IL_c:RearingMS:HousingSI         -0.11   0.55    -0.20   0.85
## ------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: freq_open
##                                       Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_count_IL_c                  1   0.96   0.964  0.0550 0.81588  
## Rearing                                1   0.78   0.784  0.0448 0.83360  
## Housing                                1  55.29  55.292  3.1572 0.08404 .
## PNN_pos_PV_count_IL_c:Rearing          1   0.45   0.455  0.0260 0.87287  
## PNN_pos_PV_count_IL_c:Housing          1   1.97   1.967  0.1123 0.73945  
## PNN_pos_PV_count_IL_c:Rearing:Housing  1   0.68   0.679  0.0387 0.84505  
## Residuals                             36 630.46  17.513                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -5.5601 -2.5941 -0.4433  1.9880 10.8230 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                     3.2914     1.1405   2.886
## PNN_pos_PV_intensity_IL_c                       0.4756     3.3446   0.142
## RearingMS                                       0.3606     1.2787   0.282
## HousingSI                                       2.1840     1.2788   1.708
## PNN_pos_PV_intensity_IL_c:RearingMS            -2.3367     3.8625  -0.605
## PNN_pos_PV_intensity_IL_c:HousingSI            -2.4248     4.1085  -0.590
## PNN_pos_PV_intensity_IL_c:RearingMS:HousingSI   3.4782     5.1560   0.675
##                                               Pr(>|t|)   
## (Intercept)                                    0.00656 **
## PNN_pos_PV_intensity_IL_c                      0.88771   
## RearingMS                                      0.77956   
## HousingSI                                      0.09627 . 
## PNN_pos_PV_intensity_IL_c:RearingMS            0.54899   
## PNN_pos_PV_intensity_IL_c:HousingSI            0.55875   
## PNN_pos_PV_intensity_IL_c:RearingMS:HousingSI  0.50424   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 4.109 on 36 degrees of freedom
## Multiple R-squared:  0.1198, Adjusted R-squared:  -0.02687 
## F-statistic: 0.8168 on 6 and 36 DF,  p-value: 0.5641
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: freq_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 0.82, p = 0.56
## R² = 0.12
## Adj. R² = -0.03 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------------------
##                                                        Est.   S.E.   t val.      p
## --------------------------------------------------- ------- ------ -------- ------
## (Intercept)                                            3.29   1.14     2.89   0.01
## PNN_pos_PV_intensity_IL_c                              0.48   3.34     0.14   0.89
## RearingMS                                              0.36   1.28     0.28   0.78
## HousingSI                                              2.18   1.28     1.71   0.10
## PNN_pos_PV_intensity_IL_c:RearingMS                   -2.34   3.86    -0.60   0.55
## PNN_pos_PV_intensity_IL_c:HousingSI                   -2.42   4.11    -0.59   0.56
## PNN_pos_PV_intensity_IL_c:RearingMS:HousingSI          3.48   5.16     0.67   0.50
## ----------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: freq_open
##                                           Df Sum Sq Mean Sq F value Pr(>F)
## PNN_pos_PV_intensity_IL_c                  1  29.40  29.404  1.7415 0.1953
## Rearing                                    1   0.06   0.060  0.0036 0.9527
## Housing                                    1  45.20  45.200  2.6770 0.1105
## PNN_pos_PV_intensity_IL_c:Rearing          1   0.29   0.288  0.0171 0.8968
## PNN_pos_PV_intensity_IL_c:Housing          1   0.12   0.117  0.0069 0.9341
## PNN_pos_PV_intensity_IL_c:Rearing:Housing  1   7.68   7.684  0.4551 0.5042
## Residuals                                 36 607.85  16.885               
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##    Min     1Q Median     3Q    Max 
## -5.358 -2.498 -0.921  2.591 11.680 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                     3.0051     1.0858   2.768
## PV_pos_PNN_intensity_IL_c                       3.7229     2.8569   1.303
## RearingMS                                       0.6083     1.2334   0.493
## HousingSI                                       2.3930     1.2333   1.940
## PV_pos_PNN_intensity_IL_c:RearingMS            -5.8059     4.8574  -1.195
## PV_pos_PNN_intensity_IL_c:HousingSI            -5.1723     4.2518  -1.217
## PV_pos_PNN_intensity_IL_c:RearingMS:HousingSI  11.7686     6.5981   1.784
##                                               Pr(>|t|)   
## (Intercept)                                    0.00886 **
## PV_pos_PNN_intensity_IL_c                      0.20081   
## RearingMS                                      0.62488   
## HousingSI                                      0.06020 . 
## PV_pos_PNN_intensity_IL_c:RearingMS            0.23979   
## PV_pos_PNN_intensity_IL_c:HousingSI            0.23171   
## PV_pos_PNN_intensity_IL_c:RearingMS:HousingSI  0.08292 . 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.982 on 36 degrees of freedom
## Multiple R-squared:  0.1733, Adjusted R-squared:  0.03555 
## F-statistic: 1.258 on 6 and 36 DF,  p-value: 0.301
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: freq_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.26, p = 0.30
## R² = 0.17
## Adj. R² = 0.04 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------------------
##                                                        Est.   S.E.   t val.      p
## --------------------------------------------------- ------- ------ -------- ------
## (Intercept)                                            3.01   1.09     2.77   0.01
## PV_pos_PNN_intensity_IL_c                              3.72   2.86     1.30   0.20
## RearingMS                                              0.61   1.23     0.49   0.62
## HousingSI                                              2.39   1.23     1.94   0.06
## PV_pos_PNN_intensity_IL_c:RearingMS                   -5.81   4.86    -1.20   0.24
## PV_pos_PNN_intensity_IL_c:HousingSI                   -5.17   4.25    -1.22   0.23
## PV_pos_PNN_intensity_IL_c:RearingMS:HousingSI         11.77   6.60     1.78   0.08
## ----------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: freq_open
##                                           Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_pos_PNN_intensity_IL_c                  1   9.26   9.262  0.5841 0.44971  
## Rearing                                    1   0.53   0.533  0.0336 0.85561  
## Housing                                    1  58.91  58.907  3.7145 0.06186 .
## PV_pos_PNN_intensity_IL_c:Rearing          1   0.40   0.400  0.0252 0.87472  
## PV_pos_PNN_intensity_IL_c:Housing          1   0.15   0.147  0.0092 0.92392  
## PV_pos_PNN_intensity_IL_c:Rearing:Housing  1  50.45  50.451  3.1813 0.08292 .
## Residuals                                 36 570.91  15.858                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## [[1]]
## Analysis of Variance Table
## 
## Response: freq_open
##                               Df Sum Sq Mean Sq F value Pr(>F)
## PV_count_PL_c                  1  41.33  41.334  2.5191 0.1212
## Rearing                        1   0.76   0.760  0.0463 0.8308
## Housing                        1  44.40  44.401  2.7060 0.1087
## PV_count_PL_c:Rearing          1   0.73   0.734  0.0447 0.8337
## PV_count_PL_c:Housing          1   2.29   2.289  0.1395 0.7109
## PV_count_PL_c:Rearing:Housing  1  10.38  10.378  0.6325 0.4317
## Residuals                     36 590.71  16.409               
## 
## [[2]]
## Analysis of Variance Table
## 
## Response: freq_open
##                                   Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_intensity_PL_c                  1  31.31  31.307  1.9446 0.17172  
## Rearing                            1   0.00   0.001  0.0000 0.99487  
## Housing                            1  51.65  51.654  3.2084 0.08167 .
## PV_intensity_PL_c:Rearing          1   4.46   4.464  0.2773 0.60173  
## PV_intensity_PL_c:Housing          1   2.09   2.090  0.1298 0.72075  
## PV_intensity_PL_c:Rearing:Housing  1  21.51  21.507  1.3359 0.25537  
## Residuals                         36 579.58  16.100                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[3]]
## Analysis of Variance Table
## 
## Response: freq_open
##                                Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_count_PL_c                  1   0.12   0.124  0.0073 0.93218  
## Rearing                         1   0.47   0.466  0.0276 0.86909  
## Housing                         1  53.25  53.245  3.1456 0.08459 .
## PNN_count_PL_c:Rearing          1   0.00   0.002  0.0001 0.99170  
## PNN_count_PL_c:Housing          1  27.40  27.404  1.6190 0.21139  
## PNN_count_PL_c:Rearing:Housing  1   0.00   0.000  0.0000 0.99918  
## Residuals                      36 609.36  16.927                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[4]]
## Analysis of Variance Table
## 
## Response: freq_open
##                                    Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_intensity_PL_c                  1   3.14   3.137  0.1867 0.66823  
## Rearing                             1   1.05   1.050  0.0625 0.80401  
## Housing                             1  56.29  56.290  3.3507 0.07546 .
## PNN_intensity_PL_c:Rearing          1   0.59   0.589  0.0351 0.85248  
## PNN_intensity_PL_c:Housing          1   0.11   0.112  0.0066 0.93547  
## PNN_intensity_PL_c:Rearing:Housing  1  24.65  24.654  1.4676 0.23362  
## Residuals                          36 604.77  16.799                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[5]]
## Analysis of Variance Table
## 
## Response: freq_open
##                                       Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_count_PL_c                  1   2.66   2.662  0.1538 0.69728  
## Rearing                                1   0.14   0.138  0.0080 0.92927  
## Housing                                1  52.75  52.746  3.0472 0.08941 .
## PNN_pos_PV_count_PL_c:Rearing          1   4.59   4.587  0.2650 0.60987  
## PNN_pos_PV_count_PL_c:Housing          1   7.19   7.186  0.4151 0.52345  
## PNN_pos_PV_count_PL_c:Rearing:Housing  1   0.15   0.146  0.0084 0.92743  
## Residuals                             36 623.14  17.309                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[6]]
## Analysis of Variance Table
## 
## Response: freq_open
##                                           Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_intensity_PL_c                  1  64.89  64.890  4.0918 0.05057 .
## Rearing                                    1   0.36   0.357  0.0225 0.88152  
## Housing                                    1  48.27  48.266  3.0436 0.08959 .
## PNN_pos_PV_intensity_PL_c:Rearing          1   0.13   0.127  0.0080 0.92912  
## PNN_pos_PV_intensity_PL_c:Housing          1   3.35   3.351  0.2113 0.64851  
## PNN_pos_PV_intensity_PL_c:Rearing:Housing  1   2.71   2.707  0.1707 0.68196  
## Residuals                                 36 570.91  15.858                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[7]]
## Analysis of Variance Table
## 
## Response: freq_open
##                                           Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_pos_PNN_intensity_PL_c                  1   2.70   2.703  0.1590 0.69241  
## Rearing                                    1   0.92   0.921  0.0542 0.81730  
## Housing                                    1  57.24  57.236  3.3671 0.07478 .
## PV_pos_PNN_intensity_PL_c:Rearing          1   0.48   0.483  0.0284 0.86708  
## PV_pos_PNN_intensity_PL_c:Housing          1   0.70   0.702  0.0413 0.84007  
## PV_pos_PNN_intensity_PL_c:Rearing:Housing  1  16.62  16.618  0.9776 0.32939  
## Residuals                                 36 611.94  16.998                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[8]]
## Analysis of Variance Table
## 
## Response: freq_open
##                               Df Sum Sq Mean Sq F value Pr(>F)
## PV_count_IL_c                  1  23.45  23.448  1.4344 0.2389
## Rearing                        1   0.38   0.382  0.0234 0.8793
## Housing                        1  40.74  40.735  2.4919 0.1232
## PV_count_IL_c:Rearing          1   0.25   0.252  0.0154 0.9018
## PV_count_IL_c:Housing          1  13.02  13.017  0.7963 0.3781
## PV_count_IL_c:Rearing:Housing  1  24.28  24.278  1.4852 0.2309
## Residuals                     36 588.49  16.347               
## 
## [[9]]
## Analysis of Variance Table
## 
## Response: freq_open
##                                   Df Sum Sq Mean Sq F value Pr(>F)  
## PV_intensity_IL_c                  1   5.93   5.927  0.3449 0.5607  
## Rearing                            1   0.21   0.214  0.0124 0.9118  
## Housing                            1  51.23  51.232  2.9813 0.0928 .
## PV_intensity_IL_c:Rearing          1   1.04   1.042  0.0607 0.8069  
## PV_intensity_IL_c:Housing          1   0.00   0.000  0.0000 0.9987  
## PV_intensity_IL_c:Rearing:Housing  1  13.55  13.554  0.7887 0.3804  
## Residuals                         36 618.64  17.184                 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[10]]
## Analysis of Variance Table
## 
## Response: freq_open
##                                Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_count_IL_c                  1   1.09   1.095  0.0633 0.80277  
## Rearing                         1   0.54   0.545  0.0315 0.86011  
## Housing                         1  54.95  54.954  3.1777 0.08309 .
## PNN_count_IL_c:Rearing          1   1.94   1.943  0.1124 0.73942  
## PNN_count_IL_c:Housing          1   6.37   6.372  0.3684 0.54766  
## PNN_count_IL_c:Rearing:Housing  1   3.12   3.119  0.1803 0.67361  
## Residuals                      36 622.58  17.294                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[11]]
## Analysis of Variance Table
## 
## Response: freq_open
##                                    Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_intensity_IL_c                  1  20.18  20.177  1.3120 0.25958  
## Rearing                             1   1.45   1.446  0.0940 0.76088  
## Housing                             1  55.22  55.223  3.5911 0.06614 .
## PNN_intensity_IL_c:Rearing          1   0.00   0.000  0.0000 0.99556  
## PNN_intensity_IL_c:Housing          1   3.93   3.933  0.2558 0.61614  
## PNN_intensity_IL_c:Rearing:Housing  1  56.22  56.219  3.6559 0.06386 .
## Residuals                          36 553.61  15.378                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[12]]
## Analysis of Variance Table
## 
## Response: freq_open
##                                       Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_count_IL_c                  1   0.96   0.964  0.0550 0.81588  
## Rearing                                1   0.78   0.784  0.0448 0.83360  
## Housing                                1  55.29  55.292  3.1572 0.08404 .
## PNN_pos_PV_count_IL_c:Rearing          1   0.45   0.455  0.0260 0.87287  
## PNN_pos_PV_count_IL_c:Housing          1   1.97   1.967  0.1123 0.73945  
## PNN_pos_PV_count_IL_c:Rearing:Housing  1   0.68   0.679  0.0387 0.84505  
## Residuals                             36 630.46  17.513                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[13]]
## Analysis of Variance Table
## 
## Response: freq_open
##                                           Df Sum Sq Mean Sq F value Pr(>F)
## PNN_pos_PV_intensity_IL_c                  1  29.40  29.404  1.7415 0.1953
## Rearing                                    1   0.06   0.060  0.0036 0.9527
## Housing                                    1  45.20  45.200  2.6770 0.1105
## PNN_pos_PV_intensity_IL_c:Rearing          1   0.29   0.288  0.0171 0.8968
## PNN_pos_PV_intensity_IL_c:Housing          1   0.12   0.117  0.0069 0.9341
## PNN_pos_PV_intensity_IL_c:Rearing:Housing  1   7.68   7.684  0.4551 0.5042
## Residuals                                 36 607.85  16.885               
## 
## [[14]]
## Analysis of Variance Table
## 
## Response: freq_open
##                                           Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_pos_PNN_intensity_IL_c                  1   9.26   9.262  0.5841 0.44971  
## Rearing                                    1   0.53   0.533  0.0336 0.85561  
## Housing                                    1  58.91  58.907  3.7145 0.06186 .
## PV_pos_PNN_intensity_IL_c:Rearing          1   0.40   0.400  0.0252 0.87472  
## PV_pos_PNN_intensity_IL_c:Housing          1   0.15   0.147  0.0092 0.92392  
## PV_pos_PNN_intensity_IL_c:Rearing:Housing  1  50.45  50.451  3.1813 0.08292 .
## Residuals                                 36 570.91  15.858                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

Male - Head poke duration

# Returning summary, summ, and anova stats for every linear model in the malelm_head_poke_duration list
lapply(malelm_head_poke_duration, function(x){
    print(summary(x))
    print(summ(x))
    print(anova(x))
})
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -79.997 -19.793  -3.826  15.572  94.841 
## 
## Coefficients:
##                                   Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                        90.2890    10.6206   8.501 3.94e-10 ***
## PV_count_PL_c                      -0.5986     1.3849  -0.432    0.668    
## RearingMS                          -1.5957    11.3992  -0.140    0.889    
## HousingSI                         -17.3070    11.5023  -1.505    0.141    
## PV_count_PL_c:RearingMS            -0.1250     1.9679  -0.064    0.950    
## PV_count_PL_c:HousingSI             1.6169     1.7255   0.937    0.355    
## PV_count_PL_c:RearingMS:HousingSI   0.6265     2.4062   0.260    0.796    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 34.89 on 36 degrees of freedom
## Multiple R-squared:  0.1748, Adjusted R-squared:  0.03728 
## F-statistic: 1.271 on 6 and 36 DF,  p-value: 0.295
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: head_poke_duration
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.27, p = 0.29
## R² = 0.17
## Adj. R² = 0.04 
## 
## Standard errors: OLS
## ------------------------------------------------------------------------
##                                             Est.    S.E.   t val.      p
## --------------------------------------- -------- ------- -------- ------
## (Intercept)                                90.29   10.62     8.50   0.00
## PV_count_PL_c                              -0.60    1.38    -0.43   0.67
## RearingMS                                  -1.60   11.40    -0.14   0.89
## HousingSI                                 -17.31   11.50    -1.50   0.14
## PV_count_PL_c:RearingMS                    -0.13    1.97    -0.06   0.95
## PV_count_PL_c:HousingSI                     1.62    1.73     0.94   0.35
## PV_count_PL_c:RearingMS:HousingSI           0.63    2.41     0.26   0.80
## ------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                               Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_count_PL_c                  1   1727  1727.5  1.4188 0.24140  
## Rearing                        1    179   178.9  0.1469 0.70376  
## Housing                        1   3567  3567.2  2.9298 0.09556 .
## PV_count_PL_c:Rearing          1    136   136.0  0.1117 0.74017  
## PV_count_PL_c:Housing          1   3594  3593.7  2.9515 0.09439 .
## PV_count_PL_c:Rearing:Housing  1     83    82.5  0.0678 0.79607  
## Residuals                     36  43833  1217.6                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##    Min     1Q Median     3Q    Max 
## -85.65 -18.58  -5.50  17.44  64.49 
## 
## Coefficients:
##                                       Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                            92.7148     9.2356  10.039  5.6e-12 ***
## PV_intensity_PL_c                     -40.3408    22.3333  -1.806   0.0792 .  
## RearingMS                              -0.6604    10.3451  -0.064   0.9495    
## HousingSI                             -21.9221    10.3502  -2.118   0.0411 *  
## PV_intensity_PL_c:RearingMS            60.8836    31.3532   1.942   0.0600 .  
## PV_intensity_PL_c:HousingSI            51.7111    28.8603   1.792   0.0816 .  
## PV_intensity_PL_c:RearingMS:HousingSI -47.1193    38.9391  -1.210   0.2341    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 33.45 on 36 degrees of freedom
## Multiple R-squared:  0.2416, Adjusted R-squared:  0.1152 
## F-statistic: 1.911 on 6 and 36 DF,  p-value: 0.1057
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: head_poke_duration
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.91, p = 0.11
## R² = 0.24
## Adj. R² = 0.12 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------------
##                                                 Est.    S.E.   t val.      p
## ------------------------------------------- -------- ------- -------- ------
## (Intercept)                                    92.71    9.24    10.04   0.00
## PV_intensity_PL_c                             -40.34   22.33    -1.81   0.08
## RearingMS                                      -0.66   10.35    -0.06   0.95
## HousingSI                                     -21.92   10.35    -2.12   0.04
## PV_intensity_PL_c:RearingMS                    60.88   31.35     1.94   0.06
## PV_intensity_PL_c:HousingSI                    51.71   28.86     1.79   0.08
## PV_intensity_PL_c:RearingMS:HousingSI         -47.12   38.94    -1.21   0.23
## ----------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                   Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_intensity_PL_c                  1   1496  1496.3  1.3371 0.25516  
## Rearing                            1     65    65.1  0.0582 0.81073  
## Housing                            1   3987  3987.2  3.5630 0.06716 .
## PV_intensity_PL_c:Rearing          1   3648  3648.0  3.2599 0.07936 .
## PV_intensity_PL_c:Housing          1   1997  1997.0  1.7846 0.18997  
## PV_intensity_PL_c:Rearing:Housing  1   1639  1638.6  1.4643 0.23414  
## Residuals                         36  40286  1119.1                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -78.666 -21.499  -0.364  16.424  57.486 
## 
## Coefficients:
##                                    Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                         90.7905     8.3238  10.907  5.8e-13 ***
## PNN_count_PL_c                      -4.0717     1.2318  -3.305  0.00215 ** 
## RearingMS                            0.1402     9.4249   0.015  0.98821    
## HousingSI                          -19.9169     9.4219  -2.114  0.04152 *  
## PNN_count_PL_c:RearingMS             3.2301     1.4528   2.223  0.03255 *  
## PNN_count_PL_c:HousingSI             5.6948     1.6061   3.546  0.00111 ** 
## PNN_count_PL_c:RearingMS:HousingSI  -3.4904     2.0936  -1.667  0.10416    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 30.66 on 36 degrees of freedom
## Multiple R-squared:  0.3631, Adjusted R-squared:  0.257 
## F-statistic: 3.421 on 6 and 36 DF,  p-value: 0.008941
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: head_poke_duration
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 3.42, p = 0.01
## R² = 0.36
## Adj. R² = 0.26 
## 
## Standard errors: OLS
## ------------------------------------------------------------------------
##                                              Est.   S.E.   t val.      p
## ---------------------------------------- -------- ------ -------- ------
## (Intercept)                                 90.79   8.32    10.91   0.00
## PNN_count_PL_c                              -4.07   1.23    -3.31   0.00
## RearingMS                                    0.14   9.42     0.01   0.99
## HousingSI                                  -19.92   9.42    -2.11   0.04
## PNN_count_PL_c:RearingMS                     3.23   1.45     2.22   0.03
## PNN_count_PL_c:HousingSI                     5.69   1.61     3.55   0.00
## PNN_count_PL_c:RearingMS:HousingSI          -3.49   2.09    -1.67   0.10
## ------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                Df Sum Sq Mean Sq F value   Pr(>F)   
## PNN_count_PL_c                  1    295   294.6  0.3135 0.579035   
## Rearing                         1      6     5.7  0.0061 0.938096   
## Housing                         1   4258  4257.9  4.5310 0.040200 * 
## PNN_count_PL_c:Rearing          1    354   353.9  0.3766 0.543281   
## PNN_count_PL_c:Housing          1  11764 11764.2 12.5187 0.001131 **
## PNN_count_PL_c:Rearing:Housing  1   2612  2611.9  2.7794 0.104162   
## Residuals                      36  33830   939.7                    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##    Min     1Q Median     3Q    Max 
## -67.32 -16.54  -1.74  14.88  67.91 
## 
## Coefficients:
##                                        Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                              96.016      8.728  11.000 4.58e-13 ***
## PNN_intensity_PL_c                      -86.349     23.931  -3.608 0.000929 ***
## RearingMS                                -3.061     10.066  -0.304 0.762827    
## HousingSI                               -24.654     10.028  -2.459 0.018890 *  
## PNN_intensity_PL_c:RearingMS            111.141     39.065   2.845 0.007282 ** 
## PNN_intensity_PL_c:HousingSI             98.458     32.847   2.997 0.004910 ** 
## PNN_intensity_PL_c:RearingMS:HousingSI -131.793     56.494  -2.333 0.025360 *  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 31.34 on 36 degrees of freedom
## Multiple R-squared:  0.3343, Adjusted R-squared:  0.2234 
## F-statistic: 3.013 on 6 and 36 DF,  p-value: 0.01721
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: head_poke_duration
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 3.01, p = 0.02
## R² = 0.33
## Adj. R² = 0.22 
## 
## Standard errors: OLS
## ------------------------------------------------------------------------------
##                                                   Est.    S.E.   t val.      p
## -------------------------------------------- --------- ------- -------- ------
## (Intercept)                                      96.02    8.73    11.00   0.00
## PNN_intensity_PL_c                              -86.35   23.93    -3.61   0.00
## RearingMS                                        -3.06   10.07    -0.30   0.76
## HousingSI                                       -24.65   10.03    -2.46   0.02
## PNN_intensity_PL_c:RearingMS                    111.14   39.06     2.85   0.01
## PNN_intensity_PL_c:HousingSI                     98.46   32.85     3.00   0.00
## PNN_intensity_PL_c:RearingMS:HousingSI         -131.79   56.49    -2.33   0.03
## ------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                    Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_intensity_PL_c                  1   1515  1515.3  1.5427 0.22225  
## Rearing                             1     15    15.4  0.0157 0.90096  
## Housing                             1   4581  4581.4  4.6643 0.03753 *
## PNN_intensity_PL_c:Rearing          1   2336  2335.7  2.3780 0.13180  
## PNN_intensity_PL_c:Housing          1   3965  3965.3  4.0371 0.05205 .
## PNN_intensity_PL_c:Rearing:Housing  1   5346  5345.5  5.4423 0.02536 *
## Residuals                          36  35360   982.2                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##    Min     1Q Median     3Q    Max 
## -83.50 -17.40  -0.57  15.07  56.72 
## 
## Coefficients:
##                                           Estimate Std. Error t value Pr(>|t|)
## (Intercept)                                 96.160      8.874  10.836 6.96e-13
## PNN_pos_PV_count_PL_c                       -6.034      1.858  -3.247  0.00252
## RearingMS                                   -5.715      9.913  -0.576  0.56788
## HousingSI                                  -22.916      9.932  -2.307  0.02690
## PNN_pos_PV_count_PL_c:RearingMS              4.750      2.686   1.768  0.08548
## PNN_pos_PV_count_PL_c:HousingSI              8.019      2.440   3.287  0.00227
## PNN_pos_PV_count_PL_c:RearingMS:HousingSI   -5.106      3.582  -1.425  0.16266
##                                              
## (Intercept)                               ***
## PNN_pos_PV_count_PL_c                     ** 
## RearingMS                                    
## HousingSI                                 *  
## PNN_pos_PV_count_PL_c:RearingMS           .  
## PNN_pos_PV_count_PL_c:HousingSI           ** 
## PNN_pos_PV_count_PL_c:RearingMS:HousingSI    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 31.41 on 36 degrees of freedom
## Multiple R-squared:  0.3315, Adjusted R-squared:  0.2201 
## F-statistic: 2.976 on 6 and 36 DF,  p-value: 0.01831
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: head_poke_duration
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 2.98, p = 0.02
## R² = 0.33
## Adj. R² = 0.22 
## 
## Standard errors: OLS
## -------------------------------------------------------------------------------
##                                                     Est.   S.E.   t val.      p
## ----------------------------------------------- -------- ------ -------- ------
## (Intercept)                                        96.16   8.87    10.84   0.00
## PNN_pos_PV_count_PL_c                              -6.03   1.86    -3.25   0.00
## RearingMS                                          -5.71   9.91    -0.58   0.57
## HousingSI                                         -22.92   9.93    -2.31   0.03
## PNN_pos_PV_count_PL_c:RearingMS                     4.75   2.69     1.77   0.09
## PNN_pos_PV_count_PL_c:HousingSI                     8.02   2.44     3.29   0.00
## PNN_pos_PV_count_PL_c:RearingMS:HousingSI          -5.11   3.58    -1.43   0.16
## -------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                       Df Sum Sq Mean Sq F value   Pr(>F)   
## PNN_pos_PV_count_PL_c                  1    467   466.6  0.4731 0.495994   
## Rearing                                1      2     1.9  0.0020 0.964798   
## Housing                                1   4172  4171.5  4.2292 0.047037 * 
## PNN_pos_PV_count_PL_c:Rearing          1    849   848.9  0.8607 0.359724   
## PNN_pos_PV_count_PL_c:Housing          1  10117 10116.6 10.2566 0.002847 **
## PNN_pos_PV_count_PL_c:Rearing:Housing  1   2004  2004.0  2.0317 0.162658   
## Residuals                             36  35509   986.4                    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -65.262 -18.218  -3.988  14.238  94.003 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                    90.7281    10.0804   9.000
## PNN_pos_PV_intensity_PL_c                      -6.1690    19.9291  -0.310
## RearingMS                                       0.4845    10.8863   0.045
## HousingSI                                     -20.5897    10.9140  -1.887
## PNN_pos_PV_intensity_PL_c:RearingMS            16.2134    24.5883   0.659
## PNN_pos_PV_intensity_PL_c:HousingSI            16.1614    23.8157   0.679
## PNN_pos_PV_intensity_PL_c:RearingMS:HousingSI  -4.0272    30.0181  -0.134
##                                               Pr(>|t|)    
## (Intercept)                                   9.58e-11 ***
## PNN_pos_PV_intensity_PL_c                       0.7587    
## RearingMS                                       0.9647    
## HousingSI                                       0.0673 .  
## PNN_pos_PV_intensity_PL_c:RearingMS             0.5138    
## PNN_pos_PV_intensity_PL_c:HousingSI             0.5017    
## PNN_pos_PV_intensity_PL_c:RearingMS:HousingSI   0.8940    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 34.49 on 36 degrees of freedom
## Multiple R-squared:  0.1939, Adjusted R-squared:  0.05956 
## F-statistic: 1.443 on 6 and 36 DF,  p-value: 0.2255
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: head_poke_duration
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.44, p = 0.23
## R² = 0.19
## Adj. R² = 0.06 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------------
##                                                         Est.    S.E.   t val.
## --------------------------------------------------- -------- ------- --------
## (Intercept)                                            90.73   10.08     9.00
## PNN_pos_PV_intensity_PL_c                              -6.17   19.93    -0.31
## RearingMS                                               0.48   10.89     0.04
## HousingSI                                             -20.59   10.91    -1.89
## PNN_pos_PV_intensity_PL_c:RearingMS                    16.21   24.59     0.66
## PNN_pos_PV_intensity_PL_c:HousingSI                    16.16   23.82     0.68
## PNN_pos_PV_intensity_PL_c:RearingMS:HousingSI          -4.03   30.02    -0.13
## -----------------------------------------------------------------------------
##  
## ----------------------------------------------------------
##                                                          p
## --------------------------------------------------- ------
## (Intercept)                                           0.00
## PNN_pos_PV_intensity_PL_c                             0.76
## RearingMS                                             0.96
## HousingSI                                             0.07
## PNN_pos_PV_intensity_PL_c:RearingMS                   0.51
## PNN_pos_PV_intensity_PL_c:HousingSI                   0.50
## PNN_pos_PV_intensity_PL_c:RearingMS:HousingSI         0.89
## ----------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                           Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_intensity_PL_c                  1   4337  4337.2  3.6465 0.06418 .
## Rearing                                    1    188   187.8  0.1579 0.69348  
## Housing                                    1   3721  3720.8  3.1283 0.08542 .
## PNN_pos_PV_intensity_PL_c:Rearing          1    936   936.1  0.7870 0.38089  
## PNN_pos_PV_intensity_PL_c:Housing          1   1097  1097.0  0.9223 0.34327  
## PNN_pos_PV_intensity_PL_c:Rearing:Housing  1     21    21.4  0.0180 0.89402  
## Residuals                                 36  42818  1189.4                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -70.769 -17.019  -4.411  18.772  68.706 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                     94.586      8.670  10.909
## PV_pos_PNN_intensity_PL_c                      -80.688     22.108  -3.650
## RearingMS                                       -3.139     10.000  -0.314
## HousingSI                                      -22.657      9.966  -2.273
## PV_pos_PNN_intensity_PL_c:RearingMS             93.782     35.884   2.614
## PV_pos_PNN_intensity_PL_c:HousingSI             96.822     30.401   3.185
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI -110.629     52.021  -2.127
##                                               Pr(>|t|)    
## (Intercept)                                   5.77e-13 ***
## PV_pos_PNN_intensity_PL_c                     0.000826 ***
## RearingMS                                     0.755427    
## HousingSI                                     0.029070 *  
## PV_pos_PNN_intensity_PL_c:RearingMS           0.012998 *  
## PV_pos_PNN_intensity_PL_c:HousingSI           0.002987 ** 
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI 0.040375 *  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 31.28 on 36 degrees of freedom
## Multiple R-squared:  0.3368, Adjusted R-squared:  0.2262 
## F-statistic: 3.047 on 6 and 36 DF,  p-value: 0.01631
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: head_poke_duration
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 3.05, p = 0.02
## R² = 0.34
## Adj. R² = 0.23 
## 
## Standard errors: OLS
## ------------------------------------------------------------------------------
##                                                          Est.    S.E.   t val.
## --------------------------------------------------- --------- ------- --------
## (Intercept)                                             94.59    8.67    10.91
## PV_pos_PNN_intensity_PL_c                              -80.69   22.11    -3.65
## RearingMS                                               -3.14   10.00    -0.31
## HousingSI                                              -22.66    9.97    -2.27
## PV_pos_PNN_intensity_PL_c:RearingMS                     93.78   35.88     2.61
## PV_pos_PNN_intensity_PL_c:HousingSI                     96.82   30.40     3.18
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI         -110.63   52.02    -2.13
## ------------------------------------------------------------------------------
##  
## ----------------------------------------------------------
##                                                          p
## --------------------------------------------------- ------
## (Intercept)                                           0.00
## PV_pos_PNN_intensity_PL_c                             0.00
## RearingMS                                             0.76
## HousingSI                                             0.03
## PV_pos_PNN_intensity_PL_c:RearingMS                   0.01
## PV_pos_PNN_intensity_PL_c:HousingSI                   0.00
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI         0.04
## ----------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                           Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_pos_PNN_intensity_PL_c                  1   1257  1256.9  1.2844 0.26457  
## Rearing                                    1      6     6.1  0.0062 0.93773  
## Housing                                    1   4711  4710.7  4.8138 0.03477 *
## PV_pos_PNN_intensity_PL_c:Rearing          1   1895  1895.5  1.9369 0.17254  
## PV_pos_PNN_intensity_PL_c:Housing          1   5594  5594.3  5.7167 0.02216 *
## PV_pos_PNN_intensity_PL_c:Rearing:Housing  1   4426  4425.7  4.5226 0.04037 *
## Residuals                                 36  35229   978.6                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -77.774 -20.798  -4.181  17.394  92.237 
## 
## Coefficients:
##                                    Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                        92.27678   10.58355   8.719 2.12e-10 ***
## PV_count_IL_c                      -1.51771    1.39210  -1.090    0.283    
## RearingMS                          -0.43884   11.54882  -0.038    0.970    
## HousingSI                         -18.46658   11.54714  -1.599    0.119    
## PV_count_IL_c:RearingMS             0.52143    1.76193   0.296    0.769    
## PV_count_IL_c:HousingSI             2.32081    1.67012   1.390    0.173    
## PV_count_IL_c:RearingMS:HousingSI  -0.05367    2.27859  -0.024    0.981    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 34.7 on 36 degrees of freedom
## Multiple R-squared:  0.1841, Adjusted R-squared:  0.04812 
## F-statistic: 1.354 on 6 and 36 DF,  p-value: 0.2595
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: head_poke_duration
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.35, p = 0.26
## R² = 0.18
## Adj. R² = 0.05 
## 
## Standard errors: OLS
## ------------------------------------------------------------------------
##                                             Est.    S.E.   t val.      p
## --------------------------------------- -------- ------- -------- ------
## (Intercept)                                92.28   10.58     8.72   0.00
## PV_count_IL_c                              -1.52    1.39    -1.09   0.28
## RearingMS                                  -0.44   11.55    -0.04   0.97
## HousingSI                                 -18.47   11.55    -1.60   0.12
## PV_count_IL_c:RearingMS                     0.52    1.76     0.30   0.77
## PV_count_IL_c:HousingSI                     2.32    1.67     1.39   0.17
## PV_count_IL_c:RearingMS:HousingSI          -0.05    2.28    -0.02   0.98
## ------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                               Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_count_IL_c                  1    446   445.7  0.3702 0.54672  
## Rearing                        1     80    80.5  0.0669 0.79744  
## Housing                        1   3648  3648.4  3.0306 0.09025 .
## PV_count_IL_c:Rearing          1     32    31.9  0.0265 0.87162  
## PV_count_IL_c:Housing          1   5572  5572.1  4.6285 0.03823 *
## PV_count_IL_c:Rearing:Housing  1      1     0.7  0.0006 0.98134  
## Residuals                     36  43339  1203.9                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -82.706 -16.995  -5.937  15.591  65.026 
## 
## Coefficients:
##                                       Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                             92.023      9.476   9.711 1.35e-11 ***
## PV_intensity_IL_c                      -60.606     31.662  -1.914   0.0636 .  
## RearingMS                               -1.635     10.666  -0.153   0.8790    
## HousingSI                              -21.064     10.668  -1.975   0.0560 .  
## PV_intensity_IL_c:RearingMS             76.669     39.344   1.949   0.0592 .  
## PV_intensity_IL_c:HousingSI             73.647     37.774   1.950   0.0590 .  
## PV_intensity_IL_c:RearingMS:HousingSI  -66.035     50.039  -1.320   0.1953    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 34.28 on 36 degrees of freedom
## Multiple R-squared:  0.2037, Adjusted R-squared:  0.07102 
## F-statistic: 1.535 on 6 and 36 DF,  p-value: 0.1948
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: head_poke_duration
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.54, p = 0.19
## R² = 0.20
## Adj. R² = 0.07 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------------
##                                                 Est.    S.E.   t val.      p
## ------------------------------------------- -------- ------- -------- ------
## (Intercept)                                    92.02    9.48     9.71   0.00
## PV_intensity_IL_c                             -60.61   31.66    -1.91   0.06
## RearingMS                                      -1.64   10.67    -0.15   0.88
## HousingSI                                     -21.06   10.67    -1.97   0.06
## PV_intensity_IL_c:RearingMS                    76.67   39.34     1.95   0.06
## PV_intensity_IL_c:HousingSI                    73.65   37.77     1.95   0.06
## PV_intensity_IL_c:RearingMS:HousingSI         -66.03   50.04    -1.32   0.20
## ----------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                   Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_intensity_IL_c                  1    545   545.2  0.4641 0.50009  
## Rearing                            1     28    28.1  0.0239 0.87798  
## Housing                            1   3905  3905.4  3.3240 0.07659 .
## PV_intensity_IL_c:Rearing          1   1814  1814.3  1.5442 0.22202  
## PV_intensity_IL_c:Housing          1   2483  2482.8  2.1132 0.15470  
## PV_intensity_IL_c:Rearing:Housing  1   2046  2046.1  1.7415 0.19528  
## Residuals                         36  42297  1174.9                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -78.064 -19.695  -1.052  19.395  61.899 
## 
## Coefficients:
##                                    Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                         93.0406     9.0062  10.331 2.59e-12 ***
## PNN_count_IL_c                      -2.3928     0.9611  -2.490   0.0175 *  
## RearingMS                           -2.0351    10.1254  -0.201   0.8418    
## HousingSI                          -21.7111    10.1268  -2.144   0.0389 *  
## PNN_count_IL_c:RearingMS             1.4307     1.2389   1.155   0.2558    
## PNN_count_IL_c:HousingSI             3.3287     1.2488   2.666   0.0114 *  
## PNN_count_IL_c:RearingMS:HousingSI  -1.8987     1.8893  -1.005   0.3216    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 32.92 on 36 degrees of freedom
## Multiple R-squared:  0.2656, Adjusted R-squared:  0.1432 
## F-statistic:  2.17 on 6 and 36 DF,  p-value: 0.06889
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: head_poke_duration
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 2.17, p = 0.07
## R² = 0.27
## Adj. R² = 0.14 
## 
## Standard errors: OLS
## -------------------------------------------------------------------------
##                                              Est.    S.E.   t val.      p
## ---------------------------------------- -------- ------- -------- ------
## (Intercept)                                 93.04    9.01    10.33   0.00
## PNN_count_IL_c                              -2.39    0.96    -2.49   0.02
## RearingMS                                   -2.04   10.13    -0.20   0.84
## HousingSI                                  -21.71   10.13    -2.14   0.04
## PNN_count_IL_c:RearingMS                     1.43    1.24     1.15   0.26
## PNN_count_IL_c:HousingSI                     3.33    1.25     2.67   0.01
## PNN_count_IL_c:RearingMS:HousingSI          -1.90    1.89    -1.00   0.32
## -------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_count_IL_c                  1    849   849.2  0.7837 0.38189  
## Rearing                         1      3     3.4  0.0031 0.95567  
## Housing                         1   4424  4424.1  4.0828 0.05081 .
## PNN_count_IL_c:Rearing          1     12    12.1  0.0112 0.91637  
## PNN_count_IL_c:Housing          1   7726  7726.0  7.1300 0.01130 *
## PNN_count_IL_c:Rearing:Housing  1   1094  1094.4  1.0100 0.32161  
## Residuals                      36  39009  1083.6                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -62.125 -15.519  -5.115  18.937  67.311 
## 
## Coefficients:
##                                        Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                              95.081      8.539  11.135 3.25e-13 ***
## PNN_intensity_IL_c                      -92.073     25.995  -3.542  0.00112 ** 
## RearingMS                                -1.756      9.742  -0.180  0.85793    
## HousingSI                               -24.177      9.745  -2.481  0.01792 *  
## PNN_intensity_IL_c:RearingMS            137.664     51.725   2.661  0.01155 *  
## PNN_intensity_IL_c:HousingSI            114.601     40.568   2.825  0.00766 ** 
## PNN_intensity_IL_c:RearingMS:HousingSI -191.885     68.355  -2.807  0.00802 ** 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 31.02 on 36 degrees of freedom
## Multiple R-squared:  0.3478, Adjusted R-squared:  0.2391 
## F-statistic: 3.199 on 6 and 36 DF,  p-value: 0.01274
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: head_poke_duration
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 3.20, p = 0.01
## R² = 0.35
## Adj. R² = 0.24 
## 
## Standard errors: OLS
## ------------------------------------------------------------------------------
##                                                   Est.    S.E.   t val.      p
## -------------------------------------------- --------- ------- -------- ------
## (Intercept)                                      95.08    8.54    11.14   0.00
## PNN_intensity_IL_c                              -92.07   26.00    -3.54   0.00
## RearingMS                                        -1.76    9.74    -0.18   0.86
## HousingSI                                       -24.18    9.75    -2.48   0.02
## PNN_intensity_IL_c:RearingMS                    137.66   51.72     2.66   0.01
## PNN_intensity_IL_c:HousingSI                    114.60   40.57     2.82   0.01
## PNN_intensity_IL_c:RearingMS:HousingSI         -191.89   68.35    -2.81   0.01
## ------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                    Df Sum Sq Mean Sq F value   Pr(>F)   
## PNN_intensity_IL_c                  1   3204  3204.4  3.3298 0.076343 . 
## Rearing                             1     11    10.9  0.0113 0.915874   
## Housing                             1   4295  4295.1  4.4631 0.041637 * 
## PNN_intensity_IL_c:Rearing          1   1387  1387.0  1.4412 0.237782   
## PNN_intensity_IL_c:Housing          1   1993  1992.6  2.0706 0.158805   
## PNN_intensity_IL_c:Rearing:Housing  1   7584  7583.7  7.8804 0.008018 **
## Residuals                          36  34645   962.4                    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -83.013 -16.900  -2.276  13.026  63.311 
## 
## Coefficients:
##                                           Estimate Std. Error t value Pr(>|t|)
## (Intercept)                                 98.736      8.952  11.030 4.25e-13
## PNN_pos_PV_count_IL_c                       -7.422      2.166  -3.426  0.00155
## RearingMS                                   -8.081      9.876  -0.818  0.41859
## HousingSI                                  -25.192      9.887  -2.548  0.01525
## PNN_pos_PV_count_IL_c:RearingMS              5.037      2.907   1.733  0.09172
## PNN_pos_PV_count_IL_c:HousingSI              8.565      2.672   3.206  0.00282
## PNN_pos_PV_count_IL_c:RearingMS:HousingSI   -6.637      4.085  -1.625  0.11297
##                                              
## (Intercept)                               ***
## PNN_pos_PV_count_IL_c                     ** 
## RearingMS                                    
## HousingSI                                 *  
## PNN_pos_PV_count_IL_c:RearingMS           .  
## PNN_pos_PV_count_IL_c:HousingSI           ** 
## PNN_pos_PV_count_IL_c:RearingMS:HousingSI    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 31.3 on 36 degrees of freedom
## Multiple R-squared:  0.3359, Adjusted R-squared:  0.2252 
## F-statistic: 3.034 on 6 and 36 DF,  p-value: 0.01664
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: head_poke_duration
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 3.03, p = 0.02
## R² = 0.34
## Adj. R² = 0.23 
## 
## Standard errors: OLS
## -------------------------------------------------------------------------------
##                                                     Est.   S.E.   t val.      p
## ----------------------------------------------- -------- ------ -------- ------
## (Intercept)                                        98.74   8.95    11.03   0.00
## PNN_pos_PV_count_IL_c                              -7.42   2.17    -3.43   0.00
## RearingMS                                          -8.08   9.88    -0.82   0.42
## HousingSI                                         -25.19   9.89    -2.55   0.02
## PNN_pos_PV_count_IL_c:RearingMS                     5.04   2.91     1.73   0.09
## PNN_pos_PV_count_IL_c:HousingSI                     8.56   2.67     3.21   0.00
## PNN_pos_PV_count_IL_c:RearingMS:HousingSI          -6.64   4.09    -1.62   0.11
## -------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                       Df Sum Sq Mean Sq F value   Pr(>F)   
## PNN_pos_PV_count_IL_c                  1   2483  2483.3  2.5342 0.120150   
## Rearing                                1     36    36.1  0.0369 0.848792   
## Housing                                1   4735  4735.0  4.8319 0.034451 * 
## PNN_pos_PV_count_IL_c:Rearing          1      8     8.1  0.0082 0.928279   
## PNN_pos_PV_count_IL_c:Housing          1   7992  7992.0  8.1557 0.007084 **
## PNN_pos_PV_count_IL_c:Rearing:Housing  1   2586  2586.4  2.6394 0.112969   
## Residuals                             36  35278   979.9                    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -71.225 -17.461  -7.421  17.185  86.516 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                    90.3119     9.7401   9.272
## PNN_pos_PV_intensity_IL_c                     -25.3303    28.5641  -0.887
## RearingMS                                      -0.3634    10.9204  -0.033
## HousingSI                                     -19.1298    10.9213  -1.752
## PNN_pos_PV_intensity_IL_c:RearingMS            41.9586    32.9866   1.272
## PNN_pos_PV_intensity_IL_c:HousingSI            41.5261    35.0877   1.183
## PNN_pos_PV_intensity_IL_c:RearingMS:HousingSI -34.8211    44.0339  -0.791
##                                               Pr(>|t|)    
## (Intercept)                                   4.49e-11 ***
## PNN_pos_PV_intensity_IL_c                       0.3811    
## RearingMS                                       0.9736    
## HousingSI                                       0.0884 .  
## PNN_pos_PV_intensity_IL_c:RearingMS             0.2115    
## PNN_pos_PV_intensity_IL_c:HousingSI             0.2444    
## PNN_pos_PV_intensity_IL_c:RearingMS:HousingSI   0.4343    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 35.09 on 36 degrees of freedom
## Multiple R-squared:  0.1654, Adjusted R-squared:  0.02626 
## F-statistic: 1.189 on 6 and 36 DF,  p-value: 0.3343
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: head_poke_duration
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.19, p = 0.33
## R² = 0.17
## Adj. R² = 0.03 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------------
##                                                         Est.    S.E.   t val.
## --------------------------------------------------- -------- ------- --------
## (Intercept)                                            90.31    9.74     9.27
## PNN_pos_PV_intensity_IL_c                             -25.33   28.56    -0.89
## RearingMS                                              -0.36   10.92    -0.03
## HousingSI                                             -19.13   10.92    -1.75
## PNN_pos_PV_intensity_IL_c:RearingMS                    41.96   32.99     1.27
## PNN_pos_PV_intensity_IL_c:HousingSI                    41.53   35.09     1.18
## PNN_pos_PV_intensity_IL_c:RearingMS:HousingSI         -34.82   44.03    -0.79
## -----------------------------------------------------------------------------
##  
## ----------------------------------------------------------
##                                                          p
## --------------------------------------------------- ------
## (Intercept)                                           0.00
## PNN_pos_PV_intensity_IL_c                             0.38
## RearingMS                                             0.97
## HousingSI                                             0.09
## PNN_pos_PV_intensity_IL_c:RearingMS                   0.21
## PNN_pos_PV_intensity_IL_c:HousingSI                   0.24
## PNN_pos_PV_intensity_IL_c:RearingMS:HousingSI         0.43
## ----------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                           Df Sum Sq Mean Sq F value Pr(>F)
## PNN_pos_PV_intensity_IL_c                  1   2668  2667.9  2.1664 0.1497
## Rearing                                    1     54    53.8  0.0437 0.8356
## Housing                                    1   3400  3400.0  2.7608 0.1053
## PNN_pos_PV_intensity_IL_c:Rearing          1    852   852.3  0.6921 0.4109
## PNN_pos_PV_intensity_IL_c:Housing          1   1040  1039.6  0.8442 0.3643
## PNN_pos_PV_intensity_IL_c:Rearing:Housing  1    770   770.1  0.6253 0.4343
## Residuals                                 36  44335  1231.5               
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -67.600 -17.003  -1.462  15.751  63.868 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                     93.571      8.340  11.219
## PV_pos_PNN_intensity_IL_c                      -79.990     21.945  -3.645
## RearingMS                                       -4.043      9.474  -0.427
## HousingSI                                      -20.599      9.473  -2.174
## PV_pos_PNN_intensity_IL_c:RearingMS             97.449     37.311   2.612
## PV_pos_PNN_intensity_IL_c:HousingSI            112.099     32.659   3.432
## PV_pos_PNN_intensity_IL_c:RearingMS:HousingSI -154.774     50.682  -3.054
##                                               Pr(>|t|)    
## (Intercept)                                   2.63e-13 ***
## PV_pos_PNN_intensity_IL_c                     0.000837 ***
## RearingMS                                     0.672086    
## HousingSI                                     0.036328 *  
## PV_pos_PNN_intensity_IL_c:RearingMS           0.013053 *  
## PV_pos_PNN_intensity_IL_c:HousingSI           0.001520 ** 
## PV_pos_PNN_intensity_IL_c:RearingMS:HousingSI 0.004234 ** 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 30.59 on 36 degrees of freedom
## Multiple R-squared:  0.3659, Adjusted R-squared:  0.2602 
## F-statistic: 3.462 on 6 and 36 DF,  p-value: 0.00838
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: head_poke_duration
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 3.46, p = 0.01
## R² = 0.37
## Adj. R² = 0.26 
## 
## Standard errors: OLS
## ------------------------------------------------------------------------------
##                                                          Est.    S.E.   t val.
## --------------------------------------------------- --------- ------- --------
## (Intercept)                                             93.57    8.34    11.22
## PV_pos_PNN_intensity_IL_c                              -79.99   21.94    -3.65
## RearingMS                                               -4.04    9.47    -0.43
## HousingSI                                              -20.60    9.47    -2.17
## PV_pos_PNN_intensity_IL_c:RearingMS                     97.45   37.31     2.61
## PV_pos_PNN_intensity_IL_c:HousingSI                    112.10   32.66     3.43
## PV_pos_PNN_intensity_IL_c:RearingMS:HousingSI         -154.77   50.68    -3.05
## ------------------------------------------------------------------------------
##  
## ----------------------------------------------------------
##                                                          p
## --------------------------------------------------- ------
## (Intercept)                                           0.00
## PV_pos_PNN_intensity_IL_c                             0.00
## RearingMS                                             0.67
## HousingSI                                             0.04
## PV_pos_PNN_intensity_IL_c:RearingMS                   0.01
## PV_pos_PNN_intensity_IL_c:HousingSI                   0.00
## PV_pos_PNN_intensity_IL_c:RearingMS:HousingSI         0.00
## ----------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                           Df Sum Sq Mean Sq F value   Pr(>F)   
## PV_pos_PNN_intensity_IL_c                  1   1844  1844.3  1.9711 0.168900   
## Rearing                                    1      6     6.4  0.0068 0.934498   
## Housing                                    1   4757  4757.5  5.0845 0.030318 * 
## PV_pos_PNN_intensity_IL_c:Rearing          1    643   642.6  0.6867 0.412738   
## PV_pos_PNN_intensity_IL_c:Housing          1   3457  3457.3  3.6949 0.062520 . 
## PV_pos_PNN_intensity_IL_c:Rearing:Housing  1   8726  8726.0  9.3259 0.004234 **
## Residuals                                 36  33684   935.7                    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## [[1]]
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                               Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_count_PL_c                  1   1727  1727.5  1.4188 0.24140  
## Rearing                        1    179   178.9  0.1469 0.70376  
## Housing                        1   3567  3567.2  2.9298 0.09556 .
## PV_count_PL_c:Rearing          1    136   136.0  0.1117 0.74017  
## PV_count_PL_c:Housing          1   3594  3593.7  2.9515 0.09439 .
## PV_count_PL_c:Rearing:Housing  1     83    82.5  0.0678 0.79607  
## Residuals                     36  43833  1217.6                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[2]]
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                   Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_intensity_PL_c                  1   1496  1496.3  1.3371 0.25516  
## Rearing                            1     65    65.1  0.0582 0.81073  
## Housing                            1   3987  3987.2  3.5630 0.06716 .
## PV_intensity_PL_c:Rearing          1   3648  3648.0  3.2599 0.07936 .
## PV_intensity_PL_c:Housing          1   1997  1997.0  1.7846 0.18997  
## PV_intensity_PL_c:Rearing:Housing  1   1639  1638.6  1.4643 0.23414  
## Residuals                         36  40286  1119.1                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[3]]
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                Df Sum Sq Mean Sq F value   Pr(>F)   
## PNN_count_PL_c                  1    295   294.6  0.3135 0.579035   
## Rearing                         1      6     5.7  0.0061 0.938096   
## Housing                         1   4258  4257.9  4.5310 0.040200 * 
## PNN_count_PL_c:Rearing          1    354   353.9  0.3766 0.543281   
## PNN_count_PL_c:Housing          1  11764 11764.2 12.5187 0.001131 **
## PNN_count_PL_c:Rearing:Housing  1   2612  2611.9  2.7794 0.104162   
## Residuals                      36  33830   939.7                    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[4]]
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                    Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_intensity_PL_c                  1   1515  1515.3  1.5427 0.22225  
## Rearing                             1     15    15.4  0.0157 0.90096  
## Housing                             1   4581  4581.4  4.6643 0.03753 *
## PNN_intensity_PL_c:Rearing          1   2336  2335.7  2.3780 0.13180  
## PNN_intensity_PL_c:Housing          1   3965  3965.3  4.0371 0.05205 .
## PNN_intensity_PL_c:Rearing:Housing  1   5346  5345.5  5.4423 0.02536 *
## Residuals                          36  35360   982.2                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[5]]
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                       Df Sum Sq Mean Sq F value   Pr(>F)   
## PNN_pos_PV_count_PL_c                  1    467   466.6  0.4731 0.495994   
## Rearing                                1      2     1.9  0.0020 0.964798   
## Housing                                1   4172  4171.5  4.2292 0.047037 * 
## PNN_pos_PV_count_PL_c:Rearing          1    849   848.9  0.8607 0.359724   
## PNN_pos_PV_count_PL_c:Housing          1  10117 10116.6 10.2566 0.002847 **
## PNN_pos_PV_count_PL_c:Rearing:Housing  1   2004  2004.0  2.0317 0.162658   
## Residuals                             36  35509   986.4                    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[6]]
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                           Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_intensity_PL_c                  1   4337  4337.2  3.6465 0.06418 .
## Rearing                                    1    188   187.8  0.1579 0.69348  
## Housing                                    1   3721  3720.8  3.1283 0.08542 .
## PNN_pos_PV_intensity_PL_c:Rearing          1    936   936.1  0.7870 0.38089  
## PNN_pos_PV_intensity_PL_c:Housing          1   1097  1097.0  0.9223 0.34327  
## PNN_pos_PV_intensity_PL_c:Rearing:Housing  1     21    21.4  0.0180 0.89402  
## Residuals                                 36  42818  1189.4                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[7]]
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                           Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_pos_PNN_intensity_PL_c                  1   1257  1256.9  1.2844 0.26457  
## Rearing                                    1      6     6.1  0.0062 0.93773  
## Housing                                    1   4711  4710.7  4.8138 0.03477 *
## PV_pos_PNN_intensity_PL_c:Rearing          1   1895  1895.5  1.9369 0.17254  
## PV_pos_PNN_intensity_PL_c:Housing          1   5594  5594.3  5.7167 0.02216 *
## PV_pos_PNN_intensity_PL_c:Rearing:Housing  1   4426  4425.7  4.5226 0.04037 *
## Residuals                                 36  35229   978.6                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[8]]
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                               Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_count_IL_c                  1    446   445.7  0.3702 0.54672  
## Rearing                        1     80    80.5  0.0669 0.79744  
## Housing                        1   3648  3648.4  3.0306 0.09025 .
## PV_count_IL_c:Rearing          1     32    31.9  0.0265 0.87162  
## PV_count_IL_c:Housing          1   5572  5572.1  4.6285 0.03823 *
## PV_count_IL_c:Rearing:Housing  1      1     0.7  0.0006 0.98134  
## Residuals                     36  43339  1203.9                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[9]]
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                   Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_intensity_IL_c                  1    545   545.2  0.4641 0.50009  
## Rearing                            1     28    28.1  0.0239 0.87798  
## Housing                            1   3905  3905.4  3.3240 0.07659 .
## PV_intensity_IL_c:Rearing          1   1814  1814.3  1.5442 0.22202  
## PV_intensity_IL_c:Housing          1   2483  2482.8  2.1132 0.15470  
## PV_intensity_IL_c:Rearing:Housing  1   2046  2046.1  1.7415 0.19528  
## Residuals                         36  42297  1174.9                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[10]]
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_count_IL_c                  1    849   849.2  0.7837 0.38189  
## Rearing                         1      3     3.4  0.0031 0.95567  
## Housing                         1   4424  4424.1  4.0828 0.05081 .
## PNN_count_IL_c:Rearing          1     12    12.1  0.0112 0.91637  
## PNN_count_IL_c:Housing          1   7726  7726.0  7.1300 0.01130 *
## PNN_count_IL_c:Rearing:Housing  1   1094  1094.4  1.0100 0.32161  
## Residuals                      36  39009  1083.6                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[11]]
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                    Df Sum Sq Mean Sq F value   Pr(>F)   
## PNN_intensity_IL_c                  1   3204  3204.4  3.3298 0.076343 . 
## Rearing                             1     11    10.9  0.0113 0.915874   
## Housing                             1   4295  4295.1  4.4631 0.041637 * 
## PNN_intensity_IL_c:Rearing          1   1387  1387.0  1.4412 0.237782   
## PNN_intensity_IL_c:Housing          1   1993  1992.6  2.0706 0.158805   
## PNN_intensity_IL_c:Rearing:Housing  1   7584  7583.7  7.8804 0.008018 **
## Residuals                          36  34645   962.4                    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[12]]
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                       Df Sum Sq Mean Sq F value   Pr(>F)   
## PNN_pos_PV_count_IL_c                  1   2483  2483.3  2.5342 0.120150   
## Rearing                                1     36    36.1  0.0369 0.848792   
## Housing                                1   4735  4735.0  4.8319 0.034451 * 
## PNN_pos_PV_count_IL_c:Rearing          1      8     8.1  0.0082 0.928279   
## PNN_pos_PV_count_IL_c:Housing          1   7992  7992.0  8.1557 0.007084 **
## PNN_pos_PV_count_IL_c:Rearing:Housing  1   2586  2586.4  2.6394 0.112969   
## Residuals                             36  35278   979.9                    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[13]]
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                           Df Sum Sq Mean Sq F value Pr(>F)
## PNN_pos_PV_intensity_IL_c                  1   2668  2667.9  2.1664 0.1497
## Rearing                                    1     54    53.8  0.0437 0.8356
## Housing                                    1   3400  3400.0  2.7608 0.1053
## PNN_pos_PV_intensity_IL_c:Rearing          1    852   852.3  0.6921 0.4109
## PNN_pos_PV_intensity_IL_c:Housing          1   1040  1039.6  0.8442 0.3643
## PNN_pos_PV_intensity_IL_c:Rearing:Housing  1    770   770.1  0.6253 0.4343
## Residuals                                 36  44335  1231.5               
## 
## [[14]]
## Analysis of Variance Table
## 
## Response: head_poke_duration
##                                           Df Sum Sq Mean Sq F value   Pr(>F)   
## PV_pos_PNN_intensity_IL_c                  1   1844  1844.3  1.9711 0.168900   
## Rearing                                    1      6     6.4  0.0068 0.934498   
## Housing                                    1   4757  4757.5  5.0845 0.030318 * 
## PV_pos_PNN_intensity_IL_c:Rearing          1    643   642.6  0.6867 0.412738   
## PV_pos_PNN_intensity_IL_c:Housing          1   3457  3457.3  3.6949 0.062520 . 
## PV_pos_PNN_intensity_IL_c:Rearing:Housing  1   8726  8726.0  9.3259 0.004234 **
## Residuals                                 36  33684   935.7                    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

Male - Head pokes

# Returning summary, summ, and anova stats for every linear model in the malelm_head_pokes list
lapply(malelm_head_pokes, function(x){
    print(summary(x))
    print(summ(x))
    print(anova(x))
})
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -7.4279 -2.3455  0.0941  1.6927 11.5165 
## 
## Coefficients:
##                                   Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                       13.56642    1.07519  12.618 8.85e-15 ***
## PV_count_PL_c                     -0.11394    0.14020  -0.813   0.4218    
## RearingMS                         -2.08134    1.15401  -1.804   0.0797 .  
## HousingSI                         -0.38355    1.16445  -0.329   0.7438    
## PV_count_PL_c:RearingMS           -0.07832    0.19922  -0.393   0.6965    
## PV_count_PL_c:HousingSI            0.19504    0.17468   1.117   0.2716    
## PV_count_PL_c:RearingMS:HousingSI  0.21664    0.24359   0.889   0.3797    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.533 on 36 degrees of freedom
## Multiple R-squared:  0.2521, Adjusted R-squared:  0.1274 
## F-statistic: 2.022 on 6 and 36 DF,  p-value: 0.08795
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: head_pokes
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 2.02, p = 0.09
## R² = 0.25
## Adj. R² = 0.13 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------
##                                            Est.   S.E.   t val.      p
## --------------------------------------- ------- ------ -------- ------
## (Intercept)                               13.57   1.08    12.62   0.00
## PV_count_PL_c                             -0.11   0.14    -0.81   0.42
## RearingMS                                 -2.08   1.15    -1.80   0.08
## HousingSI                                 -0.38   1.16    -0.33   0.74
## PV_count_PL_c:RearingMS                   -0.08   0.20    -0.39   0.70
## PV_count_PL_c:HousingSI                    0.20   0.17     1.12   0.27
## PV_count_PL_c:RearingMS:HousingSI          0.22   0.24     0.89   0.38
## ----------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_pokes
##                               Df Sum Sq Mean Sq F value Pr(>F)  
## PV_count_PL_c                  1  17.99  17.991  1.4418 0.2377  
## Rearing                        1  20.84  20.839  1.6700 0.2045  
## Housing                        1   5.10   5.096  0.4084 0.5268  
## PV_count_PL_c:Rearing          1   6.15   6.152  0.4930 0.4871  
## PV_count_PL_c:Housing          1  91.47  91.472  7.3303 0.0103 *
## PV_count_PL_c:Rearing:Housing  1   9.87   9.870  0.7910 0.3797  
## Residuals                     36 449.23  12.479                 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -8.8772 -1.8581  0.0161  1.6236  8.0727 
## 
## Coefficients:
##                                       Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                            13.7694     0.9751  14.121 2.99e-16 ***
## PV_intensity_PL_c                      -4.3338     2.3579  -1.838   0.0743 .  
## RearingMS                              -1.7814     1.0922  -1.631   0.1116    
## HousingSI                              -0.9544     1.0928  -0.873   0.3882    
## PV_intensity_PL_c:RearingMS             4.3222     3.3102   1.306   0.1999    
## PV_intensity_PL_c:HousingSI             5.8839     3.0470   1.931   0.0614 .  
## PV_intensity_PL_c:RearingMS:HousingSI  -2.5346     4.1111  -0.617   0.5414    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.532 on 36 degrees of freedom
## Multiple R-squared:  0.2524, Adjusted R-squared:  0.1278 
## F-statistic: 2.025 on 6 and 36 DF,  p-value: 0.08752
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: head_pokes
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 2.03, p = 0.09
## R² = 0.25
## Adj. R² = 0.13 
## 
## Standard errors: OLS
## --------------------------------------------------------------------------
##                                                Est.   S.E.   t val.      p
## ------------------------------------------- ------- ------ -------- ------
## (Intercept)                                   13.77   0.98    14.12   0.00
## PV_intensity_PL_c                             -4.33   2.36    -1.84   0.07
## RearingMS                                     -1.78   1.09    -1.63   0.11
## HousingSI                                     -0.95   1.09    -0.87   0.39
## PV_intensity_PL_c:RearingMS                    4.32   3.31     1.31   0.20
## PV_intensity_PL_c:HousingSI                    5.88   3.05     1.93   0.06
## PV_intensity_PL_c:RearingMS:HousingSI         -2.53   4.11    -0.62   0.54
## --------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_pokes
##                                   Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_intensity_PL_c                  1  21.97  21.974  1.7616 0.19279  
## Rearing                            1  23.87  23.868  1.9134 0.17510  
## Housing                            1   6.14   6.138  0.4921 0.48751  
## PV_intensity_PL_c:Rearing          1  33.69  33.693  2.7011 0.10899  
## PV_intensity_PL_c:Housing          1  61.17  61.173  4.9040 0.03321 *
## PV_intensity_PL_c:Rearing:Housing  1   4.74   4.741  0.3801 0.54143  
## Residuals                         36 449.06  12.474                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -6.1909 -1.4559 -0.1217  1.9355  6.4541 
## 
## Coefficients:
##                                    Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                         13.5751     0.8197  16.561  < 2e-16 ***
## PNN_count_PL_c                      -0.4984     0.1213  -4.108 0.000220 ***
## RearingMS                           -1.5788     0.9282  -1.701 0.097570 .  
## HousingSI                           -0.7121     0.9279  -0.767 0.447817    
## PNN_count_PL_c:RearingMS             0.4546     0.1431   3.178 0.003045 ** 
## PNN_count_PL_c:HousingSI             0.6346     0.1582   4.012 0.000291 ***
## PNN_count_PL_c:RearingMS:HousingSI  -0.3087     0.2062  -1.497 0.143044    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.019 on 36 degrees of freedom
## Multiple R-squared:  0.4538, Adjusted R-squared:  0.3627 
## F-statistic: 4.984 on 6 and 36 DF,  p-value: 0.0008316
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: head_pokes
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 4.98, p = 0.00
## R² = 0.45
## Adj. R² = 0.36 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------
##                                             Est.   S.E.   t val.      p
## ---------------------------------------- ------- ------ -------- ------
## (Intercept)                                13.58   0.82    16.56   0.00
## PNN_count_PL_c                             -0.50   0.12    -4.11   0.00
## RearingMS                                  -1.58   0.93    -1.70   0.10
## HousingSI                                  -0.71   0.93    -0.77   0.45
## PNN_count_PL_c:RearingMS                    0.45   0.14     3.18   0.00
## PNN_count_PL_c:HousingSI                    0.63   0.16     4.01   0.00
## PNN_count_PL_c:RearingMS:HousingSI         -0.31   0.21    -1.50   0.14
## -----------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_pokes
##                                Df Sum Sq Mean Sq F value   Pr(>F)    
## PNN_count_PL_c                  1   0.03   0.029  0.0032  0.95550    
## Rearing                         1  29.80  29.796  3.2694  0.07894 .  
## Housing                         1   6.72   6.719  0.7373  0.39621    
## PNN_count_PL_c:Rearing          1  33.41  33.407  3.6656  0.06352 .  
## PNN_count_PL_c:Housing          1 182.18 182.176 19.9893 7.47e-05 ***
## PNN_count_PL_c:Rearing:Housing  1  20.43  20.431  2.2418  0.14304    
## Residuals                      36 328.09   9.114                     
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -5.8683 -1.8803 -0.0919  1.7658  7.3642 
## 
## Coefficients:
##                                        Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                             14.0886     0.9644  14.609  < 2e-16 ***
## PNN_intensity_PL_c                      -8.7329     2.6441  -3.303  0.00217 ** 
## RearingMS                               -2.1046     1.1122  -1.892  0.06651 .  
## HousingSI                               -1.2728     1.1079  -1.149  0.25821    
## PNN_intensity_PL_c:RearingMS             9.4244     4.3161   2.184  0.03560 *  
## PNN_intensity_PL_c:HousingSI             8.5615     3.6292   2.359  0.02387 *  
## PNN_intensity_PL_c:RearingMS:HousingSI -10.9264     6.2418  -1.751  0.08855 .  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.463 on 36 degrees of freedom
## Multiple R-squared:  0.2814, Adjusted R-squared:  0.1616 
## F-statistic: 2.349 on 6 and 36 DF,  p-value: 0.05121
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: head_pokes
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 2.35, p = 0.05
## R² = 0.28
## Adj. R² = 0.16 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------------
##                                                  Est.   S.E.   t val.      p
## -------------------------------------------- -------- ------ -------- ------
## (Intercept)                                     14.09   0.96    14.61   0.00
## PNN_intensity_PL_c                              -8.73   2.64    -3.30   0.00
## RearingMS                                       -2.10   1.11    -1.89   0.07
## HousingSI                                       -1.27   1.11    -1.15   0.26
## PNN_intensity_PL_c:RearingMS                     9.42   4.32     2.18   0.04
## PNN_intensity_PL_c:HousingSI                     8.56   3.63     2.36   0.02
## PNN_intensity_PL_c:RearingMS:HousingSI         -10.93   6.24    -1.75   0.09
## ----------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_pokes
##                                    Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_intensity_PL_c                  1  29.86  29.862  2.4905 0.12328  
## Rearing                             1  42.48  42.485  3.5433 0.06789 .
## Housing                             1   9.94   9.943  0.8292 0.36855  
## PNN_intensity_PL_c:Rearing          1  17.58  17.585  1.4666 0.23377  
## PNN_intensity_PL_c:Housing          1  32.39  32.391  2.7015 0.10896  
## PNN_intensity_PL_c:Rearing:Housing  1  36.74  36.742  3.0644 0.08855 .
## Residuals                          36 431.64  11.990                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##    Min     1Q Median     3Q    Max 
## -6.030 -1.737 -0.225  2.176  5.627 
## 
## Coefficients:
##                                           Estimate Std. Error t value Pr(>|t|)
## (Intercept)                                14.3610     0.8705  16.497  < 2e-16
## PNN_pos_PV_count_PL_c                      -0.7539     0.1823  -4.136 0.000203
## RearingMS                                  -2.1193     0.9724  -2.179 0.035928
## HousingSI                                  -1.2946     0.9743  -1.329 0.192305
## PNN_pos_PV_count_PL_c:RearingMS             0.7839     0.2635   2.975 0.005211
## PNN_pos_PV_count_PL_c:HousingSI             0.9193     0.2393   3.841 0.000478
## PNN_pos_PV_count_PL_c:RearingMS:HousingSI  -0.5637     0.3514  -1.604 0.117416
##                                              
## (Intercept)                               ***
## PNN_pos_PV_count_PL_c                     ***
## RearingMS                                 *  
## HousingSI                                    
## PNN_pos_PV_count_PL_c:RearingMS           ** 
## PNN_pos_PV_count_PL_c:HousingSI           ***
## PNN_pos_PV_count_PL_c:RearingMS:HousingSI    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.081 on 36 degrees of freedom
## Multiple R-squared:  0.4311, Adjusted R-squared:  0.3363 
## F-statistic: 4.547 on 6 and 36 DF,  p-value: 0.001579
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: head_pokes
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 4.55, p = 0.00
## R² = 0.43
## Adj. R² = 0.34 
## 
## Standard errors: OLS
## ------------------------------------------------------------------------------
##                                                    Est.   S.E.   t val.      p
## ----------------------------------------------- ------- ------ -------- ------
## (Intercept)                                       14.36   0.87    16.50   0.00
## PNN_pos_PV_count_PL_c                             -0.75   0.18    -4.14   0.00
## RearingMS                                         -2.12   0.97    -2.18   0.04
## HousingSI                                         -1.29   0.97    -1.33   0.19
## PNN_pos_PV_count_PL_c:RearingMS                    0.78   0.26     2.97   0.01
## PNN_pos_PV_count_PL_c:HousingSI                    0.92   0.24     3.84   0.00
## PNN_pos_PV_count_PL_c:RearingMS:HousingSI         -0.56   0.35    -1.60   0.12
## ------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_pokes
##                                       Df Sum Sq Mean Sq F value    Pr(>F)    
## PNN_pos_PV_count_PL_c                  1   0.21   0.208  0.0219 0.8832126    
## Rearing                                1  29.92  29.923  3.1525 0.0842642 .  
## Housing                                1   6.66   6.663  0.7020 0.4076398    
## PNN_pos_PV_count_PL_c:Rearing          1  60.46  60.462  6.3699 0.0161606 *  
## PNN_pos_PV_count_PL_c:Housing          1 137.26 137.260 14.4608 0.0005339 ***
## PNN_pos_PV_count_PL_c:Rearing:Housing  1  24.43  24.426  2.5733 0.1174161    
## Residuals                             36 341.71   9.492                      
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -6.5599 -2.1270  0.2559  1.4263 11.4438 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                   13.56067    1.06097  12.781
## PNN_pos_PV_intensity_PL_c                     -0.73637    2.09756  -0.351
## RearingMS                                     -1.70650    1.14579  -1.489
## HousingSI                                     -0.79994    1.14871  -0.696
## PNN_pos_PV_intensity_PL_c:RearingMS            0.02332    2.58794   0.009
## PNN_pos_PV_intensity_PL_c:HousingSI            2.01069    2.50662   0.802
## PNN_pos_PV_intensity_PL_c:RearingMS:HousingSI  1.45254    3.15944   0.460
##                                               Pr(>|t|)    
## (Intercept)                                   6.04e-15 ***
## PNN_pos_PV_intensity_PL_c                        0.728    
## RearingMS                                        0.145    
## HousingSI                                        0.491    
## PNN_pos_PV_intensity_PL_c:RearingMS              0.993    
## PNN_pos_PV_intensity_PL_c:HousingSI              0.428    
## PNN_pos_PV_intensity_PL_c:RearingMS:HousingSI    0.648    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.63 on 36 degrees of freedom
## Multiple R-squared:  0.2103, Adjusted R-squared:  0.07869 
## F-statistic: 1.598 on 6 and 36 DF,  p-value: 0.1761
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: head_pokes
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.60, p = 0.18
## R² = 0.21
## Adj. R² = 0.08 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------------------
##                                                        Est.   S.E.   t val.      p
## --------------------------------------------------- ------- ------ -------- ------
## (Intercept)                                           13.56   1.06    12.78   0.00
## PNN_pos_PV_intensity_PL_c                             -0.74   2.10    -0.35   0.73
## RearingMS                                             -1.71   1.15    -1.49   0.15
## HousingSI                                             -0.80   1.15    -0.70   0.49
## PNN_pos_PV_intensity_PL_c:RearingMS                    0.02   2.59     0.01   0.99
## PNN_pos_PV_intensity_PL_c:HousingSI                    2.01   2.51     0.80   0.43
## PNN_pos_PV_intensity_PL_c:RearingMS:HousingSI          1.45   3.16     0.46   0.65
## ----------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_pokes
##                                           Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_intensity_PL_c                  1  43.51  43.513  3.3025 0.07751 .
## Rearing                                    1  19.83  19.832  1.5052 0.22784  
## Housing                                    1   5.30   5.304  0.4025 0.52979  
## PNN_pos_PV_intensity_PL_c:Rearing          1   3.64   3.643  0.2765 0.60225  
## PNN_pos_PV_intensity_PL_c:Housing          1  51.24  51.245  3.8893 0.05632 .
## PNN_pos_PV_intensity_PL_c:Rearing:Housing  1   2.78   2.785  0.2114 0.64846  
## Residuals                                 36 474.33  13.176                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -5.9010 -1.9983  0.1711  1.7259  7.1002 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                    13.9382     0.9618  14.492
## PV_pos_PNN_intensity_PL_c                      -8.0804     2.4524  -3.295
## RearingMS                                      -1.9877     1.1093  -1.792
## HousingSI                                      -1.0675     1.1056  -0.966
## PV_pos_PNN_intensity_PL_c:RearingMS             8.2191     3.9805   2.065
## PV_pos_PNN_intensity_PL_c:HousingSI             8.2865     3.3723   2.457
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI  -8.3224     5.7706  -1.442
##                                               Pr(>|t|)    
## (Intercept)                                    < 2e-16 ***
## PV_pos_PNN_intensity_PL_c                      0.00222 ** 
## RearingMS                                      0.08157 .  
## HousingSI                                      0.34071    
## PV_pos_PNN_intensity_PL_c:RearingMS            0.04620 *  
## PV_pos_PNN_intensity_PL_c:HousingSI            0.01895 *  
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI  0.15789    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.47 on 36 degrees of freedom
## Multiple R-squared:  0.2783, Adjusted R-squared:  0.158 
## F-statistic: 2.313 on 6 and 36 DF,  p-value: 0.05433
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: head_pokes
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 2.31, p = 0.05
## R² = 0.28
## Adj. R² = 0.16 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------------------
##                                                        Est.   S.E.   t val.      p
## --------------------------------------------------- ------- ------ -------- ------
## (Intercept)                                           13.94   0.96    14.49   0.00
## PV_pos_PNN_intensity_PL_c                             -8.08   2.45    -3.29   0.00
## RearingMS                                             -1.99   1.11    -1.79   0.08
## HousingSI                                             -1.07   1.11    -0.97   0.34
## PV_pos_PNN_intensity_PL_c:RearingMS                    8.22   3.98     2.06   0.05
## PV_pos_PNN_intensity_PL_c:HousingSI                    8.29   3.37     2.46   0.02
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI         -8.32   5.77    -1.44   0.16
## ----------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_pokes
##                                           Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_pos_PNN_intensity_PL_c                  1  23.67  23.673  1.9659 0.16945  
## Rearing                                    1  39.33  39.330  3.2661 0.07909 .
## Housing                                    1  10.68  10.679  0.8869 0.35261  
## PV_pos_PNN_intensity_PL_c:Rearing          1  20.76  20.762  1.7242 0.19747  
## PV_pos_PNN_intensity_PL_c:Housing          1  47.66  47.660  3.9579 0.05429 .
## PV_pos_PNN_intensity_PL_c:Rearing:Housing  1  25.05  25.047  2.0800 0.15789  
## Residuals                                 36 433.50  12.042                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -6.4124 -1.7821 -0.1644  1.9662 11.3154 
## 
## Coefficients:
##                                   Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                       13.66601    1.07635  12.697 7.36e-15 ***
## PV_count_IL_c                     -0.15638    0.14158  -1.105    0.277    
## RearingMS                         -1.69589    1.17451  -1.444    0.157    
## HousingSI                         -0.48523    1.17434  -0.413    0.682    
## PV_count_IL_c:RearingMS           -0.07015    0.17919  -0.391    0.698    
## PV_count_IL_c:HousingSI            0.22776    0.16985   1.341    0.188    
## PV_count_IL_c:RearingMS:HousingSI  0.16389    0.23173   0.707    0.484    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.529 on 36 degrees of freedom
## Multiple R-squared:  0.2537, Adjusted R-squared:  0.1293 
## F-statistic:  2.04 on 6 and 36 DF,  p-value: 0.08544
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: head_pokes
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 2.04, p = 0.09
## R² = 0.25
## Adj. R² = 0.13 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------
##                                            Est.   S.E.   t val.      p
## --------------------------------------- ------- ------ -------- ------
## (Intercept)                               13.67   1.08    12.70   0.00
## PV_count_IL_c                             -0.16   0.14    -1.10   0.28
## RearingMS                                 -1.70   1.17    -1.44   0.16
## HousingSI                                 -0.49   1.17    -0.41   0.68
## PV_count_IL_c:RearingMS                   -0.07   0.18    -0.39   0.70
## PV_count_IL_c:HousingSI                    0.23   0.17     1.34   0.19
## PV_count_IL_c:RearingMS:HousingSI          0.16   0.23     0.71   0.48
## ----------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_pokes
##                               Df Sum Sq Mean Sq F value   Pr(>F)   
## PV_count_IL_c                  1   1.42   1.421  0.1141 0.737454   
## Rearing                        1  28.34  28.342  2.2762 0.140099   
## Housing                        1   7.24   7.239  0.5814 0.450728   
## PV_count_IL_c:Rearing          1   0.20   0.195  0.0157 0.900996   
## PV_count_IL_c:Housing          1 108.97 108.972  8.7518 0.005437 **
## PV_count_IL_c:Rearing:Housing  1   6.23   6.228  0.5002 0.483963   
## Residuals                     36 448.25  12.451                    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -9.0945 -1.5897  0.4028  1.4040  7.3967 
## 
## Coefficients:
##                                       Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                            13.8295     0.9756  14.175 2.66e-16 ***
## PV_intensity_IL_c                      -7.4189     3.2598  -2.276   0.0289 *  
## RearingMS                              -1.6795     1.0981  -1.529   0.1349    
## HousingSI                              -1.0809     1.0983  -0.984   0.3316    
## PV_intensity_IL_c:RearingMS             5.5668     4.0508   1.374   0.1779    
## PV_intensity_IL_c:HousingSI             9.3078     3.8891   2.393   0.0220 *  
## PV_intensity_IL_c:RearingMS:HousingSI  -3.6177     5.1518  -0.702   0.4871    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.529 on 36 degrees of freedom
## Multiple R-squared:  0.2536, Adjusted R-squared:  0.1292 
## F-statistic: 2.038 on 6 and 36 DF,  p-value: 0.08569
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: head_pokes
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 2.04, p = 0.09
## R² = 0.25
## Adj. R² = 0.13 
## 
## Standard errors: OLS
## --------------------------------------------------------------------------
##                                                Est.   S.E.   t val.      p
## ------------------------------------------- ------- ------ -------- ------
## (Intercept)                                   13.83   0.98    14.18   0.00
## PV_intensity_IL_c                             -7.42   3.26    -2.28   0.03
## RearingMS                                     -1.68   1.10    -1.53   0.13
## HousingSI                                     -1.08   1.10    -0.98   0.33
## PV_intensity_IL_c:RearingMS                    5.57   4.05     1.37   0.18
## PV_intensity_IL_c:HousingSI                    9.31   3.89     2.39   0.02
## PV_intensity_IL_c:RearingMS:HousingSI         -3.62   5.15    -0.70   0.49
## --------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_pokes
##                                   Df Sum Sq Mean Sq F value   Pr(>F)   
## PV_intensity_IL_c                  1   1.66   1.662  0.1335 0.716995   
## Rearing                            1  28.61  28.615  2.2976 0.138305   
## Housing                            1   6.33   6.328  0.5081 0.480564   
## PV_intensity_IL_c:Rearing          1   9.09   9.091  0.7299 0.398557   
## PV_intensity_IL_c:Housing          1 100.46 100.464  8.0667 0.007372 **
## PV_intensity_IL_c:Rearing:Housing  1   6.14   6.141  0.4931 0.487059   
## Residuals                         36 448.35  12.454                    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -6.8009 -1.4302 -0.1988  2.3700  6.2957 
## 
## Coefficients:
##                                    Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                        13.94561    0.91870  15.180  < 2e-16 ***
## PNN_count_IL_c                     -0.34308    0.09804  -3.500  0.00126 ** 
## RearingMS                          -1.95840    1.03288  -1.896  0.06600 .  
## HousingSI                          -1.04674    1.03302  -1.013  0.31769    
## PNN_count_IL_c:RearingMS            0.31215    0.12638   2.470  0.01838 *  
## PNN_count_IL_c:HousingSI            0.42341    0.12738   3.324  0.00205 ** 
## PNN_count_IL_c:RearingMS:HousingSI -0.29483    0.19272  -1.530  0.13480    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.358 on 36 degrees of freedom
## Multiple R-squared:  0.3242, Adjusted R-squared:  0.2116 
## F-statistic: 2.878 on 6 and 36 DF,  p-value: 0.02144
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: head_pokes
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 2.88, p = 0.02
## R² = 0.32
## Adj. R² = 0.21 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------
##                                             Est.   S.E.   t val.      p
## ---------------------------------------- ------- ------ -------- ------
## (Intercept)                                13.95   0.92    15.18   0.00
## PNN_count_IL_c                             -0.34   0.10    -3.50   0.00
## RearingMS                                  -1.96   1.03    -1.90   0.07
## HousingSI                                  -1.05   1.03    -1.01   0.32
## PNN_count_IL_c:RearingMS                    0.31   0.13     2.47   0.02
## PNN_count_IL_c:HousingSI                    0.42   0.13     3.32   0.00
## PNN_count_IL_c:RearingMS:HousingSI         -0.29   0.19    -1.53   0.13
## -----------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_pokes
##                                Df Sum Sq Mean Sq F value   Pr(>F)   
## PNN_count_IL_c                  1   8.07   8.070  0.7157 0.403154   
## Rearing                         1  31.00  31.004  2.7497 0.105963   
## Housing                         1   7.94   7.938  0.7040 0.406984   
## PNN_count_IL_c:Rearing          1  14.04  14.035  1.2447 0.271951   
## PNN_count_IL_c:Housing          1 107.30 107.298  9.5160 0.003901 **
## PNN_count_IL_c:Rearing:Housing  1  26.39  26.388  2.3403 0.134804   
## Residuals                      36 405.92  11.276                    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -6.1536 -2.3301  0.2905  1.6017  6.3656 
## 
## Coefficients:
##                                        Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                             13.8203     0.9930  13.918 4.65e-16 ***
## PNN_intensity_IL_c                      -6.9798     3.0229  -2.309   0.0268 *  
## RearingMS                               -2.0553     1.1329  -1.814   0.0780 .  
## HousingSI                               -0.9827     1.1333  -0.867   0.3916    
## PNN_intensity_IL_c:RearingMS             5.8137     6.0150   0.967   0.3402    
## PNN_intensity_IL_c:HousingSI             8.0920     4.7175   1.715   0.0949 .  
## PNN_intensity_IL_c:RearingMS:HousingSI -12.2387     7.9488  -1.540   0.1324    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.607 on 36 degrees of freedom
## Multiple R-squared:   0.22,  Adjusted R-squared:  0.09002 
## F-statistic: 1.692 on 6 and 36 DF,  p-value: 0.1511
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: head_pokes
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.69, p = 0.15
## R² = 0.22
## Adj. R² = 0.09 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------------
##                                                  Est.   S.E.   t val.      p
## -------------------------------------------- -------- ------ -------- ------
## (Intercept)                                     13.82   0.99    13.92   0.00
## PNN_intensity_IL_c                              -6.98   3.02    -2.31   0.03
## RearingMS                                       -2.06   1.13    -1.81   0.08
## HousingSI                                       -0.98   1.13    -0.87   0.39
## PNN_intensity_IL_c:RearingMS                     5.81   6.01     0.97   0.34
## PNN_intensity_IL_c:HousingSI                     8.09   4.72     1.72   0.09
## PNN_intensity_IL_c:RearingMS:HousingSI         -12.24   7.95    -1.54   0.13
## ----------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_pokes
##                                    Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_intensity_IL_c                  1  42.19  42.188  3.2418 0.08016 .
## Rearing                             1  38.56  38.564  2.9633 0.09376 .
## Housing                             1   7.61   7.610  0.5847 0.44945  
## PNN_intensity_IL_c:Rearing          1   0.04   0.044  0.0034 0.95394  
## PNN_intensity_IL_c:Housing          1  12.90  12.895  0.9909 0.32617  
## PNN_intensity_IL_c:Rearing:Housing  1  30.85  30.851  2.3706 0.13238  
## Residuals                          36 468.50  13.014                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -6.6058 -1.7618 -0.0127  1.9583  7.0032 
## 
## Coefficients:
##                                           Estimate Std. Error t value Pr(>|t|)
## (Intercept)                                14.6095     0.9257  15.783  < 2e-16
## PNN_pos_PV_count_IL_c                      -0.9124     0.2240  -4.073 0.000244
## RearingMS                                  -2.5111     1.0212  -2.459 0.018879
## HousingSI                                  -1.4749     1.0224  -1.443 0.157804
## PNN_pos_PV_count_IL_c:RearingMS             0.7678     0.3006   2.554 0.015028
## PNN_pos_PV_count_IL_c:HousingSI             1.0158     0.2763   3.677 0.000765
## PNN_pos_PV_count_IL_c:RearingMS:HousingSI  -0.7881     0.4224  -1.866 0.070252
##                                              
## (Intercept)                               ***
## PNN_pos_PV_count_IL_c                     ***
## RearingMS                                 *  
## HousingSI                                    
## PNN_pos_PV_count_IL_c:RearingMS           *  
## PNN_pos_PV_count_IL_c:HousingSI           ***
## PNN_pos_PV_count_IL_c:RearingMS:HousingSI .  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.237 on 36 degrees of freedom
## Multiple R-squared:  0.372,  Adjusted R-squared:  0.2673 
## F-statistic: 3.554 on 6 and 36 DF,  p-value: 0.007244
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: head_pokes
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 3.55, p = 0.01
## R² = 0.37
## Adj. R² = 0.27 
## 
## Standard errors: OLS
## ------------------------------------------------------------------------------
##                                                    Est.   S.E.   t val.      p
## ----------------------------------------------- ------- ------ -------- ------
## (Intercept)                                       14.61   0.93    15.78   0.00
## PNN_pos_PV_count_IL_c                             -0.91   0.22    -4.07   0.00
## RearingMS                                         -2.51   1.02    -2.46   0.02
## HousingSI                                         -1.47   1.02    -1.44   0.16
## PNN_pos_PV_count_IL_c:RearingMS                    0.77   0.30     2.55   0.02
## PNN_pos_PV_count_IL_c:HousingSI                    1.02   0.28     3.68   0.00
## PNN_pos_PV_count_IL_c:RearingMS:HousingSI         -0.79   0.42    -1.87   0.07
## ------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_pokes
##                                       Df Sum Sq Mean Sq F value   Pr(>F)   
## PNN_pos_PV_count_IL_c                  1  16.61  16.613  1.5854 0.216086   
## Rearing                                1  39.45  39.453  3.7652 0.060194 . 
## Housing                                1   9.26   9.255  0.8832 0.353577   
## PNN_pos_PV_count_IL_c:Rearing          1   9.33   9.329  0.8903 0.351675   
## PNN_pos_PV_count_IL_c:Housing          1 112.30 112.301 10.7172 0.002349 **
## PNN_pos_PV_count_IL_c:Rearing:Housing  1  36.47  36.473  3.4807 0.070252 . 
## Residuals                             36 377.23  10.479                    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -8.3274 -1.7121  0.4675  1.3530 10.0852 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                    13.6852     1.0268  13.328
## PNN_pos_PV_intensity_IL_c                      -3.9598     3.0113  -1.315
## RearingMS                                      -1.6142     1.1513  -1.402
## HousingSI                                      -0.8732     1.1514  -0.758
## PNN_pos_PV_intensity_IL_c:RearingMS             2.8986     3.4775   0.834
## PNN_pos_PV_intensity_IL_c:HousingSI             6.0749     3.6990   1.642
## PNN_pos_PV_intensity_IL_c:RearingMS:HousingSI  -1.8938     4.6422  -0.408
##                                               Pr(>|t|)    
## (Intercept)                                   1.73e-15 ***
## PNN_pos_PV_intensity_IL_c                        0.197    
## RearingMS                                        0.169    
## HousingSI                                        0.453    
## PNN_pos_PV_intensity_IL_c:RearingMS              0.410    
## PNN_pos_PV_intensity_IL_c:HousingSI              0.109    
## PNN_pos_PV_intensity_IL_c:RearingMS:HousingSI    0.686    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.7 on 36 degrees of freedom
## Multiple R-squared:  0.1797, Adjusted R-squared:  0.04294 
## F-statistic: 1.314 on 6 and 36 DF,  p-value: 0.2761
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: head_pokes
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.31, p = 0.28
## R² = 0.18
## Adj. R² = 0.04 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------------------
##                                                        Est.   S.E.   t val.      p
## --------------------------------------------------- ------- ------ -------- ------
## (Intercept)                                           13.69   1.03    13.33   0.00
## PNN_pos_PV_intensity_IL_c                             -3.96   3.01    -1.31   0.20
## RearingMS                                             -1.61   1.15    -1.40   0.17
## HousingSI                                             -0.87   1.15    -0.76   0.45
## PNN_pos_PV_intensity_IL_c:RearingMS                    2.90   3.48     0.83   0.41
## PNN_pos_PV_intensity_IL_c:HousingSI                    6.07   3.70     1.64   0.11
## PNN_pos_PV_intensity_IL_c:RearingMS:HousingSI         -1.89   4.64    -0.41   0.69
## ----------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_pokes
##                                           Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_intensity_IL_c                  1   4.97   4.974  0.3634 0.55038  
## Rearing                                    1  27.90  27.897  2.0382 0.16201  
## Housing                                    1   5.62   5.620  0.4106 0.52571  
## PNN_pos_PV_intensity_IL_c:Rearing          1   1.07   1.072  0.0783 0.78120  
## PNN_pos_PV_intensity_IL_c:Housing          1  66.07  66.074  4.8275 0.03453 *
## PNN_pos_PV_intensity_IL_c:Rearing:Housing  1   2.28   2.278  0.1664 0.68572  
## Residuals                                 36 492.74  13.687                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -5.7512 -1.9335  0.2017  2.0105  6.9706 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                    13.8308     0.9570  14.453
## PV_pos_PNN_intensity_IL_c                      -6.9372     2.5180  -2.755
## RearingMS                                      -2.0548     1.0870  -1.890
## HousingSI                                      -0.9356     1.0870  -0.861
## PV_pos_PNN_intensity_IL_c:RearingMS             7.0103     4.2811   1.638
## PV_pos_PNN_intensity_IL_c:HousingSI             8.8880     3.7473   2.372
## PV_pos_PNN_intensity_IL_c:RearingMS:HousingSI -12.7244     5.8153  -2.188
##                                               Pr(>|t|)    
## (Intercept)                                    < 2e-16 ***
## PV_pos_PNN_intensity_IL_c                      0.00915 ** 
## RearingMS                                      0.06679 .  
## HousingSI                                      0.39508    
## PV_pos_PNN_intensity_IL_c:RearingMS            0.11024    
## PV_pos_PNN_intensity_IL_c:HousingSI            0.02317 *  
## PV_pos_PNN_intensity_IL_c:RearingMS:HousingSI  0.03524 *  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.51 on 36 degrees of freedom
## Multiple R-squared:  0.2617, Adjusted R-squared:  0.1386 
## F-statistic: 2.127 on 6 and 36 DF,  p-value: 0.07403
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: head_pokes
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 2.13, p = 0.07
## R² = 0.26
## Adj. R² = 0.14 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------------------
##                                                         Est.   S.E.   t val.      p
## --------------------------------------------------- -------- ------ -------- ------
## (Intercept)                                            13.83   0.96    14.45   0.00
## PV_pos_PNN_intensity_IL_c                              -6.94   2.52    -2.76   0.01
## RearingMS                                              -2.05   1.09    -1.89   0.07
## HousingSI                                              -0.94   1.09    -0.86   0.40
## PV_pos_PNN_intensity_IL_c:RearingMS                     7.01   4.28     1.64   0.11
## PV_pos_PNN_intensity_IL_c:HousingSI                     8.89   3.75     2.37   0.02
## PV_pos_PNN_intensity_IL_c:RearingMS:HousingSI         -12.72   5.82    -2.19   0.04
## -----------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: head_pokes
##                                           Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_pos_PNN_intensity_IL_c                  1  36.95  36.949  2.9994 0.09186 .
## Rearing                                    1  30.45  30.450  2.4718 0.12465  
## Housing                                    1  10.50  10.502  0.8526 0.36198  
## PV_pos_PNN_intensity_IL_c:Rearing          1   0.64   0.643  0.0522 0.82064  
## PV_pos_PNN_intensity_IL_c:Housing          1  19.66  19.661  1.5960 0.21459  
## PV_pos_PNN_intensity_IL_c:Rearing:Housing  1  58.98  58.978  4.7877 0.03524 *
## Residuals                                 36 443.47  12.319                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## [[1]]
## Analysis of Variance Table
## 
## Response: head_pokes
##                               Df Sum Sq Mean Sq F value Pr(>F)  
## PV_count_PL_c                  1  17.99  17.991  1.4418 0.2377  
## Rearing                        1  20.84  20.839  1.6700 0.2045  
## Housing                        1   5.10   5.096  0.4084 0.5268  
## PV_count_PL_c:Rearing          1   6.15   6.152  0.4930 0.4871  
## PV_count_PL_c:Housing          1  91.47  91.472  7.3303 0.0103 *
## PV_count_PL_c:Rearing:Housing  1   9.87   9.870  0.7910 0.3797  
## Residuals                     36 449.23  12.479                 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[2]]
## Analysis of Variance Table
## 
## Response: head_pokes
##                                   Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_intensity_PL_c                  1  21.97  21.974  1.7616 0.19279  
## Rearing                            1  23.87  23.868  1.9134 0.17510  
## Housing                            1   6.14   6.138  0.4921 0.48751  
## PV_intensity_PL_c:Rearing          1  33.69  33.693  2.7011 0.10899  
## PV_intensity_PL_c:Housing          1  61.17  61.173  4.9040 0.03321 *
## PV_intensity_PL_c:Rearing:Housing  1   4.74   4.741  0.3801 0.54143  
## Residuals                         36 449.06  12.474                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[3]]
## Analysis of Variance Table
## 
## Response: head_pokes
##                                Df Sum Sq Mean Sq F value   Pr(>F)    
## PNN_count_PL_c                  1   0.03   0.029  0.0032  0.95550    
## Rearing                         1  29.80  29.796  3.2694  0.07894 .  
## Housing                         1   6.72   6.719  0.7373  0.39621    
## PNN_count_PL_c:Rearing          1  33.41  33.407  3.6656  0.06352 .  
## PNN_count_PL_c:Housing          1 182.18 182.176 19.9893 7.47e-05 ***
## PNN_count_PL_c:Rearing:Housing  1  20.43  20.431  2.2418  0.14304    
## Residuals                      36 328.09   9.114                     
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[4]]
## Analysis of Variance Table
## 
## Response: head_pokes
##                                    Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_intensity_PL_c                  1  29.86  29.862  2.4905 0.12328  
## Rearing                             1  42.48  42.485  3.5433 0.06789 .
## Housing                             1   9.94   9.943  0.8292 0.36855  
## PNN_intensity_PL_c:Rearing          1  17.58  17.585  1.4666 0.23377  
## PNN_intensity_PL_c:Housing          1  32.39  32.391  2.7015 0.10896  
## PNN_intensity_PL_c:Rearing:Housing  1  36.74  36.742  3.0644 0.08855 .
## Residuals                          36 431.64  11.990                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[5]]
## Analysis of Variance Table
## 
## Response: head_pokes
##                                       Df Sum Sq Mean Sq F value    Pr(>F)    
## PNN_pos_PV_count_PL_c                  1   0.21   0.208  0.0219 0.8832126    
## Rearing                                1  29.92  29.923  3.1525 0.0842642 .  
## Housing                                1   6.66   6.663  0.7020 0.4076398    
## PNN_pos_PV_count_PL_c:Rearing          1  60.46  60.462  6.3699 0.0161606 *  
## PNN_pos_PV_count_PL_c:Housing          1 137.26 137.260 14.4608 0.0005339 ***
## PNN_pos_PV_count_PL_c:Rearing:Housing  1  24.43  24.426  2.5733 0.1174161    
## Residuals                             36 341.71   9.492                      
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[6]]
## Analysis of Variance Table
## 
## Response: head_pokes
##                                           Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_intensity_PL_c                  1  43.51  43.513  3.3025 0.07751 .
## Rearing                                    1  19.83  19.832  1.5052 0.22784  
## Housing                                    1   5.30   5.304  0.4025 0.52979  
## PNN_pos_PV_intensity_PL_c:Rearing          1   3.64   3.643  0.2765 0.60225  
## PNN_pos_PV_intensity_PL_c:Housing          1  51.24  51.245  3.8893 0.05632 .
## PNN_pos_PV_intensity_PL_c:Rearing:Housing  1   2.78   2.785  0.2114 0.64846  
## Residuals                                 36 474.33  13.176                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[7]]
## Analysis of Variance Table
## 
## Response: head_pokes
##                                           Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_pos_PNN_intensity_PL_c                  1  23.67  23.673  1.9659 0.16945  
## Rearing                                    1  39.33  39.330  3.2661 0.07909 .
## Housing                                    1  10.68  10.679  0.8869 0.35261  
## PV_pos_PNN_intensity_PL_c:Rearing          1  20.76  20.762  1.7242 0.19747  
## PV_pos_PNN_intensity_PL_c:Housing          1  47.66  47.660  3.9579 0.05429 .
## PV_pos_PNN_intensity_PL_c:Rearing:Housing  1  25.05  25.047  2.0800 0.15789  
## Residuals                                 36 433.50  12.042                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[8]]
## Analysis of Variance Table
## 
## Response: head_pokes
##                               Df Sum Sq Mean Sq F value   Pr(>F)   
## PV_count_IL_c                  1   1.42   1.421  0.1141 0.737454   
## Rearing                        1  28.34  28.342  2.2762 0.140099   
## Housing                        1   7.24   7.239  0.5814 0.450728   
## PV_count_IL_c:Rearing          1   0.20   0.195  0.0157 0.900996   
## PV_count_IL_c:Housing          1 108.97 108.972  8.7518 0.005437 **
## PV_count_IL_c:Rearing:Housing  1   6.23   6.228  0.5002 0.483963   
## Residuals                     36 448.25  12.451                    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[9]]
## Analysis of Variance Table
## 
## Response: head_pokes
##                                   Df Sum Sq Mean Sq F value   Pr(>F)   
## PV_intensity_IL_c                  1   1.66   1.662  0.1335 0.716995   
## Rearing                            1  28.61  28.615  2.2976 0.138305   
## Housing                            1   6.33   6.328  0.5081 0.480564   
## PV_intensity_IL_c:Rearing          1   9.09   9.091  0.7299 0.398557   
## PV_intensity_IL_c:Housing          1 100.46 100.464  8.0667 0.007372 **
## PV_intensity_IL_c:Rearing:Housing  1   6.14   6.141  0.4931 0.487059   
## Residuals                         36 448.35  12.454                    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[10]]
## Analysis of Variance Table
## 
## Response: head_pokes
##                                Df Sum Sq Mean Sq F value   Pr(>F)   
## PNN_count_IL_c                  1   8.07   8.070  0.7157 0.403154   
## Rearing                         1  31.00  31.004  2.7497 0.105963   
## Housing                         1   7.94   7.938  0.7040 0.406984   
## PNN_count_IL_c:Rearing          1  14.04  14.035  1.2447 0.271951   
## PNN_count_IL_c:Housing          1 107.30 107.298  9.5160 0.003901 **
## PNN_count_IL_c:Rearing:Housing  1  26.39  26.388  2.3403 0.134804   
## Residuals                      36 405.92  11.276                    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[11]]
## Analysis of Variance Table
## 
## Response: head_pokes
##                                    Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_intensity_IL_c                  1  42.19  42.188  3.2418 0.08016 .
## Rearing                             1  38.56  38.564  2.9633 0.09376 .
## Housing                             1   7.61   7.610  0.5847 0.44945  
## PNN_intensity_IL_c:Rearing          1   0.04   0.044  0.0034 0.95394  
## PNN_intensity_IL_c:Housing          1  12.90  12.895  0.9909 0.32617  
## PNN_intensity_IL_c:Rearing:Housing  1  30.85  30.851  2.3706 0.13238  
## Residuals                          36 468.50  13.014                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[12]]
## Analysis of Variance Table
## 
## Response: head_pokes
##                                       Df Sum Sq Mean Sq F value   Pr(>F)   
## PNN_pos_PV_count_IL_c                  1  16.61  16.613  1.5854 0.216086   
## Rearing                                1  39.45  39.453  3.7652 0.060194 . 
## Housing                                1   9.26   9.255  0.8832 0.353577   
## PNN_pos_PV_count_IL_c:Rearing          1   9.33   9.329  0.8903 0.351675   
## PNN_pos_PV_count_IL_c:Housing          1 112.30 112.301 10.7172 0.002349 **
## PNN_pos_PV_count_IL_c:Rearing:Housing  1  36.47  36.473  3.4807 0.070252 . 
## Residuals                             36 377.23  10.479                    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[13]]
## Analysis of Variance Table
## 
## Response: head_pokes
##                                           Df Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_intensity_IL_c                  1   4.97   4.974  0.3634 0.55038  
## Rearing                                    1  27.90  27.897  2.0382 0.16201  
## Housing                                    1   5.62   5.620  0.4106 0.52571  
## PNN_pos_PV_intensity_IL_c:Rearing          1   1.07   1.072  0.0783 0.78120  
## PNN_pos_PV_intensity_IL_c:Housing          1  66.07  66.074  4.8275 0.03453 *
## PNN_pos_PV_intensity_IL_c:Rearing:Housing  1   2.28   2.278  0.1664 0.68572  
## Residuals                                 36 492.74  13.687                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[14]]
## Analysis of Variance Table
## 
## Response: head_pokes
##                                           Df Sum Sq Mean Sq F value  Pr(>F)  
## PV_pos_PNN_intensity_IL_c                  1  36.95  36.949  2.9994 0.09186 .
## Rearing                                    1  30.45  30.450  2.4718 0.12465  
## Housing                                    1  10.50  10.502  0.8526 0.36198  
## PV_pos_PNN_intensity_IL_c:Rearing          1   0.64   0.643  0.0522 0.82064  
## PV_pos_PNN_intensity_IL_c:Housing          1  19.66  19.661  1.5960 0.21459  
## PV_pos_PNN_intensity_IL_c:Rearing:Housing  1  58.98  58.978  4.7877 0.03524 *
## Residuals                                 36 443.47  12.319                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

Male - Time in the open

# Returning summary, summ, and anova stats for every linear model in the malelm_time_open list
lapply(malelm_time_open, function(x){
    print(summary(x))
    print(summ(x))
    print(anova(x))
})
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -42.430 -18.464   2.095  14.378  51.721 
## 
## Coefficients:
##                                   Estimate Std. Error t value Pr(>|t|)   
## (Intercept)                       27.02373    7.83211   3.450  0.00145 **
## PV_count_PL_c                      0.09044    1.02130   0.089  0.92993   
## RearingMS                          7.14510    8.40628   0.850  0.40096   
## HousingSI                         16.60989    8.48236   1.958  0.05799 . 
## PV_count_PL_c:RearingMS            0.19929    1.45124   0.137  0.89154   
## PV_count_PL_c:HousingSI           -0.80013    1.27246  -0.629  0.53344   
## PV_count_PL_c:RearingMS:HousingSI -0.59539    1.77444  -0.336  0.73917   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 25.73 on 36 degrees of freedom
## Multiple R-squared:  0.2142, Adjusted R-squared:  0.08326 
## F-statistic: 1.636 on 6 and 36 DF,  p-value: 0.1657
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: time_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.64, p = 0.17
## R² = 0.21
## Adj. R² = 0.08 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------
##                                            Est.   S.E.   t val.      p
## --------------------------------------- ------- ------ -------- ------
## (Intercept)                               27.02   7.83     3.45   0.00
## PV_count_PL_c                              0.09   1.02     0.09   0.93
## RearingMS                                  7.15   8.41     0.85   0.40
## HousingSI                                 16.61   8.48     1.96   0.06
## PV_count_PL_c:RearingMS                    0.20   1.45     0.14   0.89
## PV_count_PL_c:HousingSI                   -0.80   1.27    -0.63   0.53
## PV_count_PL_c:RearingMS:HousingSI         -0.60   1.77    -0.34   0.74
## ----------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: time_open
##                               Df  Sum Sq Mean Sq F value  Pr(>F)  
## PV_count_PL_c                  1  1827.9  1827.9  2.7605 0.10530  
## Rearing                        1   109.1   109.1  0.1648 0.68717  
## Housing                        1  3246.2  3246.2  4.9026 0.03324 *
## PV_count_PL_c:Rearing          1    58.5    58.5  0.0883 0.76801  
## PV_count_PL_c:Housing          1  1182.3  1182.3  1.7855 0.18985  
## PV_count_PL_c:Rearing:Housing  1    74.5    74.5  0.1126 0.73917  
## Residuals                     36 23837.5   662.2                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -49.038 -14.485  -1.076  16.191  46.837 
## 
## Coefficients:
##                                       Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                             26.413      7.235   3.651 0.000824 ***
## PV_intensity_PL_c                        4.934     17.496   0.282 0.779546    
## RearingMS                                6.824      8.104   0.842 0.405306    
## HousingSI                               18.997      8.108   2.343 0.024776 *  
## PV_intensity_PL_c:RearingMS             -9.071     24.562  -0.369 0.714065    
## PV_intensity_PL_c:HousingSI            -18.380     22.609  -0.813 0.421575    
## PV_intensity_PL_c:RearingMS:HousingSI   10.677     30.504   0.350 0.728369    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 26.21 on 36 degrees of freedom
## Multiple R-squared:  0.185,  Adjusted R-squared:  0.04918 
## F-statistic: 1.362 on 6 and 36 DF,  p-value: 0.2562
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: time_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.36, p = 0.26
## R² = 0.19
## Adj. R² = 0.05 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------------
##                                                 Est.    S.E.   t val.      p
## ------------------------------------------- -------- ------- -------- ------
## (Intercept)                                    26.41    7.24     3.65   0.00
## PV_intensity_PL_c                               4.93   17.50     0.28   0.78
## RearingMS                                       6.82    8.10     0.84   0.41
## HousingSI                                      19.00    8.11     2.34   0.02
## PV_intensity_PL_c:RearingMS                    -9.07   24.56    -0.37   0.71
## PV_intensity_PL_c:HousingSI                   -18.38   22.61    -0.81   0.42
## PV_intensity_PL_c:RearingMS:HousingSI          10.68   30.50     0.35   0.73
## ----------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: time_open
##                                   Df  Sum Sq Mean Sq F value  Pr(>F)  
## PV_intensity_PL_c                  1  1138.2  1138.2  1.6574 0.20618  
## Rearing                            1   261.8   261.8  0.3812 0.54083  
## Housing                            1  3612.0  3612.0  5.2595 0.02777 *
## PV_intensity_PL_c:Rearing          1    42.8    42.8  0.0623 0.80425  
## PV_intensity_PL_c:Housing          1   473.6   473.6  0.6896 0.41178  
## PV_intensity_PL_c:Rearing:Housing  1    84.1    84.1  0.1225 0.72837  
## Residuals                         36 24723.5   686.8                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -48.673 -16.232   0.688  16.683  43.977 
## 
## Coefficients:
##                                    Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                         26.4541     6.9076   3.830 0.000494 ***
## PNN_count_PL_c                       1.0676     1.0223   1.044 0.303263    
## RearingMS                            6.7199     7.8213   0.859 0.395929    
## HousingSI                           18.3248     7.8189   2.344 0.024735 *  
## PNN_count_PL_c:RearingMS            -0.6257     1.2056  -0.519 0.606930    
## PNN_count_PL_c:HousingSI            -2.2139     1.3329  -1.661 0.105401    
## PNN_count_PL_c:RearingMS:HousingSI   0.7925     1.7374   0.456 0.651031    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 25.44 on 36 degrees of freedom
## Multiple R-squared:  0.232,  Adjusted R-squared:  0.104 
## F-statistic: 1.813 on 6 and 36 DF,  p-value: 0.1242
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: time_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.81, p = 0.12
## R² = 0.23
## Adj. R² = 0.10 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------
##                                             Est.   S.E.   t val.      p
## ---------------------------------------- ------- ------ -------- ------
## (Intercept)                                26.45   6.91     3.83   0.00
## PNN_count_PL_c                              1.07   1.02     1.04   0.30
## RearingMS                                   6.72   7.82     0.86   0.40
## HousingSI                                  18.32   7.82     2.34   0.02
## PNN_count_PL_c:RearingMS                   -0.63   1.21    -0.52   0.61
## PNN_count_PL_c:HousingSI                   -2.21   1.33    -1.66   0.11
## PNN_count_PL_c:RearingMS:HousingSI          0.79   1.74     0.46   0.65
## -----------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: time_open
##                                Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_count_PL_c                  1   136.3   136.3  0.2105 0.64911  
## Rearing                         1   399.3   399.3  0.6170 0.43729  
## Housing                         1  3617.9  3617.9  5.5904 0.02357 *
## PNN_count_PL_c:Rearing          1    37.2    37.2  0.0575 0.81180  
## PNN_count_PL_c:Housing          1  2712.7  2712.7  4.1917 0.04797 *
## PNN_count_PL_c:Rearing:Housing  1   134.6   134.6  0.2081 0.65103  
## Residuals                      36 23298.0   647.2                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -43.925 -13.479  -2.349  20.603  44.729 
## 
## Coefficients:
##                                        Estimate Std. Error t value Pr(>|t|)   
## (Intercept)                              24.139      7.218   3.344  0.00194 **
## PNN_intensity_PL_c                       22.665     19.788   1.145  0.25961   
## RearingMS                                10.870      8.324   1.306  0.19986   
## HousingSI                                21.561      8.292   2.600  0.01343 * 
## PNN_intensity_PL_c:RearingMS            -18.120     32.302  -0.561  0.57831   
## PNN_intensity_PL_c:HousingSI            -18.288     27.161  -0.673  0.50505   
## PNN_intensity_PL_c:RearingMS:HousingSI   52.203     46.714   1.118  0.27118   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 25.92 on 36 degrees of freedom
## Multiple R-squared:  0.203,  Adjusted R-squared:  0.07019 
## F-statistic: 1.528 on 6 and 36 DF,  p-value: 0.1969
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: time_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.53, p = 0.20
## R² = 0.20
## Adj. R² = 0.07 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------------
##                                                  Est.    S.E.   t val.      p
## -------------------------------------------- -------- ------- -------- ------
## (Intercept)                                     24.14    7.22     3.34   0.00
## PNN_intensity_PL_c                              22.67   19.79     1.15   0.26
## RearingMS                                       10.87    8.32     1.31   0.20
## HousingSI                                       21.56    8.29     2.60   0.01
## PNN_intensity_PL_c:RearingMS                   -18.12   32.30    -0.56   0.58
## PNN_intensity_PL_c:HousingSI                   -18.29   27.16    -0.67   0.51
## PNN_intensity_PL_c:RearingMS:HousingSI          52.20   46.71     1.12   0.27
## -----------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: time_open
##                                    Df  Sum Sq Mean Sq F value Pr(>F)  
## PNN_intensity_PL_c                  1   603.2   603.2  0.8981 0.3496  
## Rearing                             1   631.7   631.7  0.9406 0.3386  
## Housing                             1  4036.8  4036.8  6.0108 0.0192 *
## PNN_intensity_PL_c:Rearing          1    48.3    48.3  0.0719 0.7901  
## PNN_intensity_PL_c:Housing          1     0.2     0.2  0.0004 0.9847  
## PNN_intensity_PL_c:Rearing:Housing  1   838.7   838.7  1.2488 0.2712  
## Residuals                          36 24177.2   671.6                 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -51.970 -15.710   0.323  14.926  50.020 
## 
## Coefficients:
##                                           Estimate Std. Error t value Pr(>|t|)
## (Intercept)                                25.3087     7.3604   3.439  0.00149
## PNN_pos_PV_count_PL_c                       1.3917     1.5413   0.903  0.37254
## RearingMS                                   8.5876     8.2223   1.044  0.30325
## HousingSI                                  18.8838     8.2385   2.292  0.02785
## PNN_pos_PV_count_PL_c:RearingMS            -0.8516     2.2282  -0.382  0.70455
## PNN_pos_PV_count_PL_c:HousingSI            -2.8053     2.0238  -1.386  0.17422
## PNN_pos_PV_count_PL_c:RearingMS:HousingSI   1.2207     2.9710   0.411  0.68359
##                                             
## (Intercept)                               **
## PNN_pos_PV_count_PL_c                       
## RearingMS                                   
## HousingSI                                 * 
## PNN_pos_PV_count_PL_c:RearingMS             
## PNN_pos_PV_count_PL_c:HousingSI             
## PNN_pos_PV_count_PL_c:RearingMS:HousingSI   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 26.05 on 36 degrees of freedom
## Multiple R-squared:  0.1947, Adjusted R-squared:  0.06047 
## F-statistic: 1.451 on 6 and 36 DF,  p-value: 0.2229
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: time_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.45, p = 0.22
## R² = 0.19
## Adj. R² = 0.06 
## 
## Standard errors: OLS
## ------------------------------------------------------------------------------
##                                                    Est.   S.E.   t val.      p
## ----------------------------------------------- ------- ------ -------- ------
## (Intercept)                                       25.31   7.36     3.44   0.00
## PNN_pos_PV_count_PL_c                              1.39   1.54     0.90   0.37
## RearingMS                                          8.59   8.22     1.04   0.30
## HousingSI                                         18.88   8.24     2.29   0.03
## PNN_pos_PV_count_PL_c:RearingMS                   -0.85   2.23    -0.38   0.70
## PNN_pos_PV_count_PL_c:HousingSI                   -2.81   2.02    -1.39   0.17
## PNN_pos_PV_count_PL_c:RearingMS:HousingSI          1.22   2.97     0.41   0.68
## ------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: time_open
##                                       Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_count_PL_c                  1   214.0   214.0  0.3153 0.57794  
## Rearing                                1   316.6   316.6  0.4666 0.49892  
## Housing                                1  3656.7  3656.7  5.3886 0.02604 *
## PNN_pos_PV_count_PL_c:Rearing          1     1.7     1.7  0.0025 0.96064  
## PNN_pos_PV_count_PL_c:Housing          1  1602.5  1602.5  2.3614 0.13311  
## PNN_pos_PV_count_PL_c:Rearing:Housing  1   114.6   114.6  0.1688 0.68359  
## Residuals                             36 24430.0   678.6                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -38.292 -14.211  -1.694  14.786  46.648 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                    26.9085     7.4871   3.594
## PNN_pos_PV_intensity_PL_c                      -0.1216    14.8022  -0.008
## RearingMS                                       6.5561     8.0857   0.811
## HousingSI                                      18.6143     8.1063   2.296
## PNN_pos_PV_intensity_PL_c:RearingMS            -0.7379    18.2627  -0.040
## PNN_pos_PV_intensity_PL_c:HousingSI           -11.2384    17.6889  -0.635
## PNN_pos_PV_intensity_PL_c:RearingMS:HousingSI  -1.2127    22.2957  -0.054
##                                               Pr(>|t|)    
## (Intercept)                                   0.000967 ***
## PNN_pos_PV_intensity_PL_c                     0.993493    
## RearingMS                                     0.422795    
## HousingSI                                     0.027588 *  
## PNN_pos_PV_intensity_PL_c:RearingMS           0.967996    
## PNN_pos_PV_intensity_PL_c:HousingSI           0.529228    
## PNN_pos_PV_intensity_PL_c:RearingMS:HousingSI 0.956925    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 25.62 on 36 degrees of freedom
## Multiple R-squared:  0.2213, Adjusted R-squared:  0.09157 
## F-statistic: 1.706 on 6 and 36 DF,  p-value: 0.1479
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: time_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.71, p = 0.15
## R² = 0.22
## Adj. R² = 0.09 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------------
##                                                         Est.    S.E.   t val.
## --------------------------------------------------- -------- ------- --------
## (Intercept)                                            26.91    7.49     3.59
## PNN_pos_PV_intensity_PL_c                              -0.12   14.80    -0.01
## RearingMS                                               6.56    8.09     0.81
## HousingSI                                              18.61    8.11     2.30
## PNN_pos_PV_intensity_PL_c:RearingMS                    -0.74   18.26    -0.04
## PNN_pos_PV_intensity_PL_c:HousingSI                   -11.24   17.69    -0.64
## PNN_pos_PV_intensity_PL_c:RearingMS:HousingSI          -1.21   22.30    -0.05
## -----------------------------------------------------------------------------
##  
## ----------------------------------------------------------
##                                                          p
## --------------------------------------------------- ------
## (Intercept)                                           0.00
## PNN_pos_PV_intensity_PL_c                             0.99
## RearingMS                                             0.42
## HousingSI                                             0.03
## PNN_pos_PV_intensity_PL_c:RearingMS                   0.97
## PNN_pos_PV_intensity_PL_c:HousingSI                   0.53
## PNN_pos_PV_intensity_PL_c:RearingMS:HousingSI         0.96
## ----------------------------------------------------------
## Analysis of Variance Table
## 
## Response: time_open
##                                           Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_intensity_PL_c                  1  2225.3  2225.3  3.3915 0.07379 .
## Rearing                                    1   169.9   169.9  0.2589 0.61400  
## Housing                                    1  3458.1  3458.1  5.2703 0.02762 *
## PNN_pos_PV_intensity_PL_c:Rearing          1     2.7     2.7  0.0041 0.94944  
## PNN_pos_PV_intensity_PL_c:Housing          1   856.9   856.9  1.3059 0.26068  
## PNN_pos_PV_intensity_PL_c:Rearing:Housing  1     1.9     1.9  0.0030 0.95693  
## Residuals                                 36 23621.3   656.1                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##    Min     1Q Median     3Q    Max 
## -46.96 -14.45  -2.95  19.09  44.40 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                     24.497      7.234   3.386
## PV_pos_PNN_intensity_PL_c                       21.229     18.446   1.151
## RearingMS                                       10.606      8.344   1.271
## HousingSI                                       21.093      8.316   2.537
## PV_pos_PNN_intensity_PL_c:RearingMS            -12.751     29.940  -0.426
## PV_pos_PNN_intensity_PL_c:HousingSI            -17.463     25.365  -0.688
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI   36.701     43.404   0.846
##                                               Pr(>|t|)   
## (Intercept)                                    0.00173 **
## PV_pos_PNN_intensity_PL_c                      0.25737   
## RearingMS                                      0.21184   
## HousingSI                                      0.01567 * 
## PV_pos_PNN_intensity_PL_c:RearingMS            0.67273   
## PV_pos_PNN_intensity_PL_c:HousingSI            0.49558   
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI  0.40338   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 26.1 on 36 degrees of freedom
## Multiple R-squared:  0.1916, Adjusted R-squared:  0.05682 
## F-statistic: 1.422 on 6 and 36 DF,  p-value: 0.2333
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: time_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.42, p = 0.23
## R² = 0.19
## Adj. R² = 0.06 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------------
##                                                         Est.    S.E.   t val.
## --------------------------------------------------- -------- ------- --------
## (Intercept)                                            24.50    7.23     3.39
## PV_pos_PNN_intensity_PL_c                              21.23   18.45     1.15
## RearingMS                                              10.61    8.34     1.27
## HousingSI                                              21.09    8.32     2.54
## PV_pos_PNN_intensity_PL_c:RearingMS                   -12.75   29.94    -0.43
## PV_pos_PNN_intensity_PL_c:HousingSI                   -17.46   25.37    -0.69
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI          36.70   43.40     0.85
## -----------------------------------------------------------------------------
##  
## ----------------------------------------------------------
##                                                          p
## --------------------------------------------------- ------
## (Intercept)                                           0.00
## PV_pos_PNN_intensity_PL_c                             0.26
## RearingMS                                             0.21
## HousingSI                                             0.02
## PV_pos_PNN_intensity_PL_c:RearingMS                   0.67
## PV_pos_PNN_intensity_PL_c:HousingSI                   0.50
## PV_pos_PNN_intensity_PL_c:RearingMS:HousingSI         0.40
## ----------------------------------------------------------
## Analysis of Variance Table
## 
## Response: time_open
##                                           Df  Sum Sq Mean Sq F value  Pr(>F)  
## PV_pos_PNN_intensity_PL_c                  1   527.4   527.4  0.7741 0.38479  
## Rearing                                    1   586.2   586.2  0.8605 0.35979  
## Housing                                    1  4137.9  4137.9  6.0741 0.01862 *
## PV_pos_PNN_intensity_PL_c:Rearing          1    34.7    34.7  0.0510 0.82260  
## PV_pos_PNN_intensity_PL_c:Housing          1    37.8    37.8  0.0555 0.81510  
## PV_pos_PNN_intensity_PL_c:Rearing:Housing  1   487.1   487.1  0.7150 0.40338  
## Residuals                                 36 24524.9   681.2                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -40.222 -16.463  -1.716  17.960  51.741 
## 
## Coefficients:
##                                   Estimate Std. Error t value Pr(>|t|)   
## (Intercept)                        26.5458     7.9109   3.356  0.00188 **
## PV_count_IL_c                       0.5044     1.0406   0.485  0.63082   
## RearingMS                           6.3813     8.6324   0.739  0.46456   
## HousingSI                          16.5529     8.6312   1.918  0.06309 . 
## PV_count_IL_c:RearingMS             0.2553     1.3170   0.194  0.84735   
## PV_count_IL_c:HousingSI            -0.8989     1.2484  -0.720  0.47612   
## PV_count_IL_c:RearingMS:HousingSI  -0.7443     1.7032  -0.437  0.66470   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 25.93 on 36 degrees of freedom
## Multiple R-squared:  0.2018, Adjusted R-squared:  0.06877 
## F-statistic: 1.517 on 6 and 36 DF,  p-value: 0.2006
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: time_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.52, p = 0.20
## R² = 0.20
## Adj. R² = 0.07 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------
##                                            Est.   S.E.   t val.      p
## --------------------------------------- ------- ------ -------- ------
## (Intercept)                               26.55   7.91     3.36   0.00
## PV_count_IL_c                              0.50   1.04     0.48   0.63
## RearingMS                                  6.38   8.63     0.74   0.46
## HousingSI                                 16.55   8.63     1.92   0.06
## PV_count_IL_c:RearingMS                    0.26   1.32     0.19   0.85
## PV_count_IL_c:HousingSI                   -0.90   1.25    -0.72   0.48
## PV_count_IL_c:RearingMS:HousingSI         -0.74   1.70    -0.44   0.66
## ----------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: time_open
##                               Df  Sum Sq Mean Sq F value  Pr(>F)  
## PV_count_IL_c                  1   592.9   592.9  0.8815 0.35406  
## Rearing                        1   208.0   208.0  0.3093 0.58155  
## Housing                        1  3343.4  3343.4  4.9707 0.03211 *
## PV_count_IL_c:Rearing          1     0.5     0.5  0.0007 0.97879  
## PV_count_IL_c:Housing          1  1848.6  1848.6  2.7483 0.10605  
## PV_count_IL_c:Rearing:Housing  1   128.5   128.5  0.1910 0.66470  
## Residuals                     36 24214.2   672.6                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##    Min     1Q Median     3Q    Max 
## -52.45 -19.38   0.23  17.44  46.27 
## 
## Coefficients:
##                                       Estimate Std. Error t value Pr(>|t|)   
## (Intercept)                             26.256      7.437   3.531  0.00116 **
## PV_intensity_IL_c                        6.613     24.848   0.266  0.79166   
## RearingMS                                7.259      8.370   0.867  0.39155   
## HousingSI                               19.105      8.372   2.282  0.02850 * 
## PV_intensity_IL_c:RearingMS             -4.276     30.877  -0.138  0.89063   
## PV_intensity_IL_c:HousingSI            -12.627     29.645  -0.426  0.67270   
## PV_intensity_IL_c:RearingMS:HousingSI    7.479     39.270   0.190  0.85003   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 26.9 on 36 degrees of freedom
## Multiple R-squared:  0.1413, Adjusted R-squared:  -0.001853 
## F-statistic: 0.9871 on 6 and 36 DF,  p-value: 0.4485
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: time_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 0.99, p = 0.45
## R² = 0.14
## Adj. R² = -0.00 
## 
## Standard errors: OLS
## ----------------------------------------------------------------------------
##                                                 Est.    S.E.   t val.      p
## ------------------------------------------- -------- ------- -------- ------
## (Intercept)                                    26.26    7.44     3.53   0.00
## PV_intensity_IL_c                               6.61   24.85     0.27   0.79
## RearingMS                                       7.26    8.37     0.87   0.39
## HousingSI                                      19.10    8.37     2.28   0.03
## PV_intensity_IL_c:RearingMS                    -4.28   30.88    -0.14   0.89
## PV_intensity_IL_c:HousingSI                   -12.63   29.64    -0.43   0.67
## PV_intensity_IL_c:RearingMS:HousingSI           7.48   39.27     0.19   0.85
## ----------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: time_open
##                                   Df  Sum Sq Mean Sq F value  Pr(>F)  
## PV_intensity_IL_c                  1    93.0    93.0  0.1285 0.72205  
## Rearing                            1   382.3   382.3  0.5283 0.47201  
## Housing                            1  3643.8  3643.8  5.0355 0.03108 *
## PV_intensity_IL_c:Rearing          1     6.3     6.3  0.0087 0.92616  
## PV_intensity_IL_c:Housing          1   133.9   133.9  0.1850 0.66967  
## PV_intensity_IL_c:Rearing:Housing  1    26.2    26.2  0.0363 0.85003  
## Residuals                         36 26050.5   723.6                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -49.034 -16.477  -3.217  16.902  47.549 
## 
## Coefficients:
##                                    Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                        25.76576    7.16245   3.597 0.000958 ***
## PNN_count_IL_c                      0.50501    0.76431   0.661 0.512989    
## RearingMS                           7.59271    8.05259   0.943 0.352022    
## HousingSI                          19.00039    8.05367   2.359 0.023858 *  
## PNN_count_IL_c:RearingMS            0.12628    0.98526   0.128 0.898732    
## PNN_count_IL_c:HousingSI           -1.02031    0.99312  -1.027 0.311094    
## PNN_count_IL_c:RearingMS:HousingSI  0.02544    1.50252   0.017 0.986585    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 26.18 on 36 degrees of freedom
## Multiple R-squared:  0.1867, Adjusted R-squared:  0.05115 
## F-statistic: 1.377 on 6 and 36 DF,  p-value: 0.2502
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: time_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.38, p = 0.25
## R² = 0.19
## Adj. R² = 0.05 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------
##                                             Est.   S.E.   t val.      p
## ---------------------------------------- ------- ------ -------- ------
## (Intercept)                                25.77   7.16     3.60   0.00
## PNN_count_IL_c                              0.51   0.76     0.66   0.51
## RearingMS                                   7.59   8.05     0.94   0.35
## HousingSI                                  19.00   8.05     2.36   0.02
## PNN_count_IL_c:RearingMS                    0.13   0.99     0.13   0.90
## PNN_count_IL_c:HousingSI                   -1.02   0.99    -1.03   0.31
## PNN_count_IL_c:RearingMS:HousingSI          0.03   1.50     0.02   0.99
## -----------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: time_open
##                                Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_count_IL_c                  1     2.5     2.5  0.0037 0.95209  
## Rearing                         1   419.2   419.2  0.6116 0.43928  
## Housing                         1  3738.1  3738.1  5.4544 0.02521 *
## PNN_count_IL_c:Rearing          1   241.7   241.7  0.3527 0.55631  
## PNN_count_IL_c:Housing          1  1262.0  1262.0  1.8414 0.18323  
## PNN_count_IL_c:Rearing:Housing  1     0.2     0.2  0.0003 0.98658  
## Residuals                      36 24672.4   685.3                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -37.369 -13.396  -1.686  15.237  45.756 
## 
## Coefficients:
##                                        Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                              24.249      6.736   3.600 0.000951 ***
## PNN_intensity_IL_c                       29.799     20.507   1.453 0.154867    
## RearingMS                                 8.234      7.686   1.071 0.291165    
## HousingSI                                21.277      7.688   2.768 0.008864 ** 
## PNN_intensity_IL_c:RearingMS            -51.973     40.805  -1.274 0.210939    
## PNN_intensity_IL_c:HousingSI            -29.371     32.003  -0.918 0.364853    
## PNN_intensity_IL_c:RearingMS:HousingSI  111.587     53.924   2.069 0.045751 *  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 24.47 on 36 degrees of freedom
## Multiple R-squared:  0.2893, Adjusted R-squared:  0.1708 
## F-statistic: 2.442 on 6 and 36 DF,  p-value: 0.04394
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: time_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 2.44, p = 0.04
## R² = 0.29
## Adj. R² = 0.17 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------------
##                                                  Est.    S.E.   t val.      p
## -------------------------------------------- -------- ------- -------- ------
## (Intercept)                                     24.25    6.74     3.60   0.00
## PNN_intensity_IL_c                              29.80   20.51     1.45   0.15
## RearingMS                                        8.23    7.69     1.07   0.29
## HousingSI                                       21.28    7.69     2.77   0.01
## PNN_intensity_IL_c:RearingMS                   -51.97   40.81    -1.27   0.21
## PNN_intensity_IL_c:HousingSI                   -29.37   32.00    -0.92   0.36
## PNN_intensity_IL_c:RearingMS:HousingSI         111.59   53.92     2.07   0.05
## -----------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: time_open
##                                    Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_intensity_IL_c                  1  1508.6  1508.6  2.5189 0.12123  
## Rearing                             1   618.5   618.5  1.0326 0.31632  
## Housing                             1  3832.2  3832.2  6.3985 0.01594 *
## PNN_intensity_IL_c:Rearing          1   161.5   161.5  0.2696 0.60680  
## PNN_intensity_IL_c:Housing          1    89.7    89.7  0.1497 0.70108  
## PNN_intensity_IL_c:Rearing:Housing  1  2564.6  2564.6  4.2821 0.04575 *
## Residuals                          36 21561.0   598.9                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -55.481 -17.168  -2.518  12.777  49.046 
## 
## Coefficients:
##                                           Estimate Std. Error t value Pr(>|t|)
## (Intercept)                               24.45055    7.45330   3.280  0.00231
## PNN_pos_PV_count_IL_c                      1.76695    1.80375   0.980  0.33382
## RearingMS                                 10.33167    8.22289   1.256  0.21704
## HousingSI                                 19.70492    8.23246   2.394  0.02202
## PNN_pos_PV_count_IL_c:RearingMS            0.05636    2.42055   0.023  0.98155
## PNN_pos_PV_count_IL_c:HousingSI           -2.22045    2.22451  -0.998  0.32486
## PNN_pos_PV_count_IL_c:RearingMS:HousingSI  1.25593    3.40142   0.369  0.71411
##                                             
## (Intercept)                               **
## PNN_pos_PV_count_IL_c                       
## RearingMS                                   
## HousingSI                                 * 
## PNN_pos_PV_count_IL_c:RearingMS             
## PNN_pos_PV_count_IL_c:HousingSI             
## PNN_pos_PV_count_IL_c:RearingMS:HousingSI   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 26.06 on 36 degrees of freedom
## Multiple R-squared:  0.1938, Adjusted R-squared:  0.05944 
## F-statistic: 1.442 on 6 and 36 DF,  p-value: 0.2258
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: time_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.44, p = 0.23
## R² = 0.19
## Adj. R² = 0.06 
## 
## Standard errors: OLS
## ------------------------------------------------------------------------------
##                                                    Est.   S.E.   t val.      p
## ----------------------------------------------- ------- ------ -------- ------
## (Intercept)                                       24.45   7.45     3.28   0.00
## PNN_pos_PV_count_IL_c                              1.77   1.80     0.98   0.33
## RearingMS                                         10.33   8.22     1.26   0.22
## HousingSI                                         19.70   8.23     2.39   0.02
## PNN_pos_PV_count_IL_c:RearingMS                    0.06   2.42     0.02   0.98
## PNN_pos_PV_count_IL_c:HousingSI                   -2.22   2.22    -1.00   0.32
## PNN_pos_PV_count_IL_c:RearingMS:HousingSI          1.26   3.40     0.37   0.71
## ------------------------------------------------------------------------------
## Analysis of Variance Table
## 
## Response: time_open
##                                       Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_count_IL_c                  1   255.0   255.0  0.3754 0.54394  
## Rearing                                1   558.8   558.8  0.8225 0.37047  
## Housing                                1  3947.1  3947.1  5.8101 0.02117 *
## PNN_pos_PV_count_IL_c:Rearing          1   327.8   327.8  0.4825 0.49174  
## PNN_pos_PV_count_IL_c:Housing          1   697.9   697.9  1.0273 0.31756  
## PNN_pos_PV_count_IL_c:Rearing:Housing  1    92.6    92.6  0.1363 0.71411  
## Residuals                             36 24456.8   679.4                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -49.241 -17.683   0.254  17.972  51.855 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                     26.744      7.405   3.612
## PNN_pos_PV_intensity_IL_c                        1.873     21.716   0.086
## RearingMS                                        6.842      8.302   0.824
## HousingSI                                       18.416      8.303   2.218
## PNN_pos_PV_intensity_IL_c:RearingMS             -2.728     25.078  -0.109
## PNN_pos_PV_intensity_IL_c:HousingSI            -13.522     26.675  -0.507
## PNN_pos_PV_intensity_IL_c:RearingMS:HousingSI    6.296     33.477   0.188
##                                               Pr(>|t|)    
## (Intercept)                                    0.00092 ***
## PNN_pos_PV_intensity_IL_c                      0.93174    
## RearingMS                                      0.41530    
## HousingSI                                      0.03295 *  
## PNN_pos_PV_intensity_IL_c:RearingMS            0.91398    
## PNN_pos_PV_intensity_IL_c:HousingSI            0.61531    
## PNN_pos_PV_intensity_IL_c:RearingMS:HousingSI  0.85187    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 26.68 on 36 degrees of freedom
## Multiple R-squared:  0.1553, Adjusted R-squared:  0.01453 
## F-statistic: 1.103 on 6 and 36 DF,  p-value: 0.3796
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: time_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 1.10, p = 0.38
## R² = 0.16
## Adj. R² = 0.01 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------------
##                                                         Est.    S.E.   t val.
## --------------------------------------------------- -------- ------- --------
## (Intercept)                                            26.74    7.40     3.61
## PNN_pos_PV_intensity_IL_c                               1.87   21.72     0.09
## RearingMS                                               6.84    8.30     0.82
## HousingSI                                              18.42    8.30     2.22
## PNN_pos_PV_intensity_IL_c:RearingMS                    -2.73   25.08    -0.11
## PNN_pos_PV_intensity_IL_c:HousingSI                   -13.52   26.68    -0.51
## PNN_pos_PV_intensity_IL_c:RearingMS:HousingSI           6.30   33.48     0.19
## -----------------------------------------------------------------------------
##  
## ----------------------------------------------------------
##                                                          p
## --------------------------------------------------- ------
## (Intercept)                                           0.00
## PNN_pos_PV_intensity_IL_c                             0.93
## RearingMS                                             0.42
## HousingSI                                             0.03
## PNN_pos_PV_intensity_IL_c:RearingMS                   0.91
## PNN_pos_PV_intensity_IL_c:HousingSI                   0.62
## PNN_pos_PV_intensity_IL_c:RearingMS:HousingSI         0.85
## ----------------------------------------------------------
## Analysis of Variance Table
## 
## Response: time_open
##                                           Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_intensity_IL_c                  1   668.8   668.8  0.9396 0.33886  
## Rearing                                    1   335.2   335.2  0.4709 0.49698  
## Housing                                    1  3402.1  3402.1  4.7796 0.03538 *
## PNN_pos_PV_intensity_IL_c:Rearing          1    28.3    28.3  0.0397 0.84315  
## PNN_pos_PV_intensity_IL_c:Housing          1   252.0   252.0  0.3541 0.55554  
## PNN_pos_PV_intensity_IL_c:Rearing:Housing  1    25.2    25.2  0.0354 0.85187  
## Residuals                                 36 25624.6   711.8                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Call:
## lm(formula = as.formula(paste(b, " ~ ", x, " + Rearing + Housing + Rearing:Housing:", 
##     x, " + ", x, ":Rearing + ", x, ":Housing", sep = "")), data = dataset_males)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -43.943 -12.172  -0.344  15.767  50.949 
## 
## Coefficients:
##                                               Estimate Std. Error t value
## (Intercept)                                     24.658      6.696   3.683
## PV_pos_PNN_intensity_IL_c                       25.129     17.617   1.426
## RearingMS                                        9.754      7.605   1.282
## HousingSI                                       19.795      7.605   2.603
## PV_pos_PNN_intensity_IL_c:RearingMS            -33.075     29.953  -1.104
## PV_pos_PNN_intensity_IL_c:HousingSI            -37.816     26.219  -1.442
## PV_pos_PNN_intensity_IL_c:RearingMS:HousingSI   89.835     40.687   2.208
##                                               Pr(>|t|)    
## (Intercept)                                   0.000752 ***
## PV_pos_PNN_intensity_IL_c                     0.162364    
## RearingMS                                     0.207868    
## HousingSI                                     0.013343 *  
## PV_pos_PNN_intensity_IL_c:RearingMS           0.276823    
## PV_pos_PNN_intensity_IL_c:HousingSI           0.157857    
## PV_pos_PNN_intensity_IL_c:RearingMS:HousingSI 0.033704 *  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 24.56 on 36 degrees of freedom
## Multiple R-squared:  0.2844, Adjusted R-squared:  0.1651 
## F-statistic: 2.384 on 6 and 36 DF,  p-value: 0.04832
## 
## MODEL INFO:
## Observations: 43
## Dependent Variable: time_open
## Type: OLS linear regression 
## 
## MODEL FIT:
## F(6,36) = 2.38, p = 0.05
## R² = 0.28
## Adj. R² = 0.17 
## 
## Standard errors: OLS
## -----------------------------------------------------------------------------
##                                                         Est.    S.E.   t val.
## --------------------------------------------------- -------- ------- --------
## (Intercept)                                            24.66    6.70     3.68
## PV_pos_PNN_intensity_IL_c                              25.13   17.62     1.43
## RearingMS                                               9.75    7.61     1.28
## HousingSI                                              19.79    7.61     2.60
## PV_pos_PNN_intensity_IL_c:RearingMS                   -33.07   29.95    -1.10
## PV_pos_PNN_intensity_IL_c:HousingSI                   -37.82   26.22    -1.44
## PV_pos_PNN_intensity_IL_c:RearingMS:HousingSI          89.84   40.69     2.21
## -----------------------------------------------------------------------------
##  
## ----------------------------------------------------------
##                                                          p
## --------------------------------------------------- ------
## (Intercept)                                           0.00
## PV_pos_PNN_intensity_IL_c                             0.16
## RearingMS                                             0.21
## HousingSI                                             0.01
## PV_pos_PNN_intensity_IL_c:RearingMS                   0.28
## PV_pos_PNN_intensity_IL_c:HousingSI                   0.16
## PV_pos_PNN_intensity_IL_c:RearingMS:HousingSI         0.03
## ----------------------------------------------------------
## Analysis of Variance Table
## 
## Response: time_open
##                                           Df  Sum Sq Mean Sq F value  Pr(>F)  
## PV_pos_PNN_intensity_IL_c                  1   785.4   785.4  1.3025 0.26130  
## Rearing                                    1   429.0   429.0  0.7114 0.40454  
## Housing                                    1  4116.3  4116.3  6.8261 0.01303 *
## PV_pos_PNN_intensity_IL_c:Rearing          1   356.1   356.1  0.5905 0.44724  
## PV_pos_PNN_intensity_IL_c:Housing          1     0.8     0.8  0.0013 0.97130  
## PV_pos_PNN_intensity_IL_c:Rearing:Housing  1  2939.8  2939.8  4.8751 0.03370 *
## Residuals                                 36 21708.8   603.0                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## [[1]]
## Analysis of Variance Table
## 
## Response: time_open
##                               Df  Sum Sq Mean Sq F value  Pr(>F)  
## PV_count_PL_c                  1  1827.9  1827.9  2.7605 0.10530  
## Rearing                        1   109.1   109.1  0.1648 0.68717  
## Housing                        1  3246.2  3246.2  4.9026 0.03324 *
## PV_count_PL_c:Rearing          1    58.5    58.5  0.0883 0.76801  
## PV_count_PL_c:Housing          1  1182.3  1182.3  1.7855 0.18985  
## PV_count_PL_c:Rearing:Housing  1    74.5    74.5  0.1126 0.73917  
## Residuals                     36 23837.5   662.2                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[2]]
## Analysis of Variance Table
## 
## Response: time_open
##                                   Df  Sum Sq Mean Sq F value  Pr(>F)  
## PV_intensity_PL_c                  1  1138.2  1138.2  1.6574 0.20618  
## Rearing                            1   261.8   261.8  0.3812 0.54083  
## Housing                            1  3612.0  3612.0  5.2595 0.02777 *
## PV_intensity_PL_c:Rearing          1    42.8    42.8  0.0623 0.80425  
## PV_intensity_PL_c:Housing          1   473.6   473.6  0.6896 0.41178  
## PV_intensity_PL_c:Rearing:Housing  1    84.1    84.1  0.1225 0.72837  
## Residuals                         36 24723.5   686.8                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[3]]
## Analysis of Variance Table
## 
## Response: time_open
##                                Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_count_PL_c                  1   136.3   136.3  0.2105 0.64911  
## Rearing                         1   399.3   399.3  0.6170 0.43729  
## Housing                         1  3617.9  3617.9  5.5904 0.02357 *
## PNN_count_PL_c:Rearing          1    37.2    37.2  0.0575 0.81180  
## PNN_count_PL_c:Housing          1  2712.7  2712.7  4.1917 0.04797 *
## PNN_count_PL_c:Rearing:Housing  1   134.6   134.6  0.2081 0.65103  
## Residuals                      36 23298.0   647.2                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[4]]
## Analysis of Variance Table
## 
## Response: time_open
##                                    Df  Sum Sq Mean Sq F value Pr(>F)  
## PNN_intensity_PL_c                  1   603.2   603.2  0.8981 0.3496  
## Rearing                             1   631.7   631.7  0.9406 0.3386  
## Housing                             1  4036.8  4036.8  6.0108 0.0192 *
## PNN_intensity_PL_c:Rearing          1    48.3    48.3  0.0719 0.7901  
## PNN_intensity_PL_c:Housing          1     0.2     0.2  0.0004 0.9847  
## PNN_intensity_PL_c:Rearing:Housing  1   838.7   838.7  1.2488 0.2712  
## Residuals                          36 24177.2   671.6                 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[5]]
## Analysis of Variance Table
## 
## Response: time_open
##                                       Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_count_PL_c                  1   214.0   214.0  0.3153 0.57794  
## Rearing                                1   316.6   316.6  0.4666 0.49892  
## Housing                                1  3656.7  3656.7  5.3886 0.02604 *
## PNN_pos_PV_count_PL_c:Rearing          1     1.7     1.7  0.0025 0.96064  
## PNN_pos_PV_count_PL_c:Housing          1  1602.5  1602.5  2.3614 0.13311  
## PNN_pos_PV_count_PL_c:Rearing:Housing  1   114.6   114.6  0.1688 0.68359  
## Residuals                             36 24430.0   678.6                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[6]]
## Analysis of Variance Table
## 
## Response: time_open
##                                           Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_intensity_PL_c                  1  2225.3  2225.3  3.3915 0.07379 .
## Rearing                                    1   169.9   169.9  0.2589 0.61400  
## Housing                                    1  3458.1  3458.1  5.2703 0.02762 *
## PNN_pos_PV_intensity_PL_c:Rearing          1     2.7     2.7  0.0041 0.94944  
## PNN_pos_PV_intensity_PL_c:Housing          1   856.9   856.9  1.3059 0.26068  
## PNN_pos_PV_intensity_PL_c:Rearing:Housing  1     1.9     1.9  0.0030 0.95693  
## Residuals                                 36 23621.3   656.1                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[7]]
## Analysis of Variance Table
## 
## Response: time_open
##                                           Df  Sum Sq Mean Sq F value  Pr(>F)  
## PV_pos_PNN_intensity_PL_c                  1   527.4   527.4  0.7741 0.38479  
## Rearing                                    1   586.2   586.2  0.8605 0.35979  
## Housing                                    1  4137.9  4137.9  6.0741 0.01862 *
## PV_pos_PNN_intensity_PL_c:Rearing          1    34.7    34.7  0.0510 0.82260  
## PV_pos_PNN_intensity_PL_c:Housing          1    37.8    37.8  0.0555 0.81510  
## PV_pos_PNN_intensity_PL_c:Rearing:Housing  1   487.1   487.1  0.7150 0.40338  
## Residuals                                 36 24524.9   681.2                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[8]]
## Analysis of Variance Table
## 
## Response: time_open
##                               Df  Sum Sq Mean Sq F value  Pr(>F)  
## PV_count_IL_c                  1   592.9   592.9  0.8815 0.35406  
## Rearing                        1   208.0   208.0  0.3093 0.58155  
## Housing                        1  3343.4  3343.4  4.9707 0.03211 *
## PV_count_IL_c:Rearing          1     0.5     0.5  0.0007 0.97879  
## PV_count_IL_c:Housing          1  1848.6  1848.6  2.7483 0.10605  
## PV_count_IL_c:Rearing:Housing  1   128.5   128.5  0.1910 0.66470  
## Residuals                     36 24214.2   672.6                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[9]]
## Analysis of Variance Table
## 
## Response: time_open
##                                   Df  Sum Sq Mean Sq F value  Pr(>F)  
## PV_intensity_IL_c                  1    93.0    93.0  0.1285 0.72205  
## Rearing                            1   382.3   382.3  0.5283 0.47201  
## Housing                            1  3643.8  3643.8  5.0355 0.03108 *
## PV_intensity_IL_c:Rearing          1     6.3     6.3  0.0087 0.92616  
## PV_intensity_IL_c:Housing          1   133.9   133.9  0.1850 0.66967  
## PV_intensity_IL_c:Rearing:Housing  1    26.2    26.2  0.0363 0.85003  
## Residuals                         36 26050.5   723.6                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[10]]
## Analysis of Variance Table
## 
## Response: time_open
##                                Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_count_IL_c                  1     2.5     2.5  0.0037 0.95209  
## Rearing                         1   419.2   419.2  0.6116 0.43928  
## Housing                         1  3738.1  3738.1  5.4544 0.02521 *
## PNN_count_IL_c:Rearing          1   241.7   241.7  0.3527 0.55631  
## PNN_count_IL_c:Housing          1  1262.0  1262.0  1.8414 0.18323  
## PNN_count_IL_c:Rearing:Housing  1     0.2     0.2  0.0003 0.98658  
## Residuals                      36 24672.4   685.3                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[11]]
## Analysis of Variance Table
## 
## Response: time_open
##                                    Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_intensity_IL_c                  1  1508.6  1508.6  2.5189 0.12123  
## Rearing                             1   618.5   618.5  1.0326 0.31632  
## Housing                             1  3832.2  3832.2  6.3985 0.01594 *
## PNN_intensity_IL_c:Rearing          1   161.5   161.5  0.2696 0.60680  
## PNN_intensity_IL_c:Housing          1    89.7    89.7  0.1497 0.70108  
## PNN_intensity_IL_c:Rearing:Housing  1  2564.6  2564.6  4.2821 0.04575 *
## Residuals                          36 21561.0   598.9                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[12]]
## Analysis of Variance Table
## 
## Response: time_open
##                                       Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_count_IL_c                  1   255.0   255.0  0.3754 0.54394  
## Rearing                                1   558.8   558.8  0.8225 0.37047  
## Housing                                1  3947.1  3947.1  5.8101 0.02117 *
## PNN_pos_PV_count_IL_c:Rearing          1   327.8   327.8  0.4825 0.49174  
## PNN_pos_PV_count_IL_c:Housing          1   697.9   697.9  1.0273 0.31756  
## PNN_pos_PV_count_IL_c:Rearing:Housing  1    92.6    92.6  0.1363 0.71411  
## Residuals                             36 24456.8   679.4                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[13]]
## Analysis of Variance Table
## 
## Response: time_open
##                                           Df  Sum Sq Mean Sq F value  Pr(>F)  
## PNN_pos_PV_intensity_IL_c                  1   668.8   668.8  0.9396 0.33886  
## Rearing                                    1   335.2   335.2  0.4709 0.49698  
## Housing                                    1  3402.1  3402.1  4.7796 0.03538 *
## PNN_pos_PV_intensity_IL_c:Rearing          1    28.3    28.3  0.0397 0.84315  
## PNN_pos_PV_intensity_IL_c:Housing          1   252.0   252.0  0.3541 0.55554  
## PNN_pos_PV_intensity_IL_c:Rearing:Housing  1    25.2    25.2  0.0354 0.85187  
## Residuals                                 36 25624.6   711.8                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## [[14]]
## Analysis of Variance Table
## 
## Response: time_open
##                                           Df  Sum Sq Mean Sq F value  Pr(>F)  
## PV_pos_PNN_intensity_IL_c                  1   785.4   785.4  1.3025 0.26130  
## Rearing                                    1   429.0   429.0  0.7114 0.40454  
## Housing                                    1  4116.3  4116.3  6.8261 0.01303 *
## PV_pos_PNN_intensity_IL_c:Rearing          1   356.1   356.1  0.5905 0.44724  
## PV_pos_PNN_intensity_IL_c:Housing          1     0.8     0.8  0.0013 0.97130  
## PV_pos_PNN_intensity_IL_c:Rearing:Housing  1  2939.8  2939.8  4.8751 0.03370 *
## Residuals                                 36 21708.8   603.0                  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1