aboutsummaryrefslogtreecommitdiff
path: root/tests/testthat/test_parboot.R
blob: 33a620b45eb28eb79b9578de765f9b93b0bfa95b (plain)
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
34
35
36
37
38
39
40
41
42
43
44
45
46
47
48
49
50
51
52
53
54
55
56
57
58
59
60
61
62
63
64
65
66
67
68
69
70
71
72
73
74
75
76
77
78
79
80
81
82
83
84
85
86
87
88
89
90
91
92
93
94
95
96
97
98
99
100
101
102
103
104
105
106
107
108
109
110
111
112
113
114
115
116
117
118
119
120
121
122
123
124
context("parboot")
skip_on_cran()

y <- matrix(rep(0:1,10)[1:10],5,2)
siteCovs <- data.frame(x = c(0,2,3,4,1))
obsCovs <- data.frame(o1 = 1:10, o2 = exp(-5:4)/10)
umf <- unmarkedFrameOccu(y = y, siteCovs = siteCovs, obsCovs = obsCovs)
fm <- occu(~ o1 + o2 ~ x, data = umf)

fitstats <- function(fm) {
    observed <- getY(fm@data)
    expected <- fitted(fm)
    resids <- residuals(fm)
    sse <- sum(resids^2,na.rm=TRUE)
    chisq <- sum((observed - expected)^2 / expected,na.rm=TRUE)
    freeTuke <- sum((sqrt(observed) - sqrt(expected))^2,na.rm=TRUE)
    out <- c(SSE=sse, Chisq=chisq, freemanTukey=freeTuke)
    return(out)
}

fitstats2 <- function(fm, na.rm=TRUE) {
    observed <- getY(fm@data)
    expected <- fitted(fm)
    resids <- residuals(fm)
    sse <- sum(resids^2, na.rm=na.rm)
    chisq <- sum((observed - expected)^2 / expected, na.rm=na.rm)
    freeTuke <- sum((sqrt(observed) - sqrt(expected))^2, na.rm=na.rm)
    out <- c(SSE=sse, Chisq=chisq, freemanTukey=freeTuke)
    return(out)
}

test_that("parboot works", {
  pb <- parboot(fm, fitstats, nsim=3)
  expect_equal(dim(pb@t.star), c(3,3))

  # check show
  pb_out <- capture.output(pb)
  expect_equal(pb_out[4], "Parametric Bootstrap Statistics:")

  # check plot
  pdf(NULL)
  pl <- plot(pb)
  dev.off()
  expect_equal(pl, NULL)

  # check that report argument gives warning
  expect_warning(parboot(fm, fitstats, nsim=3, report=TRUE))
})

test_that("parboot works in parallel",{
  skip_on_cran()
  skip_on_ci()
  # check parallel
  pb <- parboot(fm, nsim=10, parallel=TRUE, ncores=2)
  expect_equal(length(pb@t.star), 10)
})

test_that("parboot handles failing model fits", {

  fail_func <- function(x){
    rand <- rnorm(1)
    if(rand > 0.5){
      stop("fail")
    }
    return(rand)
  }

  set.seed(123)
  expect_warning(pb <- parboot(fm, nsim=20, statistic=fail_func))
  expect_equal(nrow(pb@t.star), 13)
})

test_that("parboot handles failing model fits in parallel", {
  skip_on_cran()
  skip_on_ci()
  fail_func <- function(x){
    rand <- rnorm(1)
    if(rand > 0.5){
      stop("fail")
    }
    return(rand)
  }

  set.seed(123)
  expect_warning(pb <- parboot(fm, nsim=20, statistic=fail_func, parallel=TRUE))
  expect_true(nrow(pb@t.star) < 20)

})

test_that("parboot handles statistic functions with additional arguments", {

  opt_func <- function(x, y){
    res <- mean(residuals(x), na.rm=TRUE)
    c(res=res, y=y)
  }

  pb <- parboot(fm, nsim=10, statistic=opt_func, y=0.1)
  expect_equal(colnames(pb@t.star), c("res", "y"))
  expect_true(all(pb@t.star[,"y"]==0.1))
})

test_that("parboot handles statistic functions with additional arguments in parallel", {
  skip_on_cran()
  skip_on_ci()
  opt_func <- function(x, y){
    res <- mean(residuals(x), na.rm=TRUE)
    c(res=res, y=y)
  }

  pb <- parboot(fm, nsim=10, statistic=opt_func, y=0.1, parallel=TRUE)
  expect_equal(colnames(pb@t.star), c("res", "y"))
  expect_true(all(pb@t.star[,"y"]==0.1))
})

# To show the fitstats function in parboot example works when there are NAs
test_that("fitstats2 function handles NAs", {
  umf2 <- umf
  umf2@y[1,1] <- NA
  fm2 <- occu(~ o1 + o2 ~ x, data = umf2)
  expect_error(expect_warning(show(parboot(fm2, nsim=3, statistic=fitstats2, na.rm=FALSE))))
  pb <- parboot(fm2, nsim=3, statistic=fitstats2, na.rm=TRUE)
  expect_is(pb, "parboot")
  expect_equal(nrow(pb@t.star), 3)
})