tests/testthat/test_imputeTimegaps.R

library(GGIR)
context("g.imputeTimegaps")
test_that("timegaps are correctly imputed", {
  N = 10000
  sf = 20
  x = data.frame(time = as.POSIXct(x = (1:N)/sf, tz = "", origin = "1970/1/1"),
                 x = 1:N, y = 1:N, z = 1:N)
  xyzCol = c("x", "y", "z")
  
  x_without_time = data.frame(x = 1:N, y = 1:N, z = 1:N)
  xyzCol = c("x", "y", "z")
  
  # Duration of each consecutive gap is equal to the distance netween 
  # the sample right before and the sample right after the zeros that got removed to create this gap. 
  # So the duration of each gap is equal to the number of zeros + 1.
  ngaps = 4
  zeros = c(5:200, 6000:6500, 7000:7500, 8000:9500)
  gaps_duration = length(zeros) + ngaps
  gaps_duration = gaps_duration/sf/60
  
  # TEST THAT SAME FILE WITH DIFFERENT FORMATS IS IMPUTED IN THE SAME WAY ----
  # Format 1: with timestamp & with timegaps (no zeroes, incomplete dataset)
  x1 = x[-zeros,]
  x1_imputed = g.imputeTimegaps(x1, sf = sf, k = 2/sf, impute = TRUE, PreviousLastValue = c(0,0,1))
  x1_imputed_QClog = x1_imputed$QClog; x1_imputed = x1_imputed$x
  x1_removed = g.imputeTimegaps(x1, sf = sf, k = 2/sf, impute = FALSE, PreviousLastValue = c(0,0,1))
  x1_removed_QClog = x1_removed$QClog; x1_removed = x1_removed$x

  # make sure the timestamps got imputed correctly
  # (here we are checking that the last imputed timestamp is correct relative to the first timestamp after the gap)
  expect_equal(as.numeric(x1_imputed$time[201] - x1_imputed$time[200]), 1/sf, tolerance = .01, scale = 1)

  # Format 2: with timestamp & with zeros (complete dataset)
  x2 = x
  x2[zeros, xyzCol] = 0
  x2_imputed = g.imputeTimegaps(x2, sf = sf, k = 2/sf, impute = TRUE, PreviousLastValue = c(0,0,1))
  x2_imputed_QClog = x2_imputed$QClog; x2_imputed = x2_imputed$x
  x2_removed = g.imputeTimegaps(x2, sf = sf, k = 2/sf, impute = FALSE, PreviousLastValue = c(0,0,1))
  x2_removed_QClog = x2_removed$QClog; x2_removed = x2_removed$x
  
  # Format 3: without timestamp & with zeros (complete dataset)
  x3 = x_without_time
  x3[zeros, xyzCol] = 0
  x3_imputed = g.imputeTimegaps(x3, sf = sf, k = 2/sf, impute = TRUE, PreviousLastValue = c(0,0,1))
  x3_imputed_QClog = x3_imputed$QClog; x3_imputed = x3_imputed$x
  x3_removed = g.imputeTimegaps(x3, sf = sf, k = 2/sf, impute = FALSE, PreviousLastValue = c(0,0,1))
  x3_removed_QClog = x3_removed$QClog; x3_removed = x3_removed$x
  
  # tests number of rows
  expect_equal(nrow(x1_imputed), N)
  expect_equal(nrow(x2_imputed), N)
  expect_equal(nrow(x3_imputed), N)
  
  expect_equal(nrow(x1_removed), N - length(zeros))
  expect_equal(nrow(x2_removed), N - length(zeros))
  expect_equal(nrow(x3_removed), N - length(zeros))
  
  # test imputations on different formats worked identically
  expect_equal(x1_imputed$X, x2_imputed$X)
  expect_equal(x1_imputed$X, x3_imputed$X)
  
  expect_equal(x1_removed$X, x2_removed$X)
  expect_equal(x1_removed$X, x3_removed$X)
  
  # test QClog
  expect_equal(x1_imputed_QClog$timegaps_n, 4)
  expect_equal(x2_imputed_QClog$timegaps_n, 4)
  expect_equal(x3_imputed_QClog$timegaps_n, 4)
  
  expect_equal(x1_imputed_QClog$timegaps_min, gaps_duration)
  expect_equal(x2_imputed_QClog$timegaps_min, gaps_duration)
  expect_equal(x3_imputed_QClog$timegaps_min, gaps_duration)
  
  # TEST IMPUTATION WHEN FIRST ROW IS NOT CONSECUTIVE TO PREVIOUS CHUNK ----
  # Format 4: with timestamp & with timegaps (no zeroes, incomplete dataset)
  x4 = x[-zeros,]
  PreviousLastTime = x[1,"time"] - 30 # dummy gap of 30 seconds between chunks
  suppressWarnings({ # warning arising from made up PreviousLastTime
    x4_imputed = g.imputeTimegaps(x4, sf = sf, k = 2/sf, impute = TRUE, 
                                  PreviousLastValue = c(0,0,1), PreviousLastTime = PreviousLastTime)
    x4_imputed_QClog = x4_imputed$QClog; x4_imputed = x4_imputed$x
    x4_removed = g.imputeTimegaps(x4, sf = sf, k = 2/sf, impute = FALSE, 
                                  PreviousLastValue = c(0,0,1), PreviousLastTime = PreviousLastTime)
    x4_removed_QClog = x4_removed$QClog; x4_removed = x4_removed$x
  })
  
  expect_equal(nrow(x4_imputed), N + sf*30)
  expect_equal(nrow(x4_removed), N - length(zeros))
  
  # TEST IMPUTATION WHEN FIRST AND LAST ROW CONTAIN ZEROS ----
  zeros = c(1:200, 6000:6500, 7000:7500, 8000:10000)
  # Format 5: with timestamp & with zeros (complete dataset)
  x5 = x
  x5[zeros, xyzCol] = 0
  x5_imputed = g.imputeTimegaps(x5, sf = sf, k = 2/sf, impute = TRUE, PreviousLastValue = c(0,0,1))
  x5_imputed_QClog = x5_imputed$QClog; x5_imputed = x5_imputed$x
  x5_removed = g.imputeTimegaps(x5, sf = sf, k = 2/sf, impute = FALSE, PreviousLastValue = c(0,0,1))
  x5_removed_QClog = x5_removed$QClog; x5_removed = x5_removed$x
  
  expect_equal(nrow(x5_imputed), N)
  expect_equal(nrow(x5_removed), N - length(zeros))
  
})
 
wadpac/GGIR documentation built on March 5, 2025, 11 p.m.